aboutsummaryrefslogtreecommitdiff
path: root/src
diff options
context:
space:
mode:
authorMike Buland <eichlan@xagasoft.com>2012-04-10 08:32:23 +0000
committerMike Buland <eichlan@xagasoft.com>2012-04-10 08:32:23 +0000
commitd49fc3aeac4daa65416751f94943b6611ad247d3 (patch)
tree2d843ebe59284d06fea389744a3a08aad423868d /src
parent1e9d8f7a92e43f61e4d9f478f6e8dd5ae206616e (diff)
downloadlibbu++-d49fc3aeac4daa65416751f94943b6611ad247d3.tar.gz
libbu++-d49fc3aeac4daa65416751f94943b6611ad247d3.tar.bz2
libbu++-d49fc3aeac4daa65416751f94943b6611ad247d3.tar.xz
libbu++-d49fc3aeac4daa65416751f94943b6611ad247d3.zip
Rearranged the Cipher system, and added four modes of operation. It's pretty
slick, really, and we actually support four of the most common modes. Blowfish is still a template, but it doesn't really need to be anymore...
Diffstat (limited to 'src')
-rw-r--r--src/experimental/blowfish.cpp405
-rw-r--r--src/experimental/blowfish.h415
-rw-r--r--src/experimental/cipher.h2
-rw-r--r--src/experimental/ciphermodecbc.cpp2
-rw-r--r--src/experimental/ciphermodecbc.h54
-rw-r--r--src/experimental/ciphermodecfb.cpp2
-rw-r--r--src/experimental/ciphermodecfb.h53
-rw-r--r--src/experimental/ciphermodeecb.cpp1
-rw-r--r--src/experimental/ciphermodeecb.h32
-rw-r--r--src/experimental/ciphermodeofb.cpp2
-rw-r--r--src/experimental/ciphermodeofb.h56
-rw-r--r--src/tests/blowfish.cpp16
12 files changed, 619 insertions, 421 deletions
diff --git a/src/experimental/blowfish.cpp b/src/experimental/blowfish.cpp
index 7f89f0f..d01ecd3 100644
--- a/src/experimental/blowfish.cpp
+++ b/src/experimental/blowfish.cpp
@@ -1,407 +1,2 @@
1#include "bu/blowfish.h" 1#include "bu/blowfish.h"
2 2
3#include "bu/sio.h"
4
5using Bu::sio;
6
7#define F(x) \
8 (((SB[0][x.byte.zero] + SB[1][x.byte.one]) ^ SB[2][x.byte.two]) + \
9 SB[3][x.byte.three])
10
11Bu::Blowfish::Blowfish( Bu::Stream &rNext ) :
12 Bu::Cipher<8>( rNext )
13{
14}
15
16Bu::Blowfish::~Blowfish()
17{
18 reset();
19}
20
21#define revBytes( x ) x = (((x&0xff)<<24)|((x&0xff00)<<8)|((x&0xff0000)>>8)|((x&0xff000000)>>24))
22
23void Bu::Blowfish::setPassword( const Bu::String &sPass )
24{
25 reset();
26
27 uint32_t i,j,len=sPass.getSize();
28 Word Work,null0,null1;
29
30 if (len > 0)
31 {
32 j = 0;
33 for (i=0;i<NUM_SUBKEYS;i++)
34 {
35 Work.byte.zero = sPass[(j++)%len];
36 Work.byte.one = sPass[(j++)%len];
37 Work.byte.two = sPass[(j++)%len];
38 Work.byte.three = sPass[(j++)%len];
39 PA[i] ^= Work.word;
40 }
41
42 null0.word = null1.word = 0;
43
44 for (i=0;i<NUM_SUBKEYS;i+=2)
45 {
46 keyEncipher( null0, null1 );
47 PA[i] = null0.word;
48 PA[i+1] = null1.word;
49 }
50
51 for (j=0;j<NUM_S_BOXES;j++)
52 for (i=0;i<NUM_ENTRIES;i+=2)
53 {
54 keyEncipher( null0, null1 );
55 SB[j][i] = null0.word;
56 SB[j][i+1] = null1.word;
57 }
58 }
59
60 Work.word = null0.word = null1.word = 0;
61 len = 0;
62}
63
64void Bu::Blowfish::reset()
65{
66 uint32_t i,j;
67
68 static uint32_t PA_Init[NUM_SUBKEYS] =
69 {
70 0x243f6a88, 0x85a308d3, 0x13198a2e, 0x03707344,
71 0xa4093822, 0x299f31d0, 0x082efa98, 0xec4e6c89,
72 0x452821e6, 0x38d01377, 0xbe5466cf, 0x34e90c6c,
73 0xc0ac29b7, 0xc97c50dd, 0x3f84d5b5, 0xb5470917,
74 0x9216d5d9, 0x8979fb1b
75 };
76
77 static uint32_t SB_Init[NUM_S_BOXES][NUM_ENTRIES] = {
78 {
79 0xd1310ba6, 0x98dfb5ac, 0x2ffd72db, 0xd01adfb7,
80 0xb8e1afed, 0x6a267e96, 0xba7c9045, 0xf12c7f99,
81 0x24a19947, 0xb3916cf7, 0x0801f2e2, 0x858efc16,
82 0x636920d8, 0x71574e69, 0xa458fea3, 0xf4933d7e,
83 0x0d95748f, 0x728eb658, 0x718bcd58, 0x82154aee,
84 0x7b54a41d, 0xc25a59b5, 0x9c30d539, 0x2af26013,
85 0xc5d1b023, 0x286085f0, 0xca417918, 0xb8db38ef,
86 0x8e79dcb0, 0x603a180e, 0x6c9e0e8b, 0xb01e8a3e,
87 0xd71577c1, 0xbd314b27, 0x78af2fda, 0x55605c60,
88 0xe65525f3, 0xaa55ab94, 0x57489862, 0x63e81440,
89 0x55ca396a, 0x2aab10b6, 0xb4cc5c34, 0x1141e8ce,
90 0xa15486af, 0x7c72e993, 0xb3ee1411, 0x636fbc2a,
91 0x2ba9c55d, 0x741831f6, 0xce5c3e16, 0x9b87931e,
92 0xafd6ba33, 0x6c24cf5c, 0x7a325381, 0x28958677,
93 0x3b8f4898, 0x6b4bb9af, 0xc4bfe81b, 0x66282193,
94 0x61d809cc, 0xfb21a991, 0x487cac60, 0x5dec8032,
95 0xef845d5d, 0xe98575b1, 0xdc262302, 0xeb651b88,
96 0x23893e81, 0xd396acc5, 0x0f6d6ff3, 0x83f44239,
97 0x2e0b4482, 0xa4842004, 0x69c8f04a, 0x9e1f9b5e,
98 0x21c66842, 0xf6e96c9a, 0x670c9c61, 0xabd388f0,
99 0x6a51a0d2, 0xd8542f68, 0x960fa728, 0xab5133a3,
100 0x6eef0b6c, 0x137a3be4, 0xba3bf050, 0x7efb2a98,
101 0xa1f1651d, 0x39af0176, 0x66ca593e, 0x82430e88,
102 0x8cee8619, 0x456f9fb4, 0x7d84a5c3, 0x3b8b5ebe,
103 0xe06f75d8, 0x85c12073, 0x401a449f, 0x56c16aa6,
104 0x4ed3aa62, 0x363f7706, 0x1bfedf72, 0x429b023d,
105 0x37d0d724, 0xd00a1248, 0xdb0fead3, 0x49f1c09b,
106 0x075372c9, 0x80991b7b, 0x25d479d8, 0xf6e8def7,
107 0xe3fe501a, 0xb6794c3b, 0x976ce0bd, 0x04c006ba,
108 0xc1a94fb6, 0x409f60c4, 0x5e5c9ec2, 0x196a2463,
109 0x68fb6faf, 0x3e6c53b5, 0x1339b2eb, 0x3b52ec6f,
110 0x6dfc511f, 0x9b30952c, 0xcc814544, 0xaf5ebd09,
111
112 0xbee3d004, 0xde334afd, 0x660f2807, 0x192e4bb3,
113 0xc0cba857, 0x45c8740f, 0xd20b5f39, 0xb9d3fbdb,
114 0x5579c0bd, 0x1a60320a, 0xd6a100c6, 0x402c7279,
115 0x679f25fe, 0xfb1fa3cc, 0x8ea5e9f8, 0xdb3222f8,
116 0x3c7516df, 0xfd616b15, 0x2f501ec8, 0xad0552ab,
117 0x323db5fa, 0xfd238760, 0x53317b48, 0x3e00df82,
118 0x9e5c57bb, 0xca6f8ca0, 0x1a87562e, 0xdf1769db,
119 0xd542a8f6, 0x287effc3, 0xac6732c6, 0x8c4f5573,
120 0x695b27b0, 0xbbca58c8, 0xe1ffa35d, 0xb8f011a0,
121 0x10fa3d98, 0xfd2183b8, 0x4afcb56c, 0x2dd1d35b,
122 0x9a53e479, 0xb6f84565, 0xd28e49bc, 0x4bfb9790,
123 0xe1ddf2da, 0xa4cb7e33, 0x62fb1341, 0xcee4c6e8,
124 0xef20cada, 0x36774c01, 0xd07e9efe, 0x2bf11fb4,
125 0x95dbda4d, 0xae909198, 0xeaad8e71, 0x6b93d5a0,
126 0xd08ed1d0, 0xafc725e0, 0x8e3c5b2f, 0x8e7594b7,
127 0x8ff6e2fb, 0xf2122b64, 0x8888b812, 0x900df01c,
128 0x4fad5ea0, 0x688fc31c, 0xd1cff191, 0xb3a8c1ad,
129 0x2f2f2218, 0xbe0e1777, 0xea752dfe, 0x8b021fa1,
130 0xe5a0cc0f, 0xb56f74e8, 0x18acf3d6, 0xce89e299,
131 0xb4a84fe0, 0xfd13e0b7, 0x7cc43b81, 0xd2ada8d9,
132 0x165fa266, 0x80957705, 0x93cc7314, 0x211a1477,
133 0xe6ad2065, 0x77b5fa86, 0xc75442f5, 0xfb9d35cf,
134 0xebcdaf0c, 0x7b3e89a0, 0xd6411bd3, 0xae1e7e49,
135 0x00250e2d, 0x2071b35e, 0x226800bb, 0x57b8e0af,
136 0x2464369b, 0xf009b91e, 0x5563911d, 0x59dfa6aa,
137 0x78c14389, 0xd95a537f, 0x207d5ba2, 0x02e5b9c5,
138 0x83260376, 0x6295cfa9, 0x11c81968, 0x4e734a41,
139 0xb3472dca, 0x7b14a94a, 0x1b510052, 0x9a532915,
140 0xd60f573f, 0xbc9bc6e4, 0x2b60a476, 0x81e67400,
141 0x08ba6fb5, 0x571be91f, 0xf296ec6b, 0x2a0dd915,
142 0xb6636521, 0xe7b9f9b6, 0xff34052e, 0xc5855664,
143 0x53b02d5d, 0xa99f8fa1, 0x08ba4799, 0x6e85076a
144 }, {
145 0x4b7a70e9, 0xb5b32944, 0xdb75092e, 0xc4192623,
146 0xad6ea6b0, 0x49a7df7d, 0x9cee60b8, 0x8fedb266,
147 0xecaa8c71, 0x699a17ff, 0x5664526c, 0xc2b19ee1,
148 0x193602a5, 0x75094c29, 0xa0591340, 0xe4183a3e,
149 0x3f54989a, 0x5b429d65, 0x6b8fe4d6, 0x99f73fd6,
150 0xa1d29c07, 0xefe830f5, 0x4d2d38e6, 0xf0255dc1,
151 0x4cdd2086, 0x8470eb26, 0x6382e9c6, 0x021ecc5e,
152 0x09686b3f, 0x3ebaefc9, 0x3c971814, 0x6b6a70a1,
153 0x687f3584, 0x52a0e286, 0xb79c5305, 0xaa500737,
154 0x3e07841c, 0x7fdeae5c, 0x8e7d44ec, 0x5716f2b8,
155 0xb03ada37, 0xf0500c0d, 0xf01c1f04, 0x0200b3ff,
156 0xae0cf51a, 0x3cb574b2, 0x25837a58, 0xdc0921bd,
157 0xd19113f9, 0x7ca92ff6, 0x94324773, 0x22f54701,
158 0x3ae5e581, 0x37c2dadc, 0xc8b57634, 0x9af3dda7,
159 0xa9446146, 0x0fd0030e, 0xecc8c73e, 0xa4751e41,
160 0xe238cd99, 0x3bea0e2f, 0x3280bba1, 0x183eb331,
161 0x4e548b38, 0x4f6db908, 0x6f420d03, 0xf60a04bf,
162 0x2cb81290, 0x24977c79, 0x5679b072, 0xbcaf89af,
163 0xde9a771f, 0xd9930810, 0xb38bae12, 0xdccf3f2e,
164 0x5512721f, 0x2e6b7124, 0x501adde6, 0x9f84cd87,
165 0x7a584718, 0x7408da17, 0xbc9f9abc, 0xe94b7d8c,
166 0xec7aec3a, 0xdb851dfa, 0x63094366, 0xc464c3d2,
167 0xef1c1847, 0x3215d908, 0xdd433b37, 0x24c2ba16,
168 0x12a14d43, 0x2a65c451, 0x50940002, 0x133ae4dd,
169 0x71dff89e, 0x10314e55, 0x81ac77d6, 0x5f11199b,
170 0x043556f1, 0xd7a3c76b, 0x3c11183b, 0x5924a509,
171 0xf28fe6ed, 0x97f1fbfa, 0x9ebabf2c, 0x1e153c6e,
172 0x86e34570, 0xeae96fb1, 0x860e5e0a, 0x5a3e2ab3,
173 0x771fe71c, 0x4e3d06fa, 0x2965dcb9, 0x99e71d0f,
174 0x803e89d6, 0x5266c825, 0x2e4cc978, 0x9c10b36a,
175 0xc6150eba, 0x94e2ea78, 0xa5fc3c53, 0x1e0a2df4,
176 0xf2f74ea7, 0x361d2b3d, 0x1939260f, 0x19c27960,
177
178 0x5223a708, 0xf71312b6, 0xebadfe6e, 0xeac31f66,
179 0xe3bc4595, 0xa67bc883, 0xb17f37d1, 0x018cff28,
180 0xc332ddef, 0xbe6c5aa5, 0x65582185, 0x68ab9802,
181 0xeecea50f, 0xdb2f953b, 0x2aef7dad, 0x5b6e2f84,
182 0x1521b628, 0x29076170, 0xecdd4775, 0x619f1510,
183 0x13cca830, 0xeb61bd96, 0x0334fe1e, 0xaa0363cf,
184 0xb5735c90, 0x4c70a239, 0xd59e9e0b, 0xcbaade14,
185 0xeecc86bc, 0x60622ca7, 0x9cab5cab, 0xb2f3846e,
186 0x648b1eaf, 0x19bdf0ca, 0xa02369b9, 0x655abb50,
187 0x40685a32, 0x3c2ab4b3, 0x319ee9d5, 0xc021b8f7,
188 0x9b540b19, 0x875fa099, 0x95f7997e, 0x623d7da8,
189 0xf837889a, 0x97e32d77, 0x11ed935f, 0x16681281,
190 0x0e358829, 0xc7e61fd6, 0x96dedfa1, 0x7858ba99,
191 0x57f584a5, 0x1b227263, 0x9b83c3ff, 0x1ac24696,
192 0xcdb30aeb, 0x532e3054, 0x8fd948e4, 0x6dbc3128,
193 0x58ebf2ef, 0x34c6ffea, 0xfe28ed61, 0xee7c3c73,
194 0x5d4a14d9, 0xe864b7e3, 0x42105d14, 0x203e13e0,
195 0x45eee2b6, 0xa3aaabea, 0xdb6c4f15, 0xfacb4fd0,
196 0xc742f442, 0xef6abbb5, 0x654f3b1d, 0x41cd2105,
197 0xd81e799e, 0x86854dc7, 0xe44b476a, 0x3d816250,
198 0xcf62a1f2, 0x5b8d2646, 0xfc8883a0, 0xc1c7b6a3,
199 0x7f1524c3, 0x69cb7492, 0x47848a0b, 0x5692b285,
200 0x095bbf00, 0xad19489d, 0x1462b174, 0x23820e00,
201 0x58428d2a, 0x0c55f5ea, 0x1dadf43e, 0x233f7061,
202 0x3372f092, 0x8d937e41, 0xd65fecf1, 0x6c223bdb,
203 0x7cde3759, 0xcbee7460, 0x4085f2a7, 0xce77326e,
204 0xa6078084, 0x19f8509e, 0xe8efd855, 0x61d99735,
205 0xa969a7aa, 0xc50c06c2, 0x5a04abfc, 0x800bcadc,
206 0x9e447a2e, 0xc3453484, 0xfdd56705, 0x0e1e9ec9,
207 0xdb73dbd3, 0x105588cd, 0x675fda79, 0xe3674340,
208 0xc5c43465, 0x713e38d8, 0x3d28f89e, 0xf16dff20,
209 0x153e21e7, 0x8fb03d4a, 0xe6e39f2b, 0xdb83adf7
210 }, {
211 0xe93d5a68, 0x948140f7, 0xf64c261c, 0x94692934,
212 0x411520f7, 0x7602d4f7, 0xbcf46b2e, 0xd4a20068,
213 0xd4082471, 0x3320f46a, 0x43b7d4b7, 0x500061af,
214 0x1e39f62e, 0x97244546, 0x14214f74, 0xbf8b8840,
215 0x4d95fc1d, 0x96b591af, 0x70f4ddd3, 0x66a02f45,
216 0xbfbc09ec, 0x03bd9785, 0x7fac6dd0, 0x31cb8504,
217 0x96eb27b3, 0x55fd3941, 0xda2547e6, 0xabca0a9a,
218 0x28507825, 0x530429f4, 0x0a2c86da, 0xe9b66dfb,
219 0x68dc1462, 0xd7486900, 0x680ec0a4, 0x27a18dee,
220 0x4f3ffea2, 0xe887ad8c, 0xb58ce006, 0x7af4d6b6,
221 0xaace1e7c, 0xd3375fec, 0xce78a399, 0x406b2a42,
222 0x20fe9e35, 0xd9f385b9, 0xee39d7ab, 0x3b124e8b,
223 0x1dc9faf7, 0x4b6d1856, 0x26a36631, 0xeae397b2,
224 0x3a6efa74, 0xdd5b4332, 0x6841e7f7, 0xca7820fb,
225 0xfb0af54e, 0xd8feb397, 0x454056ac, 0xba489527,
226 0x55533a3a, 0x20838d87, 0xfe6ba9b7, 0xd096954b,
227 0x55a867bc, 0xa1159a58, 0xcca92963, 0x99e1db33,
228 0xa62a4a56, 0x3f3125f9, 0x5ef47e1c, 0x9029317c,
229 0xfdf8e802, 0x04272f70, 0x80bb155c, 0x05282ce3,
230 0x95c11548, 0xe4c66d22, 0x48c1133f, 0xc70f86dc,
231 0x07f9c9ee, 0x41041f0f, 0x404779a4, 0x5d886e17,
232 0x325f51eb, 0xd59bc0d1, 0xf2bcc18f, 0x41113564,
233 0x257b7834, 0x602a9c60, 0xdff8e8a3, 0x1f636c1b,
234 0x0e12b4c2, 0x02e1329e, 0xaf664fd1, 0xcad18115,
235 0x6b2395e0, 0x333e92e1, 0x3b240b62, 0xeebeb922,
236 0x85b2a20e, 0xe6ba0d99, 0xde720c8c, 0x2da2f728,
237 0xd0127845, 0x95b794fd, 0x647d0862, 0xe7ccf5f0,
238 0x5449a36f, 0x877d48fa, 0xc39dfd27, 0xf33e8d1e,
239 0x0a476341, 0x992eff74, 0x3a6f6eab, 0xf4f8fd37,
240 0xa812dc60, 0xa1ebddf8, 0x991be14c, 0xdb6e6b0d,
241 0xc67b5510, 0x6d672c37, 0x2765d43b, 0xdcd0e804,
242 0xf1290dc7, 0xcc00ffa3, 0xb5390f92, 0x690fed0b,
243
244 0x667b9ffb, 0xcedb7d9c, 0xa091cf0b, 0xd9155ea3,
245 0xbb132f88, 0x515bad24, 0x7b9479bf, 0x763bd6eb,
246 0x37392eb3, 0xcc115979, 0x8026e297, 0xf42e312d,
247 0x6842ada7, 0xc66a2b3b, 0x12754ccc, 0x782ef11c,
248 0x6a124237, 0xb79251e7, 0x06a1bbe6, 0x4bfb6350,
249 0x1a6b1018, 0x11caedfa, 0x3d25bdd8, 0xe2e1c3c9,
250 0x44421659, 0x0a121386, 0xd90cec6e, 0xd5abea2a,
251 0x64af674e, 0xda86a85f, 0xbebfe988, 0x64e4c3fe,
252 0x9dbc8057, 0xf0f7c086, 0x60787bf8, 0x6003604d,
253 0xd1fd8346, 0xf6381fb0, 0x7745ae04, 0xd736fccc,
254 0x83426b33, 0xf01eab71, 0xb0804187, 0x3c005e5f,
255 0x77a057be, 0xbde8ae24, 0x55464299, 0xbf582e61,
256 0x4e58f48f, 0xf2ddfda2, 0xf474ef38, 0x8789bdc2,
257 0x5366f9c3, 0xc8b38e74, 0xb475f255, 0x46fcd9b9,
258 0x7aeb2661, 0x8b1ddf84, 0x846a0e79, 0x915f95e2,
259 0x466e598e, 0x20b45770, 0x8cd55591, 0xc902de4c,
260 0xb90bace1, 0xbb8205d0, 0x11a86248, 0x7574a99e,
261 0xb77f19b6, 0xe0a9dc09, 0x662d09a1, 0xc4324633,
262 0xe85a1f02, 0x09f0be8c, 0x4a99a025, 0x1d6efe10,
263 0x1ab93d1d, 0x0ba5a4df, 0xa186f20f, 0x2868f169,
264 0xdcb7da83, 0x573906fe, 0xa1e2ce9b, 0x4fcd7f52,
265 0x50115e01, 0xa70683fa, 0xa002b5c4, 0x0de6d027,
266 0x9af88c27, 0x773f8641, 0xc3604c06, 0x61a806b5,
267 0xf0177a28, 0xc0f586e0, 0x006058aa, 0x30dc7d62,
268 0x11e69ed7, 0x2338ea63, 0x53c2dd94, 0xc2c21634,
269 0xbbcbee56, 0x90bcb6de, 0xebfc7da1, 0xce591d76,
270 0x6f05e409, 0x4b7c0188, 0x39720a3d, 0x7c927c24,
271 0x86e3725f, 0x724d9db9, 0x1ac15bb4, 0xd39eb8fc,
272 0xed545578, 0x08fca5b5, 0xd83d7cd3, 0x4dad0fc4,
273 0x1e50ef5e, 0xb161e6f8, 0xa28514d9, 0x6c51133c,
274 0x6fd5c7e7, 0x56e14ec4, 0x362abfce, 0xddc6c837,
275 0xd79a3234, 0x92638212, 0x670efa8e, 0x406000e0
276 }, {
277 0x3a39ce37, 0xd3faf5cf, 0xabc27737, 0x5ac52d1b,
278 0x5cb0679e, 0x4fa33742, 0xd3822740, 0x99bc9bbe,
279 0xd5118e9d, 0xbf0f7315, 0xd62d1c7e, 0xc700c47b,
280 0xb78c1b6b, 0x21a19045, 0xb26eb1be, 0x6a366eb4,
281 0x5748ab2f, 0xbc946e79, 0xc6a376d2, 0x6549c2c8,
282 0x530ff8ee, 0x468dde7d, 0xd5730a1d, 0x4cd04dc6,
283 0x2939bbdb, 0xa9ba4650, 0xac9526e8, 0xbe5ee304,
284 0xa1fad5f0, 0x6a2d519a, 0x63ef8ce2, 0x9a86ee22,
285 0xc089c2b8, 0x43242ef6, 0xa51e03aa, 0x9cf2d0a4,
286 0x83c061ba, 0x9be96a4d, 0x8fe51550, 0xba645bd6,
287 0x2826a2f9, 0xa73a3ae1, 0x4ba99586, 0xef5562e9,
288 0xc72fefd3, 0xf752f7da, 0x3f046f69, 0x77fa0a59,
289 0x80e4a915, 0x87b08601, 0x9b09e6ad, 0x3b3ee593,
290 0xe990fd5a, 0x9e34d797, 0x2cf0b7d9, 0x022b8b51,
291 0x96d5ac3a, 0x017da67d, 0xd1cf3ed6, 0x7c7d2d28,
292 0x1f9f25cf, 0xadf2b89b, 0x5ad6b472, 0x5a88f54c,
293 0xe029ac71, 0xe019a5e6, 0x47b0acfd, 0xed93fa9b,
294 0xe8d3c48d, 0x283b57cc, 0xf8d56629, 0x79132e28,
295 0x785f0191, 0xed756055, 0xf7960e44, 0xe3d35e8c,
296 0x15056dd4, 0x88f46dba, 0x03a16125, 0x0564f0bd,
297 0xc3eb9e15, 0x3c9057a2, 0x97271aec, 0xa93a072a,
298 0x1b3f6d9b, 0x1e6321f5, 0xf59c66fb, 0x26dcf319,
299 0x7533d928, 0xb155fdf5, 0x03563482, 0x8aba3cbb,
300 0x28517711, 0xc20ad9f8, 0xabcc5167, 0xccad925f,
301 0x4de81751, 0x3830dc8e, 0x379d5862, 0x9320f991,
302 0xea7a90c2, 0xfb3e7bce, 0x5121ce64, 0x774fbe32,
303 0xa8b6e37e, 0xc3293d46, 0x48de5369, 0x6413e680,
304 0xa2ae0810, 0xdd6db224, 0x69852dfd, 0x09072166,
305 0xb39a460a, 0x6445c0dd, 0x586cdecf, 0x1c20c8ae,
306 0x5bbef7dd, 0x1b588d40, 0xccd2017f, 0x6bb4e3bb,
307 0xdda26a7e, 0x3a59ff45, 0x3e350a44, 0xbcb4cdd5,
308 0x72eacea8, 0xfa6484bb, 0x8d6612ae, 0xbf3c6f47,
309
310 0xd29be463, 0x542f5d9e, 0xaec2771b, 0xf64e6370,
311 0x740e0d8d, 0xe75b1357, 0xf8721671, 0xaf537d5d,
312 0x4040cb08, 0x4eb4e2cc, 0x34d2466a, 0x0115af84,
313 0xe1b00428, 0x95983a1d, 0x06b89fb4, 0xce6ea048,
314 0x6f3f3b82, 0x3520ab82, 0x011a1d4b, 0x277227f8,
315 0x611560b1, 0xe7933fdc, 0xbb3a792b, 0x344525bd,
316 0xa08839e1, 0x51ce794b, 0x2f32c9b7, 0xa01fbac9,
317 0xe01cc87e, 0xbcc7d1f6, 0xcf0111c3, 0xa1e8aac7,
318 0x1a908749, 0xd44fbd9a, 0xd0dadecb, 0xd50ada38,
319 0x0339c32a, 0xc6913667, 0x8df9317c, 0xe0b12b4f,
320 0xf79e59b7, 0x43f5bb3a, 0xf2d519ff, 0x27d9459c,
321 0xbf97222c, 0x15e6fc2a, 0x0f91fc71, 0x9b941525,
322 0xfae59361, 0xceb69ceb, 0xc2a86459, 0x12baa8d1,
323 0xb6c1075e, 0xe3056a0c, 0x10d25065, 0xcb03a442,
324 0xe0ec6e0e, 0x1698db3b, 0x4c98a0be, 0x3278e964,
325 0x9f1f9532, 0xe0d392df, 0xd3a0342b, 0x8971f21e,
326 0x1b0a7441, 0x4ba3348c, 0xc5be7120, 0xc37632d8,
327 0xdf359f8d, 0x9b992f2e, 0xe60b6f47, 0x0fe3f11d,
328 0xe54cda54, 0x1edad891, 0xce6279cf, 0xcd3e7e6f,
329 0x1618b166, 0xfd2c1d05, 0x848fd2c5, 0xf6fb2299,
330 0xf523f357, 0xa6327623, 0x93a83531, 0x56cccd02,
331 0xacf08162, 0x5a75ebb5, 0x6e163697, 0x88d273cc,
332 0xde966292, 0x81b949d0, 0x4c50901b, 0x71c65614,
333 0xe6c6c7bd, 0x327a140a, 0x45e1d006, 0xc3f27b9a,
334 0xc9aa53fd, 0x62a80f00, 0xbb25bfe2, 0x35bdd2f6,
335 0x71126905, 0xb2040222, 0xb6cbcf7c, 0xcd769c2b,
336 0x53113ec0, 0x1640e3d3, 0x38abbd60, 0x2547adf0,
337 0xba38209c, 0xf746ce76, 0x77afa1c5, 0x20756060,
338 0x85cbfe4e, 0x8ae88dd8, 0x7aaaf9b0, 0x4cf9aa7e,
339 0x1948c25c, 0x02fb8a8c, 0x01c36ae4, 0xd6ebe1f9,
340 0x90d4f869, 0xa65cdea0, 0x3f09252d, 0xc208e69f,
341 0xb74e6132, 0xce77e25b, 0x578fdfe3, 0x3ac372e6
342 }
343 };
344
345 for (i=0;i<NUM_SUBKEYS;i++)
346 PA[i] = PA_Init[i];
347
348 for (j=0;j<NUM_S_BOXES;j++)
349 for (i=0;i<NUM_ENTRIES;i++)
350 SB[j][i] = SB_Init[j][i];
351}
352
353void Bu::Blowfish::encipher( void *pData )
354{
355 DWord *dwWork = (DWord *)pData;
356 Word &w1 = dwWork->word0, &w2 = dwWork->word1;
357
358 w1.word = be32toh( w1.word );
359 w2.word = be32toh( w2.word );
360
361 keyEncipher( w1, w2 );
362
363 revBytes( w1.word );
364 revBytes( w2.word );
365}
366
367void Bu::Blowfish::keyEncipher( Word &w1, Word &w2 )
368{
369 w1.word ^= PA[0];
370 w2.word ^= F(w1)^PA[1]; w1.word ^= F(w2)^PA[2];
371 w2.word ^= F(w1)^PA[3]; w1.word ^= F(w2)^PA[4];
372 w2.word ^= F(w1)^PA[5]; w1.word ^= F(w2)^PA[6];
373 w2.word ^= F(w1)^PA[7]; w1.word ^= F(w2)^PA[8];
374 w2.word ^= F(w1)^PA[9]; w1.word ^= F(w2)^PA[10];
375 w2.word ^= F(w1)^PA[11]; w1.word ^= F(w2)^PA[12];
376 w2.word ^= F(w1)^PA[13]; w1.word ^= F(w2)^PA[14];
377 w2.word ^= F(w1)^PA[15]; w1.word ^= F(w2)^PA[16];
378 w2.word ^= PA[17];
379
380 Bu::swap( w1, w2 );
381}
382
383void Bu::Blowfish::decipher( void *pData )
384{
385 DWord *dwWork = (DWord *)pData;
386 Word &w1 = dwWork->word0, &w2 = dwWork->word1;
387
388 revBytes( w1.word );
389 revBytes( w2.word );
390
391 w1.word ^= PA[17];
392 w2.word ^= F(w1)^PA[16]; w1.word ^= F(w2)^PA[15];
393 w2.word ^= F(w1)^PA[14]; w1.word ^= F(w2)^PA[13];
394 w2.word ^= F(w1)^PA[12]; w1.word ^= F(w2)^PA[11];
395 w2.word ^= F(w1)^PA[10]; w1.word ^= F(w2)^PA[9];
396 w2.word ^= F(w1)^PA[8]; w1.word ^= F(w2)^PA[7];
397 w2.word ^= F(w1)^PA[6]; w1.word ^= F(w2)^PA[5];
398 w2.word ^= F(w1)^PA[4]; w1.word ^= F(w2)^PA[3];
399 w2.word ^= F(w1)^PA[2]; w1.word ^= F(w2)^PA[1];
400 w2.word ^= PA[0];
401
402 Bu::swap( w1, w2 );
403
404 w1.word = htobe32( w1.word );
405 w2.word = htobe32( w2.word );
406}
407
diff --git a/src/experimental/blowfish.h b/src/experimental/blowfish.h
index c043b12..855ce2b 100644
--- a/src/experimental/blowfish.h
+++ b/src/experimental/blowfish.h
@@ -3,22 +3,78 @@
3 3
4#include "bu/cipher.h" 4#include "bu/cipher.h"
5 5
6#include "bu/ciphermodeecb.h"
7#include "bu/ciphermodecfb.h"
8#include "bu/ciphermodecbc.h"
9#include "bu/ciphermodeofb.h"
10
6#define NUM_SUBKEYS 18 11#define NUM_SUBKEYS 18
7#define NUM_S_BOXES 4 12#define NUM_S_BOXES 4
8#define NUM_ENTRIES 256 13#define NUM_ENTRIES 256
9 14
10#define MAX_STRING 256 15#define MAX_STRING 256
11#define MAX_PASSWD 56 // 448bits 16#define MAX_PASSWD 56 // 448bits
17#define F(x) \
18 (((SB[0][x.byte.zero] + SB[1][x.byte.one]) ^ SB[2][x.byte.two]) + \
19 SB[3][x.byte.three])
20#define revBytes( x ) x = (((x&0xff)<<24)|((x&0xff00)<<8)|((x&0xff0000)>>8)|((x&0xff000000)>>24))
12 21
13namespace Bu 22namespace Bu
14{ 23{
24 template<int Mode>
15 class Blowfish : public Bu::Cipher<8> 25 class Blowfish : public Bu::Cipher<8>
16 { 26 {
17 public: 27 public:
18 Blowfish( Bu::Stream &rNext ); 28 Blowfish( Bu::Stream &rNext ) :
19 virtual ~Blowfish(); 29 Bu::Cipher<8>( rNext )
30 {
31 }
32
33 virtual ~Blowfish()
34 {
35 reset();
36 }
37
38 void setPassword( const Bu::String &sPass )
39 {
40 reset();
41
42 uint32_t i,j,len=sPass.getSize();
43 Word Work,null0,null1;
44
45 if (len > 0)
46 {
47 j = 0;
48 for (i=0;i<NUM_SUBKEYS;i++)
49 {
50 Work.byte.zero = sPass[(j++)%len];
51 Work.byte.one = sPass[(j++)%len];
52 Work.byte.two = sPass[(j++)%len];
53 Work.byte.three = sPass[(j++)%len];
54 PA[i] ^= Work.word;
55 }
20 56
21 void setPassword( const Bu::String &sPass ); 57 null0.word = null1.word = 0;
58
59 for (i=0;i<NUM_SUBKEYS;i+=2)
60 {
61 keyEncipher( null0, null1 );
62 PA[i] = null0.word;
63 PA[i+1] = null1.word;
64 }
65
66 for (j=0;j<NUM_S_BOXES;j++)
67 for (i=0;i<NUM_ENTRIES;i+=2)
68 {
69 keyEncipher( null0, null1 );
70 SB[j][i] = null0.word;
71 SB[j][i+1] = null1.word;
72 }
73 }
74
75 Work.word = null0.word = null1.word = 0;
76 len = 0;
77 }
22 78
23 private: 79 private:
24 uint32_t PA[NUM_SUBKEYS]; 80 uint32_t PA[NUM_SUBKEYS];
@@ -56,11 +112,356 @@ namespace Bu
56 Word word1; 112 Word word1;
57 }; 113 };
58 114
59 void reset(); 115 void reset()
60 virtual void encipher( void *pData ); 116 {
61 virtual void decipher( void *pData ); 117 uint32_t i,j;
62 inline void keyEncipher( Word &w1, Word &w2 ); 118
119 static uint32_t PA_Init[NUM_SUBKEYS] =
120 {
121 0x243f6a88, 0x85a308d3, 0x13198a2e, 0x03707344,
122 0xa4093822, 0x299f31d0, 0x082efa98, 0xec4e6c89,
123 0x452821e6, 0x38d01377, 0xbe5466cf, 0x34e90c6c,
124 0xc0ac29b7, 0xc97c50dd, 0x3f84d5b5, 0xb5470917,
125 0x9216d5d9, 0x8979fb1b
126 };
127
128 static uint32_t SB_Init[NUM_S_BOXES][NUM_ENTRIES] = {
129 {
130 0xd1310ba6, 0x98dfb5ac, 0x2ffd72db, 0xd01adfb7,
131 0xb8e1afed, 0x6a267e96, 0xba7c9045, 0xf12c7f99,
132 0x24a19947, 0xb3916cf7, 0x0801f2e2, 0x858efc16,
133 0x636920d8, 0x71574e69, 0xa458fea3, 0xf4933d7e,
134 0x0d95748f, 0x728eb658, 0x718bcd58, 0x82154aee,
135 0x7b54a41d, 0xc25a59b5, 0x9c30d539, 0x2af26013,
136 0xc5d1b023, 0x286085f0, 0xca417918, 0xb8db38ef,
137 0x8e79dcb0, 0x603a180e, 0x6c9e0e8b, 0xb01e8a3e,
138 0xd71577c1, 0xbd314b27, 0x78af2fda, 0x55605c60,
139 0xe65525f3, 0xaa55ab94, 0x57489862, 0x63e81440,
140 0x55ca396a, 0x2aab10b6, 0xb4cc5c34, 0x1141e8ce,
141 0xa15486af, 0x7c72e993, 0xb3ee1411, 0x636fbc2a,
142 0x2ba9c55d, 0x741831f6, 0xce5c3e16, 0x9b87931e,
143 0xafd6ba33, 0x6c24cf5c, 0x7a325381, 0x28958677,
144 0x3b8f4898, 0x6b4bb9af, 0xc4bfe81b, 0x66282193,
145 0x61d809cc, 0xfb21a991, 0x487cac60, 0x5dec8032,
146 0xef845d5d, 0xe98575b1, 0xdc262302, 0xeb651b88,
147 0x23893e81, 0xd396acc5, 0x0f6d6ff3, 0x83f44239,
148 0x2e0b4482, 0xa4842004, 0x69c8f04a, 0x9e1f9b5e,
149 0x21c66842, 0xf6e96c9a, 0x670c9c61, 0xabd388f0,
150 0x6a51a0d2, 0xd8542f68, 0x960fa728, 0xab5133a3,
151 0x6eef0b6c, 0x137a3be4, 0xba3bf050, 0x7efb2a98,
152 0xa1f1651d, 0x39af0176, 0x66ca593e, 0x82430e88,
153 0x8cee8619, 0x456f9fb4, 0x7d84a5c3, 0x3b8b5ebe,
154 0xe06f75d8, 0x85c12073, 0x401a449f, 0x56c16aa6,
155 0x4ed3aa62, 0x363f7706, 0x1bfedf72, 0x429b023d,
156 0x37d0d724, 0xd00a1248, 0xdb0fead3, 0x49f1c09b,
157 0x075372c9, 0x80991b7b, 0x25d479d8, 0xf6e8def7,
158 0xe3fe501a, 0xb6794c3b, 0x976ce0bd, 0x04c006ba,
159 0xc1a94fb6, 0x409f60c4, 0x5e5c9ec2, 0x196a2463,
160 0x68fb6faf, 0x3e6c53b5, 0x1339b2eb, 0x3b52ec6f,
161 0x6dfc511f, 0x9b30952c, 0xcc814544, 0xaf5ebd09,
162
163 0xbee3d004, 0xde334afd, 0x660f2807, 0x192e4bb3,
164 0xc0cba857, 0x45c8740f, 0xd20b5f39, 0xb9d3fbdb,
165 0x5579c0bd, 0x1a60320a, 0xd6a100c6, 0x402c7279,
166 0x679f25fe, 0xfb1fa3cc, 0x8ea5e9f8, 0xdb3222f8,
167 0x3c7516df, 0xfd616b15, 0x2f501ec8, 0xad0552ab,
168 0x323db5fa, 0xfd238760, 0x53317b48, 0x3e00df82,
169 0x9e5c57bb, 0xca6f8ca0, 0x1a87562e, 0xdf1769db,
170 0xd542a8f6, 0x287effc3, 0xac6732c6, 0x8c4f5573,
171 0x695b27b0, 0xbbca58c8, 0xe1ffa35d, 0xb8f011a0,
172 0x10fa3d98, 0xfd2183b8, 0x4afcb56c, 0x2dd1d35b,
173 0x9a53e479, 0xb6f84565, 0xd28e49bc, 0x4bfb9790,
174 0xe1ddf2da, 0xa4cb7e33, 0x62fb1341, 0xcee4c6e8,
175 0xef20cada, 0x36774c01, 0xd07e9efe, 0x2bf11fb4,
176 0x95dbda4d, 0xae909198, 0xeaad8e71, 0x6b93d5a0,
177 0xd08ed1d0, 0xafc725e0, 0x8e3c5b2f, 0x8e7594b7,
178 0x8ff6e2fb, 0xf2122b64, 0x8888b812, 0x900df01c,
179 0x4fad5ea0, 0x688fc31c, 0xd1cff191, 0xb3a8c1ad,
180 0x2f2f2218, 0xbe0e1777, 0xea752dfe, 0x8b021fa1,
181 0xe5a0cc0f, 0xb56f74e8, 0x18acf3d6, 0xce89e299,
182 0xb4a84fe0, 0xfd13e0b7, 0x7cc43b81, 0xd2ada8d9,
183 0x165fa266, 0x80957705, 0x93cc7314, 0x211a1477,
184 0xe6ad2065, 0x77b5fa86, 0xc75442f5, 0xfb9d35cf,
185 0xebcdaf0c, 0x7b3e89a0, 0xd6411bd3, 0xae1e7e49,
186 0x00250e2d, 0x2071b35e, 0x226800bb, 0x57b8e0af,
187 0x2464369b, 0xf009b91e, 0x5563911d, 0x59dfa6aa,
188 0x78c14389, 0xd95a537f, 0x207d5ba2, 0x02e5b9c5,
189 0x83260376, 0x6295cfa9, 0x11c81968, 0x4e734a41,
190 0xb3472dca, 0x7b14a94a, 0x1b510052, 0x9a532915,
191 0xd60f573f, 0xbc9bc6e4, 0x2b60a476, 0x81e67400,
192 0x08ba6fb5, 0x571be91f, 0xf296ec6b, 0x2a0dd915,
193 0xb6636521, 0xe7b9f9b6, 0xff34052e, 0xc5855664,
194 0x53b02d5d, 0xa99f8fa1, 0x08ba4799, 0x6e85076a
195 }, {
196 0x4b7a70e9, 0xb5b32944, 0xdb75092e, 0xc4192623,
197 0xad6ea6b0, 0x49a7df7d, 0x9cee60b8, 0x8fedb266,
198 0xecaa8c71, 0x699a17ff, 0x5664526c, 0xc2b19ee1,
199 0x193602a5, 0x75094c29, 0xa0591340, 0xe4183a3e,
200 0x3f54989a, 0x5b429d65, 0x6b8fe4d6, 0x99f73fd6,
201 0xa1d29c07, 0xefe830f5, 0x4d2d38e6, 0xf0255dc1,
202 0x4cdd2086, 0x8470eb26, 0x6382e9c6, 0x021ecc5e,
203 0x09686b3f, 0x3ebaefc9, 0x3c971814, 0x6b6a70a1,
204 0x687f3584, 0x52a0e286, 0xb79c5305, 0xaa500737,
205 0x3e07841c, 0x7fdeae5c, 0x8e7d44ec, 0x5716f2b8,
206 0xb03ada37, 0xf0500c0d, 0xf01c1f04, 0x0200b3ff,
207 0xae0cf51a, 0x3cb574b2, 0x25837a58, 0xdc0921bd,
208 0xd19113f9, 0x7ca92ff6, 0x94324773, 0x22f54701,
209 0x3ae5e581, 0x37c2dadc, 0xc8b57634, 0x9af3dda7,
210 0xa9446146, 0x0fd0030e, 0xecc8c73e, 0xa4751e41,
211 0xe238cd99, 0x3bea0e2f, 0x3280bba1, 0x183eb331,
212 0x4e548b38, 0x4f6db908, 0x6f420d03, 0xf60a04bf,
213 0x2cb81290, 0x24977c79, 0x5679b072, 0xbcaf89af,
214 0xde9a771f, 0xd9930810, 0xb38bae12, 0xdccf3f2e,
215 0x5512721f, 0x2e6b7124, 0x501adde6, 0x9f84cd87,
216 0x7a584718, 0x7408da17, 0xbc9f9abc, 0xe94b7d8c,
217 0xec7aec3a, 0xdb851dfa, 0x63094366, 0xc464c3d2,
218 0xef1c1847, 0x3215d908, 0xdd433b37, 0x24c2ba16,
219 0x12a14d43, 0x2a65c451, 0x50940002, 0x133ae4dd,
220 0x71dff89e, 0x10314e55, 0x81ac77d6, 0x5f11199b,
221 0x043556f1, 0xd7a3c76b, 0x3c11183b, 0x5924a509,
222 0xf28fe6ed, 0x97f1fbfa, 0x9ebabf2c, 0x1e153c6e,
223 0x86e34570, 0xeae96fb1, 0x860e5e0a, 0x5a3e2ab3,
224 0x771fe71c, 0x4e3d06fa, 0x2965dcb9, 0x99e71d0f,
225 0x803e89d6, 0x5266c825, 0x2e4cc978, 0x9c10b36a,
226 0xc6150eba, 0x94e2ea78, 0xa5fc3c53, 0x1e0a2df4,
227 0xf2f74ea7, 0x361d2b3d, 0x1939260f, 0x19c27960,
228
229 0x5223a708, 0xf71312b6, 0xebadfe6e, 0xeac31f66,
230 0xe3bc4595, 0xa67bc883, 0xb17f37d1, 0x018cff28,
231 0xc332ddef, 0xbe6c5aa5, 0x65582185, 0x68ab9802,
232 0xeecea50f, 0xdb2f953b, 0x2aef7dad, 0x5b6e2f84,
233 0x1521b628, 0x29076170, 0xecdd4775, 0x619f1510,
234 0x13cca830, 0xeb61bd96, 0x0334fe1e, 0xaa0363cf,
235 0xb5735c90, 0x4c70a239, 0xd59e9e0b, 0xcbaade14,
236 0xeecc86bc, 0x60622ca7, 0x9cab5cab, 0xb2f3846e,
237 0x648b1eaf, 0x19bdf0ca, 0xa02369b9, 0x655abb50,
238 0x40685a32, 0x3c2ab4b3, 0x319ee9d5, 0xc021b8f7,
239 0x9b540b19, 0x875fa099, 0x95f7997e, 0x623d7da8,
240 0xf837889a, 0x97e32d77, 0x11ed935f, 0x16681281,
241 0x0e358829, 0xc7e61fd6, 0x96dedfa1, 0x7858ba99,
242 0x57f584a5, 0x1b227263, 0x9b83c3ff, 0x1ac24696,
243 0xcdb30aeb, 0x532e3054, 0x8fd948e4, 0x6dbc3128,
244 0x58ebf2ef, 0x34c6ffea, 0xfe28ed61, 0xee7c3c73,
245 0x5d4a14d9, 0xe864b7e3, 0x42105d14, 0x203e13e0,
246 0x45eee2b6, 0xa3aaabea, 0xdb6c4f15, 0xfacb4fd0,
247 0xc742f442, 0xef6abbb5, 0x654f3b1d, 0x41cd2105,
248 0xd81e799e, 0x86854dc7, 0xe44b476a, 0x3d816250,
249 0xcf62a1f2, 0x5b8d2646, 0xfc8883a0, 0xc1c7b6a3,
250 0x7f1524c3, 0x69cb7492, 0x47848a0b, 0x5692b285,
251 0x095bbf00, 0xad19489d, 0x1462b174, 0x23820e00,
252 0x58428d2a, 0x0c55f5ea, 0x1dadf43e, 0x233f7061,
253 0x3372f092, 0x8d937e41, 0xd65fecf1, 0x6c223bdb,
254 0x7cde3759, 0xcbee7460, 0x4085f2a7, 0xce77326e,
255 0xa6078084, 0x19f8509e, 0xe8efd855, 0x61d99735,
256 0xa969a7aa, 0xc50c06c2, 0x5a04abfc, 0x800bcadc,
257 0x9e447a2e, 0xc3453484, 0xfdd56705, 0x0e1e9ec9,
258 0xdb73dbd3, 0x105588cd, 0x675fda79, 0xe3674340,
259 0xc5c43465, 0x713e38d8, 0x3d28f89e, 0xf16dff20,
260 0x153e21e7, 0x8fb03d4a, 0xe6e39f2b, 0xdb83adf7
261 }, {
262 0xe93d5a68, 0x948140f7, 0xf64c261c, 0x94692934,
263 0x411520f7, 0x7602d4f7, 0xbcf46b2e, 0xd4a20068,
264 0xd4082471, 0x3320f46a, 0x43b7d4b7, 0x500061af,
265 0x1e39f62e, 0x97244546, 0x14214f74, 0xbf8b8840,
266 0x4d95fc1d, 0x96b591af, 0x70f4ddd3, 0x66a02f45,
267 0xbfbc09ec, 0x03bd9785, 0x7fac6dd0, 0x31cb8504,
268 0x96eb27b3, 0x55fd3941, 0xda2547e6, 0xabca0a9a,
269 0x28507825, 0x530429f4, 0x0a2c86da, 0xe9b66dfb,
270 0x68dc1462, 0xd7486900, 0x680ec0a4, 0x27a18dee,
271 0x4f3ffea2, 0xe887ad8c, 0xb58ce006, 0x7af4d6b6,
272 0xaace1e7c, 0xd3375fec, 0xce78a399, 0x406b2a42,
273 0x20fe9e35, 0xd9f385b9, 0xee39d7ab, 0x3b124e8b,
274 0x1dc9faf7, 0x4b6d1856, 0x26a36631, 0xeae397b2,
275 0x3a6efa74, 0xdd5b4332, 0x6841e7f7, 0xca7820fb,
276 0xfb0af54e, 0xd8feb397, 0x454056ac, 0xba489527,
277 0x55533a3a, 0x20838d87, 0xfe6ba9b7, 0xd096954b,
278 0x55a867bc, 0xa1159a58, 0xcca92963, 0x99e1db33,
279 0xa62a4a56, 0x3f3125f9, 0x5ef47e1c, 0x9029317c,
280 0xfdf8e802, 0x04272f70, 0x80bb155c, 0x05282ce3,
281 0x95c11548, 0xe4c66d22, 0x48c1133f, 0xc70f86dc,
282 0x07f9c9ee, 0x41041f0f, 0x404779a4, 0x5d886e17,
283 0x325f51eb, 0xd59bc0d1, 0xf2bcc18f, 0x41113564,
284 0x257b7834, 0x602a9c60, 0xdff8e8a3, 0x1f636c1b,
285 0x0e12b4c2, 0x02e1329e, 0xaf664fd1, 0xcad18115,
286 0x6b2395e0, 0x333e92e1, 0x3b240b62, 0xeebeb922,
287 0x85b2a20e, 0xe6ba0d99, 0xde720c8c, 0x2da2f728,
288 0xd0127845, 0x95b794fd, 0x647d0862, 0xe7ccf5f0,
289 0x5449a36f, 0x877d48fa, 0xc39dfd27, 0xf33e8d1e,
290 0x0a476341, 0x992eff74, 0x3a6f6eab, 0xf4f8fd37,
291 0xa812dc60, 0xa1ebddf8, 0x991be14c, 0xdb6e6b0d,
292 0xc67b5510, 0x6d672c37, 0x2765d43b, 0xdcd0e804,
293 0xf1290dc7, 0xcc00ffa3, 0xb5390f92, 0x690fed0b,
294
295 0x667b9ffb, 0xcedb7d9c, 0xa091cf0b, 0xd9155ea3,
296 0xbb132f88, 0x515bad24, 0x7b9479bf, 0x763bd6eb,
297 0x37392eb3, 0xcc115979, 0x8026e297, 0xf42e312d,
298 0x6842ada7, 0xc66a2b3b, 0x12754ccc, 0x782ef11c,
299 0x6a124237, 0xb79251e7, 0x06a1bbe6, 0x4bfb6350,
300 0x1a6b1018, 0x11caedfa, 0x3d25bdd8, 0xe2e1c3c9,
301 0x44421659, 0x0a121386, 0xd90cec6e, 0xd5abea2a,
302 0x64af674e, 0xda86a85f, 0xbebfe988, 0x64e4c3fe,
303 0x9dbc8057, 0xf0f7c086, 0x60787bf8, 0x6003604d,
304 0xd1fd8346, 0xf6381fb0, 0x7745ae04, 0xd736fccc,
305 0x83426b33, 0xf01eab71, 0xb0804187, 0x3c005e5f,
306 0x77a057be, 0xbde8ae24, 0x55464299, 0xbf582e61,
307 0x4e58f48f, 0xf2ddfda2, 0xf474ef38, 0x8789bdc2,
308 0x5366f9c3, 0xc8b38e74, 0xb475f255, 0x46fcd9b9,
309 0x7aeb2661, 0x8b1ddf84, 0x846a0e79, 0x915f95e2,
310 0x466e598e, 0x20b45770, 0x8cd55591, 0xc902de4c,
311 0xb90bace1, 0xbb8205d0, 0x11a86248, 0x7574a99e,
312 0xb77f19b6, 0xe0a9dc09, 0x662d09a1, 0xc4324633,
313 0xe85a1f02, 0x09f0be8c, 0x4a99a025, 0x1d6efe10,
314 0x1ab93d1d, 0x0ba5a4df, 0xa186f20f, 0x2868f169,
315 0xdcb7da83, 0x573906fe, 0xa1e2ce9b, 0x4fcd7f52,
316 0x50115e01, 0xa70683fa, 0xa002b5c4, 0x0de6d027,
317 0x9af88c27, 0x773f8641, 0xc3604c06, 0x61a806b5,
318 0xf0177a28, 0xc0f586e0, 0x006058aa, 0x30dc7d62,
319 0x11e69ed7, 0x2338ea63, 0x53c2dd94, 0xc2c21634,
320 0xbbcbee56, 0x90bcb6de, 0xebfc7da1, 0xce591d76,
321 0x6f05e409, 0x4b7c0188, 0x39720a3d, 0x7c927c24,
322 0x86e3725f, 0x724d9db9, 0x1ac15bb4, 0xd39eb8fc,
323 0xed545578, 0x08fca5b5, 0xd83d7cd3, 0x4dad0fc4,
324 0x1e50ef5e, 0xb161e6f8, 0xa28514d9, 0x6c51133c,
325 0x6fd5c7e7, 0x56e14ec4, 0x362abfce, 0xddc6c837,
326 0xd79a3234, 0x92638212, 0x670efa8e, 0x406000e0
327 }, {
328 0x3a39ce37, 0xd3faf5cf, 0xabc27737, 0x5ac52d1b,
329 0x5cb0679e, 0x4fa33742, 0xd3822740, 0x99bc9bbe,
330 0xd5118e9d, 0xbf0f7315, 0xd62d1c7e, 0xc700c47b,
331 0xb78c1b6b, 0x21a19045, 0xb26eb1be, 0x6a366eb4,
332 0x5748ab2f, 0xbc946e79, 0xc6a376d2, 0x6549c2c8,
333 0x530ff8ee, 0x468dde7d, 0xd5730a1d, 0x4cd04dc6,
334 0x2939bbdb, 0xa9ba4650, 0xac9526e8, 0xbe5ee304,
335 0xa1fad5f0, 0x6a2d519a, 0x63ef8ce2, 0x9a86ee22,
336 0xc089c2b8, 0x43242ef6, 0xa51e03aa, 0x9cf2d0a4,
337 0x83c061ba, 0x9be96a4d, 0x8fe51550, 0xba645bd6,
338 0x2826a2f9, 0xa73a3ae1, 0x4ba99586, 0xef5562e9,
339 0xc72fefd3, 0xf752f7da, 0x3f046f69, 0x77fa0a59,
340 0x80e4a915, 0x87b08601, 0x9b09e6ad, 0x3b3ee593,
341 0xe990fd5a, 0x9e34d797, 0x2cf0b7d9, 0x022b8b51,
342 0x96d5ac3a, 0x017da67d, 0xd1cf3ed6, 0x7c7d2d28,
343 0x1f9f25cf, 0xadf2b89b, 0x5ad6b472, 0x5a88f54c,
344 0xe029ac71, 0xe019a5e6, 0x47b0acfd, 0xed93fa9b,
345 0xe8d3c48d, 0x283b57cc, 0xf8d56629, 0x79132e28,
346 0x785f0191, 0xed756055, 0xf7960e44, 0xe3d35e8c,
347 0x15056dd4, 0x88f46dba, 0x03a16125, 0x0564f0bd,
348 0xc3eb9e15, 0x3c9057a2, 0x97271aec, 0xa93a072a,
349 0x1b3f6d9b, 0x1e6321f5, 0xf59c66fb, 0x26dcf319,
350 0x7533d928, 0xb155fdf5, 0x03563482, 0x8aba3cbb,
351 0x28517711, 0xc20ad9f8, 0xabcc5167, 0xccad925f,
352 0x4de81751, 0x3830dc8e, 0x379d5862, 0x9320f991,
353 0xea7a90c2, 0xfb3e7bce, 0x5121ce64, 0x774fbe32,
354 0xa8b6e37e, 0xc3293d46, 0x48de5369, 0x6413e680,
355 0xa2ae0810, 0xdd6db224, 0x69852dfd, 0x09072166,
356 0xb39a460a, 0x6445c0dd, 0x586cdecf, 0x1c20c8ae,
357 0x5bbef7dd, 0x1b588d40, 0xccd2017f, 0x6bb4e3bb,
358 0xdda26a7e, 0x3a59ff45, 0x3e350a44, 0xbcb4cdd5,
359 0x72eacea8, 0xfa6484bb, 0x8d6612ae, 0xbf3c6f47,
360
361 0xd29be463, 0x542f5d9e, 0xaec2771b, 0xf64e6370,
362 0x740e0d8d, 0xe75b1357, 0xf8721671, 0xaf537d5d,
363 0x4040cb08, 0x4eb4e2cc, 0x34d2466a, 0x0115af84,
364 0xe1b00428, 0x95983a1d, 0x06b89fb4, 0xce6ea048,
365 0x6f3f3b82, 0x3520ab82, 0x011a1d4b, 0x277227f8,
366 0x611560b1, 0xe7933fdc, 0xbb3a792b, 0x344525bd,
367 0xa08839e1, 0x51ce794b, 0x2f32c9b7, 0xa01fbac9,
368 0xe01cc87e, 0xbcc7d1f6, 0xcf0111c3, 0xa1e8aac7,
369 0x1a908749, 0xd44fbd9a, 0xd0dadecb, 0xd50ada38,
370 0x0339c32a, 0xc6913667, 0x8df9317c, 0xe0b12b4f,
371 0xf79e59b7, 0x43f5bb3a, 0xf2d519ff, 0x27d9459c,
372 0xbf97222c, 0x15e6fc2a, 0x0f91fc71, 0x9b941525,
373 0xfae59361, 0xceb69ceb, 0xc2a86459, 0x12baa8d1,
374 0xb6c1075e, 0xe3056a0c, 0x10d25065, 0xcb03a442,
375 0xe0ec6e0e, 0x1698db3b, 0x4c98a0be, 0x3278e964,
376 0x9f1f9532, 0xe0d392df, 0xd3a0342b, 0x8971f21e,
377 0x1b0a7441, 0x4ba3348c, 0xc5be7120, 0xc37632d8,
378 0xdf359f8d, 0x9b992f2e, 0xe60b6f47, 0x0fe3f11d,
379 0xe54cda54, 0x1edad891, 0xce6279cf, 0xcd3e7e6f,
380 0x1618b166, 0xfd2c1d05, 0x848fd2c5, 0xf6fb2299,
381 0xf523f357, 0xa6327623, 0x93a83531, 0x56cccd02,
382 0xacf08162, 0x5a75ebb5, 0x6e163697, 0x88d273cc,
383 0xde966292, 0x81b949d0, 0x4c50901b, 0x71c65614,
384 0xe6c6c7bd, 0x327a140a, 0x45e1d006, 0xc3f27b9a,
385 0xc9aa53fd, 0x62a80f00, 0xbb25bfe2, 0x35bdd2f6,
386 0x71126905, 0xb2040222, 0xb6cbcf7c, 0xcd769c2b,
387 0x53113ec0, 0x1640e3d3, 0x38abbd60, 0x2547adf0,
388 0xba38209c, 0xf746ce76, 0x77afa1c5, 0x20756060,
389 0x85cbfe4e, 0x8ae88dd8, 0x7aaaf9b0, 0x4cf9aa7e,
390 0x1948c25c, 0x02fb8a8c, 0x01c36ae4, 0xd6ebe1f9,
391 0x90d4f869, 0xa65cdea0, 0x3f09252d, 0xc208e69f,
392 0xb74e6132, 0xce77e25b, 0x578fdfe3, 0x3ac372e6
393 }
394 };
395
396 for (i=0;i<NUM_SUBKEYS;i++)
397 PA[i] = PA_Init[i];
398
399 for (j=0;j<NUM_S_BOXES;j++)
400 for (i=0;i<NUM_ENTRIES;i++)
401 SB[j][i] = SB_Init[j][i];
402 }
403
404 protected:
405 virtual void encipher( void *pData )
406 {
407 DWord *dwWork = (DWord *)pData;
408 Word &w1 = dwWork->word0, &w2 = dwWork->word1;
409
410 w1.word = be32toh( w1.word );
411 w2.word = be32toh( w2.word );
412
413 keyEncipher( w1, w2 );
414
415 revBytes( w1.word );
416 revBytes( w2.word );
417 }
418
419 virtual void decipher( void *pData )
420 {
421 DWord *dwWork = (DWord *)pData;
422 Word &w1 = dwWork->word0, &w2 = dwWork->word1;
423
424 revBytes( w1.word );
425 revBytes( w2.word );
426
427 w1.word ^= PA[17];
428 w2.word ^= F(w1)^PA[16]; w1.word ^= F(w2)^PA[15];
429 w2.word ^= F(w1)^PA[14]; w1.word ^= F(w2)^PA[13];
430 w2.word ^= F(w1)^PA[12]; w1.word ^= F(w2)^PA[11];
431 w2.word ^= F(w1)^PA[10]; w1.word ^= F(w2)^PA[9];
432 w2.word ^= F(w1)^PA[8]; w1.word ^= F(w2)^PA[7];
433 w2.word ^= F(w1)^PA[6]; w1.word ^= F(w2)^PA[5];
434 w2.word ^= F(w1)^PA[4]; w1.word ^= F(w2)^PA[3];
435 w2.word ^= F(w1)^PA[2]; w1.word ^= F(w2)^PA[1];
436 w2.word ^= PA[0];
437
438 Bu::swap( w1, w2 );
439
440 w1.word = htobe32( w1.word );
441 w2.word = htobe32( w2.word );
442 }
443
444 inline void keyEncipher( Word &w1, Word &w2 )
445 {
446 w1.word ^= PA[0];
447 w2.word ^= F(w1)^PA[1]; w1.word ^= F(w2)^PA[2];
448 w2.word ^= F(w1)^PA[3]; w1.word ^= F(w2)^PA[4];
449 w2.word ^= F(w1)^PA[5]; w1.word ^= F(w2)^PA[6];
450 w2.word ^= F(w1)^PA[7]; w1.word ^= F(w2)^PA[8];
451 w2.word ^= F(w1)^PA[9]; w1.word ^= F(w2)^PA[10];
452 w2.word ^= F(w1)^PA[11]; w1.word ^= F(w2)^PA[12];
453 w2.word ^= F(w1)^PA[13]; w1.word ^= F(w2)^PA[14];
454 w2.word ^= F(w1)^PA[15]; w1.word ^= F(w2)^PA[16];
455 w2.word ^= PA[17];
456
457 Bu::swap( w1, w2 );
458 }
63 }; 459 };
460
461 typedef CipherModeEcb<8, Blowfish<1> > BlowfishEcb;
462 typedef CipherModeCfb<8, Blowfish<1> > BlowfishCfb;
463 typedef CipherModeCbc<8, Blowfish<1> > BlowfishCbc;
464 typedef CipherModeOfb<8, Blowfish<1> > BlowfishOfb;
64}; 465};
65 466
66#endif 467#endif
diff --git a/src/experimental/cipher.h b/src/experimental/cipher.h
index 613bc88..9e6f87d 100644
--- a/src/experimental/cipher.h
+++ b/src/experimental/cipher.h
@@ -6,7 +6,7 @@
6namespace Bu 6namespace Bu
7{ 7{
8 template<int iBlockSize> 8 template<int iBlockSize>
9 class Cipher : Bu::Filter 9 class Cipher : public Bu::Filter
10 { 10 {
11 public: 11 public:
12 Cipher( Bu::Stream &rNext ) : 12 Cipher( Bu::Stream &rNext ) :
diff --git a/src/experimental/ciphermodecbc.cpp b/src/experimental/ciphermodecbc.cpp
new file mode 100644
index 0000000..169c1d3
--- /dev/null
+++ b/src/experimental/ciphermodecbc.cpp
@@ -0,0 +1,2 @@
1#include "ciphermodecbc.h"
2
diff --git a/src/experimental/ciphermodecbc.h b/src/experimental/ciphermodecbc.h
new file mode 100644
index 0000000..8fbf9f6
--- /dev/null
+++ b/src/experimental/ciphermodecbc.h
@@ -0,0 +1,54 @@
1#ifndef BU_MODE_CBC_H
2#define BU_MODE_CBC_H
3
4#include "bu/filter.h"
5#include "bu/string.h"
6
7namespace Bu
8{
9 template<int iBlockSize, typename CipherType>
10 class CipherModeCbc : public CipherType
11 {
12 public:
13 CipherModeCbc(class Stream &rNext ) :
14 CipherType( rNext ),
15 bStart( true )
16 {
17 memset( aVector, 0, iBlockSize );
18 }
19
20 virtual ~CipherModeCbc()
21 {
22 }
23
24 void setIv( const Bu::String &sIv )
25 {
26 memcpy( aVector, sIv.getStr(), iBlockSize );
27 }
28
29 protected:
30 void decipher( void *pBuf )
31 {
32 uint8_t aTmp[iBlockSize];
33 memcpy( aTmp, pBuf, iBlockSize );
34 CipherType::decipher( pBuf );
35 for( int j = 0; j < iBlockSize; j++ )
36 ((uint8_t *)pBuf)[j] ^= aVector[j];
37 memcpy( aVector, aTmp, iBlockSize );
38 }
39
40 void encipher( void *pBuf )
41 {
42 for( int j = 0; j < iBlockSize; j++ )
43 ((uint8_t *)pBuf)[j] ^= aVector[j];
44 CipherType::encipher( pBuf );
45 memcpy( aVector, pBuf, iBlockSize );
46 }
47
48 private:
49 bool bStart;
50 uint8_t aVector[iBlockSize];
51 };
52};
53
54#endif
diff --git a/src/experimental/ciphermodecfb.cpp b/src/experimental/ciphermodecfb.cpp
new file mode 100644
index 0000000..271d371
--- /dev/null
+++ b/src/experimental/ciphermodecfb.cpp
@@ -0,0 +1,2 @@
1#include "ciphermodecfb.h"
2
diff --git a/src/experimental/ciphermodecfb.h b/src/experimental/ciphermodecfb.h
new file mode 100644
index 0000000..dab6c2e
--- /dev/null
+++ b/src/experimental/ciphermodecfb.h
@@ -0,0 +1,53 @@
1#ifndef BU_MODE_CFB_H
2#define BU_MODE_CFB_H
3
4#include "bu/filter.h"
5#include "bu/string.h"
6
7namespace Bu
8{
9 template<int iBlockSize, typename CipherType>
10 class CipherModeCfb : public CipherType
11 {
12 public:
13 CipherModeCfb(class Stream &rNext ) :
14 CipherType( rNext ),
15 bStart( true )
16 {
17 memset( aVector, 0, iBlockSize );
18 }
19
20 virtual ~CipherModeCfb()
21 {
22 }
23
24 void setIv( const Bu::String &sIv )
25 {
26 memcpy( aVector, sIv.getStr(), iBlockSize );
27 }
28
29 protected:
30 void decipher( void *pBuf )
31 {
32 uint8_t aTmp[iBlockSize];
33 memcpy( aTmp, pBuf, iBlockSize );
34 CipherType::encipher( aVector );
35 for( int j = 0; j < iBlockSize; j++ )
36 ((uint8_t *)pBuf)[j] ^= aVector[j];
37 memcpy( aVector, aTmp, iBlockSize );
38 }
39
40 void encipher( void *pBuf )
41 {
42 CipherType::encipher( aVector );
43 for( int j = 0; j < iBlockSize; j++ )
44 aVector[j] = ((uint8_t *)pBuf)[j] ^= aVector[j];
45 }
46
47 private:
48 bool bStart;
49 uint8_t aVector[iBlockSize];
50 };
51};
52
53#endif
diff --git a/src/experimental/ciphermodeecb.cpp b/src/experimental/ciphermodeecb.cpp
new file mode 100644
index 0000000..8856304
--- /dev/null
+++ b/src/experimental/ciphermodeecb.cpp
@@ -0,0 +1 @@
#include "ciphermodeecb.h"
diff --git a/src/experimental/ciphermodeecb.h b/src/experimental/ciphermodeecb.h
new file mode 100644
index 0000000..006741a
--- /dev/null
+++ b/src/experimental/ciphermodeecb.h
@@ -0,0 +1,32 @@
1#ifndef BU_MODE_ECB_H
2#define BU_MODE_ECB_H
3
4namespace Bu
5{
6 template<int iBlockSize, typename CipherType>
7 class CipherModeEcb : public CipherType
8 {
9 public:
10 CipherModeEcb( class Stream &rNext ) :
11 CipherType( rNext )
12 {
13 }
14
15 virtual ~CipherModeEcb()
16 {
17 }
18
19 protected:
20 virtual void decipher( void *pBuf )
21 {
22 CipherType::decipher( pBuf );
23 }
24
25 virtual void encipher( void *pBuf )
26 {
27 CipherType::encipher( pBuf );
28 }
29 };
30};
31
32#endif
diff --git a/src/experimental/ciphermodeofb.cpp b/src/experimental/ciphermodeofb.cpp
new file mode 100644
index 0000000..bebbce2
--- /dev/null
+++ b/src/experimental/ciphermodeofb.cpp
@@ -0,0 +1,2 @@
1#include "ciphermodeofb.h"
2
diff --git a/src/experimental/ciphermodeofb.h b/src/experimental/ciphermodeofb.h
new file mode 100644
index 0000000..8c2aa20
--- /dev/null
+++ b/src/experimental/ciphermodeofb.h
@@ -0,0 +1,56 @@
1#ifndef BU_MODE_OFB_H
2#define BU_MODE_OFB_H
3
4#include "bu/filter.h"
5#include "bu/string.h"
6
7namespace Bu
8{
9 template<int iBlockSize, typename CipherType>
10 class CipherModeOfb : public CipherType
11 {
12 public:
13 CipherModeOfb(class Stream &rNext ) :
14 CipherType( rNext ),
15 bStart( true )
16 {
17 memset( aVector, 0, iBlockSize );
18 }
19
20 virtual ~CipherModeOfb()
21 {
22 }
23
24 void setIv( const Bu::String &sIv )
25 {
26 memcpy( aVector, sIv.getStr(), iBlockSize );
27 }
28
29 protected:
30 void decipher( void *pBuf )
31 {
32 CipherType::encipher( aVector );
33 uint8_t aTmp[iBlockSize];
34 memcpy( aTmp, aVector, iBlockSize );
35 for( int j = 0; j < iBlockSize; j++ )
36 ((uint8_t *)pBuf)[j] ^= aVector[j];
37 memcpy( aVector, aTmp, iBlockSize );
38 }
39
40 void encipher( void *pBuf )
41 {
42 CipherType::encipher( aVector );
43 uint8_t aTmp[iBlockSize];
44 memcpy( aTmp, aVector, iBlockSize );
45 for( int j = 0; j < iBlockSize; j++ )
46 ((uint8_t *)pBuf)[j] ^= aVector[j];
47 memcpy( aVector, aTmp, iBlockSize );
48 }
49
50 private:
51 bool bStart;
52 uint8_t aVector[iBlockSize];
53 };
54};
55
56#endif
diff --git a/src/tests/blowfish.cpp b/src/tests/blowfish.cpp
index c7486e1..293539d 100644
--- a/src/tests/blowfish.cpp
+++ b/src/tests/blowfish.cpp
@@ -4,6 +4,8 @@
4#include <bu/hex.h> 4#include <bu/hex.h>
5#include <bu/strfilter.h> 5#include <bu/strfilter.h>
6#include <bu/sio.h> 6#include <bu/sio.h>
7#include <bu/ciphermodecfb.h>
8#include <bu/ciphermodeecb.h>
7 9
8using namespace Bu; 10using namespace Bu;
9 11
@@ -50,13 +52,13 @@ int main( int argc, char *argv[] )
50 for( int j = 0; j < 34; j++ ) 52 for( int j = 0; j < 34; j++ )
51 { 53 {
52 MemBuf mb; 54 MemBuf mb;
53 Blowfish bf( mb ); 55 BlowfishEcb bf( mb );
54 bf.setPassword( decodeStr<Hex>( testdat[j][0] ) ); 56 bf.setPassword( decodeStr<Hex>( testdat[j][0] ) );
55 bf.write( decodeStr<Hex>( testdat[j][1] ) ); 57 bf.write( decodeStr<Hex>( testdat[j][1] ) );
56 sio << "Test " << j << ": " << (mb.getString() == decodeStr<Hex>( testdat[j][2] )) << " (" << encodeStr<Hex>( mb.getString(), true ) << " == " << testdat[j][2] << ")" << sio.nl; 58 sio << "Test " << j << ": " << (mb.getString() == decodeStr<Hex>( testdat[j][2] )) << " (" << encodeStr<Hex>( mb.getString(), true ) << " == " << testdat[j][2] << ")" << sio.nl;
57 59
58 mb.setPos( 0 ); 60 mb.setPos( 0 );
59 Blowfish bf2( mb ); 61 BlowfishEcb bf2( mb );
60 bf2.setPassword( decodeStr<Hex>( testdat[j][0] ) ); 62 bf2.setPassword( decodeStr<Hex>( testdat[j][0] ) );
61 char buf[8]; 63 char buf[8];
62 bf2.read( buf, 8 ); 64 bf2.read( buf, 8 );
@@ -64,29 +66,27 @@ int main( int argc, char *argv[] )
64 sio << " - Back: " << (Bu::String(testdat[j][1]) == encodeStr<Hex>(String(buf,8),true)) << sio.nl; 66 sio << " - Back: " << (Bu::String(testdat[j][1]) == encodeStr<Hex>(String(buf,8),true)) << sio.nl;
65 } 67 }
66 68
67 /*
68 { 69 {
69 File fIn("data.plain", File::Read ); 70 File fIn("data.plain", File::Read );
70 File fOut("data.crypt", File::WriteNew ); 71 File fOut("data.crypt", File::WriteNew );
71 72
72 Blowfish bOut( fOut ); 73 BlowfishOfb bOut( fOut );
74 bOut.setIv("01234567");
73 bOut.setPassword("abcdefghijklmnop"); 75 bOut.setPassword("abcdefghijklmnop");
74 bOut.write( fIn.readAll() ); 76 bOut.write( fIn.readAll() );
75 } 77 }
76 */
77 /*
78 { 78 {
79 File fIn("data.java", File::Read ); 79 File fIn("data.java", File::Read );
80 File fOut("data.stuff", File::WriteNew ); 80 File fOut("data.stuff", File::WriteNew );
81 81
82 Blowfish bIn( fIn ); 82 BlowfishOfb bIn( fIn );
83 bIn.setIv("01234567");
83 bIn.setPassword("abcdefghijklmnop"); 84 bIn.setPassword("abcdefghijklmnop");
84 char buf[64]; 85 char buf[64];
85 bIn.read( buf, 64 ); 86 bIn.read( buf, 64 );
86 fOut.write( buf, 64 ); 87 fOut.write( buf, 64 );
87 sio << sio.nl << "All done." << sio.nl; 88 sio << sio.nl << "All done." << sio.nl;
88 } 89 }
89 */
90 90
91 return 0; 91 return 0;
92} 92}