⭐ 欢迎来到虫虫下载站! | 📦 资源下载 📁 资源专辑 ℹ️ 关于我们
⭐ 虫虫下载站

📄 bf_pi.h

📁 这是一个blowfish加密算法。该算法是从speakfs提取
💻 H
📖 第 1 页 / 共 2 页
字号:
/* crypto/bf/bf_pi.h */
/* Copyright (C) 1995-1997 Eric Young (eay@mincom.oz.au)
 * All rights reserved.
 *
 * This package is an SSL implementation written
 * by Eric Young (eay@mincom.oz.au).
 * The implementation was written so as to conform with Netscapes SSL.
 * 
 * This library is free for commercial and non-commercial use as long as
 * the following conditions are aheared to.  The following conditions
 * apply to all code found in this distribution, be it the RC4, RSA,
 * lhash, DES, etc., code; not just the SSL code.  The SSL documentation
 * included with this distribution is covered by the same copyright terms
 * except that the holder is Tim Hudson (tjh@mincom.oz.au).
 * 
 * Copyright remains Eric Young's, and as such any Copyright notices in
 * the code are not to be removed.
 * If this package is used in a product, Eric Young should be given attribution
 * as the author of the parts of the library used.
 * This can be in the form of a textual message at program startup or
 * in documentation (online or textual) provided with the package.
 * 
 * Redistribution and use in source and binary forms, with or without
 * modification, are permitted provided that the following conditions
 * are met:
 * 1. Redistributions of source code must retain the copyright
 *    notice, this list of conditions and the following disclaimer.
 * 2. Redistributions in binary form must reproduce the above copyright
 *    notice, this list of conditions and the following disclaimer in the
 *    documentation and/or other materials provided with the distribution.
 * 3. All advertising materials mentioning features or use of this software
 *    must display the following acknowledgement:
 *    "This product includes cryptographic software written by
 *     Eric Young (eay@mincom.oz.au)"
 *    The word 'cryptographic' can be left out if the rouines from the library
 *    being used are not cryptographic related :-).
 * 4. If you include any Windows specific code (or a derivative thereof) from 
 *    the apps directory (application code) you must include an acknowledgement:
 *    "This product includes software written by Tim Hudson (tjh@mincom.oz.au)"
 * 
 * THIS SOFTWARE IS PROVIDED BY ERIC YOUNG ``AS IS'' AND
 * ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT LIMITED TO, THE
 * IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR PURPOSE
 * ARE DISCLAIMED.  IN NO EVENT SHALL THE AUTHOR OR CONTRIBUTORS BE LIABLE
 * FOR ANY DIRECT, INDIRECT, INCIDENTAL, SPECIAL, EXEMPLARY, OR CONSEQUENTIAL
 * DAMAGES (INCLUDING, BUT NOT LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS
 * OR SERVICES; LOSS OF USE, DATA, OR PROFITS; OR BUSINESS INTERRUPTION)
 * HOWEVER CAUSED AND ON ANY THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT
 * LIABILITY, OR TORT (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY
 * OUT OF THE USE OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF
 * SUCH DAMAGE.
 * 
 * The licence and distribution terms for any publically available version or
 * derivative of this code cannot be changed.  i.e. this code cannot simply be
 * copied and put under another distribution licence
 * [including the GNU Public Licence.]
 */

static BF_KEY bf_init= {
        {
        0x243f6a88L, 0x85a308d3L, 0x13198a2eL, 0x03707344L,
        0xa4093822L, 0x299f31d0L, 0x082efa98L, 0xec4e6c89L,
        0x452821e6L, 0x38d01377L, 0xbe5466cfL, 0x34e90c6cL,
        0xc0ac29b7L, 0xc97c50ddL, 0x3f84d5b5L, 0xb5470917L,
        0x9216d5d9L, 0x8979fb1b
        },{
        0xd1310ba6L, 0x98dfb5acL, 0x2ffd72dbL, 0xd01adfb7L, 
        0xb8e1afedL, 0x6a267e96L, 0xba7c9045L, 0xf12c7f99L, 
        0x24a19947L, 0xb3916cf7L, 0x0801f2e2L, 0x858efc16L, 
        0x636920d8L, 0x71574e69L, 0xa458fea3L, 0xf4933d7eL, 
        0x0d95748fL, 0x728eb658L, 0x718bcd58L, 0x82154aeeL, 
        0x7b54a41dL, 0xc25a59b5L, 0x9c30d539L, 0x2af26013L, 
        0xc5d1b023L, 0x286085f0L, 0xca417918L, 0xb8db38efL, 
        0x8e79dcb0L, 0x603a180eL, 0x6c9e0e8bL, 0xb01e8a3eL, 
        0xd71577c1L, 0xbd314b27L, 0x78af2fdaL, 0x55605c60L, 
        0xe65525f3L, 0xaa55ab94L, 0x57489862L, 0x63e81440L, 
        0x55ca396aL, 0x2aab10b6L, 0xb4cc5c34L, 0x1141e8ceL, 
        0xa15486afL, 0x7c72e993L, 0xb3ee1411L, 0x636fbc2aL, 
        0x2ba9c55dL, 0x741831f6L, 0xce5c3e16L, 0x9b87931eL, 
        0xafd6ba33L, 0x6c24cf5cL, 0x7a325381L, 0x28958677L, 
        0x3b8f4898L, 0x6b4bb9afL, 0xc4bfe81bL, 0x66282193L, 
        0x61d809ccL, 0xfb21a991L, 0x487cac60L, 0x5dec8032L, 
        0xef845d5dL, 0xe98575b1L, 0xdc262302L, 0xeb651b88L, 
        0x23893e81L, 0xd396acc5L, 0x0f6d6ff3L, 0x83f44239L, 
        0x2e0b4482L, 0xa4842004L, 0x69c8f04aL, 0x9e1f9b5eL, 
        0x21c66842L, 0xf6e96c9aL, 0x670c9c61L, 0xabd388f0L, 
        0x6a51a0d2L, 0xd8542f68L, 0x960fa728L, 0xab5133a3L, 
        0x6eef0b6cL, 0x137a3be4L, 0xba3bf050L, 0x7efb2a98L, 
        0xa1f1651dL, 0x39af0176L, 0x66ca593eL, 0x82430e88L, 
        0x8cee8619L, 0x456f9fb4L, 0x7d84a5c3L, 0x3b8b5ebeL, 
        0xe06f75d8L, 0x85c12073L, 0x401a449fL, 0x56c16aa6L, 
        0x4ed3aa62L, 0x363f7706L, 0x1bfedf72L, 0x429b023dL, 
        0x37d0d724L, 0xd00a1248L, 0xdb0fead3L, 0x49f1c09bL, 
        0x075372c9L, 0x80991b7bL, 0x25d479d8L, 0xf6e8def7L, 
        0xe3fe501aL, 0xb6794c3bL, 0x976ce0bdL, 0x04c006baL, 
        0xc1a94fb6L, 0x409f60c4L, 0x5e5c9ec2L, 0x196a2463L, 
        0x68fb6fafL, 0x3e6c53b5L, 0x1339b2ebL, 0x3b52ec6fL, 
        0x6dfc511fL, 0x9b30952cL, 0xcc814544L, 0xaf5ebd09L, 
        0xbee3d004L, 0xde334afdL, 0x660f2807L, 0x192e4bb3L, 
        0xc0cba857L, 0x45c8740fL, 0xd20b5f39L, 0xb9d3fbdbL, 
        0x5579c0bdL, 0x1a60320aL, 0xd6a100c6L, 0x402c7279L, 
        0x679f25feL, 0xfb1fa3ccL, 0x8ea5e9f8L, 0xdb3222f8L, 
        0x3c7516dfL, 0xfd616b15L, 0x2f501ec8L, 0xad0552abL, 
        0x323db5faL, 0xfd238760L, 0x53317b48L, 0x3e00df82L, 
        0x9e5c57bbL, 0xca6f8ca0L, 0x1a87562eL, 0xdf1769dbL, 
        0xd542a8f6L, 0x287effc3L, 0xac6732c6L, 0x8c4f5573L, 
        0x695b27b0L, 0xbbca58c8L, 0xe1ffa35dL, 0xb8f011a0L, 
        0x10fa3d98L, 0xfd2183b8L, 0x4afcb56cL, 0x2dd1d35bL, 
        0x9a53e479L, 0xb6f84565L, 0xd28e49bcL, 0x4bfb9790L, 
        0xe1ddf2daL, 0xa4cb7e33L, 0x62fb1341L, 0xcee4c6e8L, 
        0xef20cadaL, 0x36774c01L, 0xd07e9efeL, 0x2bf11fb4L, 
        0x95dbda4dL, 0xae909198L, 0xeaad8e71L, 0x6b93d5a0L, 
        0xd08ed1d0L, 0xafc725e0L, 0x8e3c5b2fL, 0x8e7594b7L, 
        0x8ff6e2fbL, 0xf2122b64L, 0x8888b812L, 0x900df01cL, 
        0x4fad5ea0L, 0x688fc31cL, 0xd1cff191L, 0xb3a8c1adL, 
        0x2f2f2218L, 0xbe0e1777L, 0xea752dfeL, 0x8b021fa1L, 
        0xe5a0cc0fL, 0xb56f74e8L, 0x18acf3d6L, 0xce89e299L, 
        0xb4a84fe0L, 0xfd13e0b7L, 0x7cc43b81L, 0xd2ada8d9L, 
        0x165fa266L, 0x80957705L, 0x93cc7314L, 0x211a1477L, 
        0xe6ad2065L, 0x77b5fa86L, 0xc75442f5L, 0xfb9d35cfL, 
        0xebcdaf0cL, 0x7b3e89a0L, 0xd6411bd3L, 0xae1e7e49L, 
        0x00250e2dL, 0x2071b35eL, 0x226800bbL, 0x57b8e0afL, 
        0x2464369bL, 0xf009b91eL, 0x5563911dL, 0x59dfa6aaL, 
        0x78c14389L, 0xd95a537fL, 0x207d5ba2L, 0x02e5b9c5L, 
        0x83260376L, 0x6295cfa9L, 0x11c81968L, 0x4e734a41L, 
        0xb3472dcaL, 0x7b14a94aL, 0x1b510052L, 0x9a532915L, 
        0xd60f573fL, 0xbc9bc6e4L, 0x2b60a476L, 0x81e67400L, 
        0x08ba6fb5L, 0x571be91fL, 0xf296ec6bL, 0x2a0dd915L, 
        0xb6636521L, 0xe7b9f9b6L, 0xff34052eL, 0xc5855664L, 
        0x53b02d5dL, 0xa99f8fa1L, 0x08ba4799L, 0x6e85076aL, 
        0x4b7a70e9L, 0xb5b32944L, 0xdb75092eL, 0xc4192623L, 
        0xad6ea6b0L, 0x49a7df7dL, 0x9cee60b8L, 0x8fedb266L, 
        0xecaa8c71L, 0x699a17ffL, 0x5664526cL, 0xc2b19ee1L, 
        0x193602a5L, 0x75094c29L, 0xa0591340L, 0xe4183a3eL, 
        0x3f54989aL, 0x5b429d65L, 0x6b8fe4d6L, 0x99f73fd6L, 
        0xa1d29c07L, 0xefe830f5L, 0x4d2d38e6L, 0xf0255dc1L, 
        0x4cdd2086L, 0x8470eb26L, 0x6382e9c6L, 0x021ecc5eL, 
        0x09686b3fL, 0x3ebaefc9L, 0x3c971814L, 0x6b6a70a1L, 
        0x687f3584L, 0x52a0e286L, 0xb79c5305L, 0xaa500737L, 
        0x3e07841cL, 0x7fdeae5cL, 0x8e7d44ecL, 0x5716f2b8L, 
        0xb03ada37L, 0xf0500c0dL, 0xf01c1f04L, 0x0200b3ffL, 
        0xae0cf51aL, 0x3cb574b2L, 0x25837a58L, 0xdc0921bdL, 
        0xd19113f9L, 0x7ca92ff6L, 0x94324773L, 0x22f54701L, 
        0x3ae5e581L, 0x37c2dadcL, 0xc8b57634L, 0x9af3dda7L, 
        0xa9446146L, 0x0fd0030eL, 0xecc8c73eL, 0xa4751e41L, 
        0xe238cd99L, 0x3bea0e2fL, 0x3280bba1L, 0x183eb331L, 
        0x4e548b38L, 0x4f6db908L, 0x6f420d03L, 0xf60a04bfL, 
        0x2cb81290L, 0x24977c79L, 0x5679b072L, 0xbcaf89afL, 
        0xde9a771fL, 0xd9930810L, 0xb38bae12L, 0xdccf3f2eL, 
        0x5512721fL, 0x2e6b7124L, 0x501adde6L, 0x9f84cd87L, 
        0x7a584718L, 0x7408da17L, 0xbc9f9abcL, 0xe94b7d8cL, 
        0xec7aec3aL, 0xdb851dfaL, 0x63094366L, 0xc464c3d2L, 
        0xef1c1847L, 0x3215d908L, 0xdd433b37L, 0x24c2ba16L, 
        0x12a14d43L, 0x2a65c451L, 0x50940002L, 0x133ae4ddL, 
        0x71dff89eL, 0x10314e55L, 0x81ac77d6L, 0x5f11199bL, 
        0x043556f1L, 0xd7a3c76bL, 0x3c11183bL, 0x5924a509L, 
        0xf28fe6edL, 0x97f1fbfaL, 0x9ebabf2cL, 0x1e153c6eL, 
        0x86e34570L, 0xeae96fb1L, 0x860e5e0aL, 0x5a3e2ab3L, 
        0x771fe71cL, 0x4e3d06faL, 0x2965dcb9L, 0x99e71d0fL, 
        0x803e89d6L, 0x5266c825L, 0x2e4cc978L, 0x9c10b36aL, 
        0xc6150ebaL, 0x94e2ea78L, 0xa5fc3c53L, 0x1e0a2df4L, 
        0xf2f74ea7L, 0x361d2b3dL, 0x1939260fL, 0x19c27960L, 
        0x5223a708L, 0xf71312b6L, 0xebadfe6eL, 0xeac31f66L, 

⌨️ 快捷键说明

复制代码 Ctrl + C
搜索代码 Ctrl + F
全屏模式 F11
切换主题 Ctrl + Shift + D
显示快捷键 ?
增大字号 Ctrl + =
减小字号 Ctrl + -