lookout-bcrypt 3.2.0-java

This diff represents the content of publicly available package versions that have been released to one of the supported registries. The information contained in this diff is provided for informational purposes only and reflects changes between package versions as they appear in their respective public registries.
@@ -0,0 +1,782 @@
1
+ // Copyright (c) 2006 Damien Miller <djm@mindrot.org>
2
+ //
3
+ // Permission to use, copy, modify, and distribute this software for any
4
+ // purpose with or without fee is hereby granted, provided that the above
5
+ // copyright notice and this permission notice appear in all copies.
6
+ //
7
+ // THE SOFTWARE IS PROVIDED "AS IS" AND THE AUTHOR DISCLAIMS ALL WARRANTIES
8
+ // WITH REGARD TO THIS SOFTWARE INCLUDING ALL IMPLIED WARRANTIES OF
9
+ // MERCHANTABILITY AND FITNESS. IN NO EVENT SHALL THE AUTHOR BE LIABLE FOR
10
+ // ANY SPECIAL, DIRECT, INDIRECT, OR CONSEQUENTIAL DAMAGES OR ANY DAMAGES
11
+ // WHATSOEVER RESULTING FROM LOSS OF USE, DATA OR PROFITS, WHETHER IN AN
12
+ // ACTION OF CONTRACT, NEGLIGENCE OR OTHER TORTIOUS ACTION, ARISING OUT OF
13
+ // OR IN CONNECTION WITH THE USE OR PERFORMANCE OF THIS SOFTWARE.
14
+
15
+ package bcrypt_jruby;
16
+
17
+ import java.io.UnsupportedEncodingException;
18
+
19
+ import java.security.SecureRandom;
20
+
21
+ import java.util.Arrays;
22
+
23
+ /**
24
+ * BCrypt implements OpenBSD-style Blowfish password hashing using
25
+ * the scheme described in "A Future-Adaptable Password Scheme" by
26
+ * Niels Provos and David Mazieres.
27
+ * <p>
28
+ * This password hashing system tries to thwart off-line password
29
+ * cracking using a computationally-intensive hashing algorithm,
30
+ * based on Bruce Schneier's Blowfish cipher. The work factor of
31
+ * the algorithm is parameterised, so it can be increased as
32
+ * computers get faster.
33
+ * <p>
34
+ * Usage is really simple. To hash a password for the first time,
35
+ * call the hashpw method with a random salt, like this:
36
+ * <p>
37
+ * <code>
38
+ * String pw_hash = BCrypt.hashpw(plain_password, BCrypt.gensalt()); <br />
39
+ * </code>
40
+ * <p>
41
+ * To check whether a plaintext password matches one that has been
42
+ * hashed previously, use the checkpw method:
43
+ * <p>
44
+ * <code>
45
+ * if (BCrypt.checkpw(candidate_password, stored_hash))<br />
46
+ * &nbsp;&nbsp;&nbsp;&nbsp;System.out.println("It matches");<br />
47
+ * else<br />
48
+ * &nbsp;&nbsp;&nbsp;&nbsp;System.out.println("It does not match");<br />
49
+ * </code>
50
+ * <p>
51
+ * The gensalt() method takes an optional parameter (log_rounds)
52
+ * that determines the computational complexity of the hashing:
53
+ * <p>
54
+ * <code>
55
+ * String strong_salt = BCrypt.gensalt(10)<br />
56
+ * String stronger_salt = BCrypt.gensalt(12)<br />
57
+ * </code>
58
+ * <p>
59
+ * The amount of work increases exponentially (2**log_rounds), so
60
+ * each increment is twice as much work. The default log_rounds is
61
+ * 10, and the valid range is 4 to 31.
62
+ *
63
+ * @author Damien Miller
64
+ * @version 0.3 + patch: https://github.com/Oscil8/jBCrypt/tree/djm-byte-array
65
+ */
66
+ public class BCrypt {
67
+ // BCrypt parameters
68
+ private static final int GENSALT_DEFAULT_LOG2_ROUNDS = 10;
69
+ private static final int BCRYPT_SALT_LEN = 16;
70
+
71
+ // Blowfish parameters
72
+ private static final int BLOWFISH_NUM_ROUNDS = 16;
73
+
74
+ // Initial contents of key schedule
75
+ private static final int P_orig[] = {
76
+ 0x243f6a88, 0x85a308d3, 0x13198a2e, 0x03707344,
77
+ 0xa4093822, 0x299f31d0, 0x082efa98, 0xec4e6c89,
78
+ 0x452821e6, 0x38d01377, 0xbe5466cf, 0x34e90c6c,
79
+ 0xc0ac29b7, 0xc97c50dd, 0x3f84d5b5, 0xb5470917,
80
+ 0x9216d5d9, 0x8979fb1b
81
+ };
82
+ private static final int S_orig[] = {
83
+ 0xd1310ba6, 0x98dfb5ac, 0x2ffd72db, 0xd01adfb7,
84
+ 0xb8e1afed, 0x6a267e96, 0xba7c9045, 0xf12c7f99,
85
+ 0x24a19947, 0xb3916cf7, 0x0801f2e2, 0x858efc16,
86
+ 0x636920d8, 0x71574e69, 0xa458fea3, 0xf4933d7e,
87
+ 0x0d95748f, 0x728eb658, 0x718bcd58, 0x82154aee,
88
+ 0x7b54a41d, 0xc25a59b5, 0x9c30d539, 0x2af26013,
89
+ 0xc5d1b023, 0x286085f0, 0xca417918, 0xb8db38ef,
90
+ 0x8e79dcb0, 0x603a180e, 0x6c9e0e8b, 0xb01e8a3e,
91
+ 0xd71577c1, 0xbd314b27, 0x78af2fda, 0x55605c60,
92
+ 0xe65525f3, 0xaa55ab94, 0x57489862, 0x63e81440,
93
+ 0x55ca396a, 0x2aab10b6, 0xb4cc5c34, 0x1141e8ce,
94
+ 0xa15486af, 0x7c72e993, 0xb3ee1411, 0x636fbc2a,
95
+ 0x2ba9c55d, 0x741831f6, 0xce5c3e16, 0x9b87931e,
96
+ 0xafd6ba33, 0x6c24cf5c, 0x7a325381, 0x28958677,
97
+ 0x3b8f4898, 0x6b4bb9af, 0xc4bfe81b, 0x66282193,
98
+ 0x61d809cc, 0xfb21a991, 0x487cac60, 0x5dec8032,
99
+ 0xef845d5d, 0xe98575b1, 0xdc262302, 0xeb651b88,
100
+ 0x23893e81, 0xd396acc5, 0x0f6d6ff3, 0x83f44239,
101
+ 0x2e0b4482, 0xa4842004, 0x69c8f04a, 0x9e1f9b5e,
102
+ 0x21c66842, 0xf6e96c9a, 0x670c9c61, 0xabd388f0,
103
+ 0x6a51a0d2, 0xd8542f68, 0x960fa728, 0xab5133a3,
104
+ 0x6eef0b6c, 0x137a3be4, 0xba3bf050, 0x7efb2a98,
105
+ 0xa1f1651d, 0x39af0176, 0x66ca593e, 0x82430e88,
106
+ 0x8cee8619, 0x456f9fb4, 0x7d84a5c3, 0x3b8b5ebe,
107
+ 0xe06f75d8, 0x85c12073, 0x401a449f, 0x56c16aa6,
108
+ 0x4ed3aa62, 0x363f7706, 0x1bfedf72, 0x429b023d,
109
+ 0x37d0d724, 0xd00a1248, 0xdb0fead3, 0x49f1c09b,
110
+ 0x075372c9, 0x80991b7b, 0x25d479d8, 0xf6e8def7,
111
+ 0xe3fe501a, 0xb6794c3b, 0x976ce0bd, 0x04c006ba,
112
+ 0xc1a94fb6, 0x409f60c4, 0x5e5c9ec2, 0x196a2463,
113
+ 0x68fb6faf, 0x3e6c53b5, 0x1339b2eb, 0x3b52ec6f,
114
+ 0x6dfc511f, 0x9b30952c, 0xcc814544, 0xaf5ebd09,
115
+ 0xbee3d004, 0xde334afd, 0x660f2807, 0x192e4bb3,
116
+ 0xc0cba857, 0x45c8740f, 0xd20b5f39, 0xb9d3fbdb,
117
+ 0x5579c0bd, 0x1a60320a, 0xd6a100c6, 0x402c7279,
118
+ 0x679f25fe, 0xfb1fa3cc, 0x8ea5e9f8, 0xdb3222f8,
119
+ 0x3c7516df, 0xfd616b15, 0x2f501ec8, 0xad0552ab,
120
+ 0x323db5fa, 0xfd238760, 0x53317b48, 0x3e00df82,
121
+ 0x9e5c57bb, 0xca6f8ca0, 0x1a87562e, 0xdf1769db,
122
+ 0xd542a8f6, 0x287effc3, 0xac6732c6, 0x8c4f5573,
123
+ 0x695b27b0, 0xbbca58c8, 0xe1ffa35d, 0xb8f011a0,
124
+ 0x10fa3d98, 0xfd2183b8, 0x4afcb56c, 0x2dd1d35b,
125
+ 0x9a53e479, 0xb6f84565, 0xd28e49bc, 0x4bfb9790,
126
+ 0xe1ddf2da, 0xa4cb7e33, 0x62fb1341, 0xcee4c6e8,
127
+ 0xef20cada, 0x36774c01, 0xd07e9efe, 0x2bf11fb4,
128
+ 0x95dbda4d, 0xae909198, 0xeaad8e71, 0x6b93d5a0,
129
+ 0xd08ed1d0, 0xafc725e0, 0x8e3c5b2f, 0x8e7594b7,
130
+ 0x8ff6e2fb, 0xf2122b64, 0x8888b812, 0x900df01c,
131
+ 0x4fad5ea0, 0x688fc31c, 0xd1cff191, 0xb3a8c1ad,
132
+ 0x2f2f2218, 0xbe0e1777, 0xea752dfe, 0x8b021fa1,
133
+ 0xe5a0cc0f, 0xb56f74e8, 0x18acf3d6, 0xce89e299,
134
+ 0xb4a84fe0, 0xfd13e0b7, 0x7cc43b81, 0xd2ada8d9,
135
+ 0x165fa266, 0x80957705, 0x93cc7314, 0x211a1477,
136
+ 0xe6ad2065, 0x77b5fa86, 0xc75442f5, 0xfb9d35cf,
137
+ 0xebcdaf0c, 0x7b3e89a0, 0xd6411bd3, 0xae1e7e49,
138
+ 0x00250e2d, 0x2071b35e, 0x226800bb, 0x57b8e0af,
139
+ 0x2464369b, 0xf009b91e, 0x5563911d, 0x59dfa6aa,
140
+ 0x78c14389, 0xd95a537f, 0x207d5ba2, 0x02e5b9c5,
141
+ 0x83260376, 0x6295cfa9, 0x11c81968, 0x4e734a41,
142
+ 0xb3472dca, 0x7b14a94a, 0x1b510052, 0x9a532915,
143
+ 0xd60f573f, 0xbc9bc6e4, 0x2b60a476, 0x81e67400,
144
+ 0x08ba6fb5, 0x571be91f, 0xf296ec6b, 0x2a0dd915,
145
+ 0xb6636521, 0xe7b9f9b6, 0xff34052e, 0xc5855664,
146
+ 0x53b02d5d, 0xa99f8fa1, 0x08ba4799, 0x6e85076a,
147
+ 0x4b7a70e9, 0xb5b32944, 0xdb75092e, 0xc4192623,
148
+ 0xad6ea6b0, 0x49a7df7d, 0x9cee60b8, 0x8fedb266,
149
+ 0xecaa8c71, 0x699a17ff, 0x5664526c, 0xc2b19ee1,
150
+ 0x193602a5, 0x75094c29, 0xa0591340, 0xe4183a3e,
151
+ 0x3f54989a, 0x5b429d65, 0x6b8fe4d6, 0x99f73fd6,
152
+ 0xa1d29c07, 0xefe830f5, 0x4d2d38e6, 0xf0255dc1,
153
+ 0x4cdd2086, 0x8470eb26, 0x6382e9c6, 0x021ecc5e,
154
+ 0x09686b3f, 0x3ebaefc9, 0x3c971814, 0x6b6a70a1,
155
+ 0x687f3584, 0x52a0e286, 0xb79c5305, 0xaa500737,
156
+ 0x3e07841c, 0x7fdeae5c, 0x8e7d44ec, 0x5716f2b8,
157
+ 0xb03ada37, 0xf0500c0d, 0xf01c1f04, 0x0200b3ff,
158
+ 0xae0cf51a, 0x3cb574b2, 0x25837a58, 0xdc0921bd,
159
+ 0xd19113f9, 0x7ca92ff6, 0x94324773, 0x22f54701,
160
+ 0x3ae5e581, 0x37c2dadc, 0xc8b57634, 0x9af3dda7,
161
+ 0xa9446146, 0x0fd0030e, 0xecc8c73e, 0xa4751e41,
162
+ 0xe238cd99, 0x3bea0e2f, 0x3280bba1, 0x183eb331,
163
+ 0x4e548b38, 0x4f6db908, 0x6f420d03, 0xf60a04bf,
164
+ 0x2cb81290, 0x24977c79, 0x5679b072, 0xbcaf89af,
165
+ 0xde9a771f, 0xd9930810, 0xb38bae12, 0xdccf3f2e,
166
+ 0x5512721f, 0x2e6b7124, 0x501adde6, 0x9f84cd87,
167
+ 0x7a584718, 0x7408da17, 0xbc9f9abc, 0xe94b7d8c,
168
+ 0xec7aec3a, 0xdb851dfa, 0x63094366, 0xc464c3d2,
169
+ 0xef1c1847, 0x3215d908, 0xdd433b37, 0x24c2ba16,
170
+ 0x12a14d43, 0x2a65c451, 0x50940002, 0x133ae4dd,
171
+ 0x71dff89e, 0x10314e55, 0x81ac77d6, 0x5f11199b,
172
+ 0x043556f1, 0xd7a3c76b, 0x3c11183b, 0x5924a509,
173
+ 0xf28fe6ed, 0x97f1fbfa, 0x9ebabf2c, 0x1e153c6e,
174
+ 0x86e34570, 0xeae96fb1, 0x860e5e0a, 0x5a3e2ab3,
175
+ 0x771fe71c, 0x4e3d06fa, 0x2965dcb9, 0x99e71d0f,
176
+ 0x803e89d6, 0x5266c825, 0x2e4cc978, 0x9c10b36a,
177
+ 0xc6150eba, 0x94e2ea78, 0xa5fc3c53, 0x1e0a2df4,
178
+ 0xf2f74ea7, 0x361d2b3d, 0x1939260f, 0x19c27960,
179
+ 0x5223a708, 0xf71312b6, 0xebadfe6e, 0xeac31f66,
180
+ 0xe3bc4595, 0xa67bc883, 0xb17f37d1, 0x018cff28,
181
+ 0xc332ddef, 0xbe6c5aa5, 0x65582185, 0x68ab9802,
182
+ 0xeecea50f, 0xdb2f953b, 0x2aef7dad, 0x5b6e2f84,
183
+ 0x1521b628, 0x29076170, 0xecdd4775, 0x619f1510,
184
+ 0x13cca830, 0xeb61bd96, 0x0334fe1e, 0xaa0363cf,
185
+ 0xb5735c90, 0x4c70a239, 0xd59e9e0b, 0xcbaade14,
186
+ 0xeecc86bc, 0x60622ca7, 0x9cab5cab, 0xb2f3846e,
187
+ 0x648b1eaf, 0x19bdf0ca, 0xa02369b9, 0x655abb50,
188
+ 0x40685a32, 0x3c2ab4b3, 0x319ee9d5, 0xc021b8f7,
189
+ 0x9b540b19, 0x875fa099, 0x95f7997e, 0x623d7da8,
190
+ 0xf837889a, 0x97e32d77, 0x11ed935f, 0x16681281,
191
+ 0x0e358829, 0xc7e61fd6, 0x96dedfa1, 0x7858ba99,
192
+ 0x57f584a5, 0x1b227263, 0x9b83c3ff, 0x1ac24696,
193
+ 0xcdb30aeb, 0x532e3054, 0x8fd948e4, 0x6dbc3128,
194
+ 0x58ebf2ef, 0x34c6ffea, 0xfe28ed61, 0xee7c3c73,
195
+ 0x5d4a14d9, 0xe864b7e3, 0x42105d14, 0x203e13e0,
196
+ 0x45eee2b6, 0xa3aaabea, 0xdb6c4f15, 0xfacb4fd0,
197
+ 0xc742f442, 0xef6abbb5, 0x654f3b1d, 0x41cd2105,
198
+ 0xd81e799e, 0x86854dc7, 0xe44b476a, 0x3d816250,
199
+ 0xcf62a1f2, 0x5b8d2646, 0xfc8883a0, 0xc1c7b6a3,
200
+ 0x7f1524c3, 0x69cb7492, 0x47848a0b, 0x5692b285,
201
+ 0x095bbf00, 0xad19489d, 0x1462b174, 0x23820e00,
202
+ 0x58428d2a, 0x0c55f5ea, 0x1dadf43e, 0x233f7061,
203
+ 0x3372f092, 0x8d937e41, 0xd65fecf1, 0x6c223bdb,
204
+ 0x7cde3759, 0xcbee7460, 0x4085f2a7, 0xce77326e,
205
+ 0xa6078084, 0x19f8509e, 0xe8efd855, 0x61d99735,
206
+ 0xa969a7aa, 0xc50c06c2, 0x5a04abfc, 0x800bcadc,
207
+ 0x9e447a2e, 0xc3453484, 0xfdd56705, 0x0e1e9ec9,
208
+ 0xdb73dbd3, 0x105588cd, 0x675fda79, 0xe3674340,
209
+ 0xc5c43465, 0x713e38d8, 0x3d28f89e, 0xf16dff20,
210
+ 0x153e21e7, 0x8fb03d4a, 0xe6e39f2b, 0xdb83adf7,
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
+ 0x667b9ffb, 0xcedb7d9c, 0xa091cf0b, 0xd9155ea3,
244
+ 0xbb132f88, 0x515bad24, 0x7b9479bf, 0x763bd6eb,
245
+ 0x37392eb3, 0xcc115979, 0x8026e297, 0xf42e312d,
246
+ 0x6842ada7, 0xc66a2b3b, 0x12754ccc, 0x782ef11c,
247
+ 0x6a124237, 0xb79251e7, 0x06a1bbe6, 0x4bfb6350,
248
+ 0x1a6b1018, 0x11caedfa, 0x3d25bdd8, 0xe2e1c3c9,
249
+ 0x44421659, 0x0a121386, 0xd90cec6e, 0xd5abea2a,
250
+ 0x64af674e, 0xda86a85f, 0xbebfe988, 0x64e4c3fe,
251
+ 0x9dbc8057, 0xf0f7c086, 0x60787bf8, 0x6003604d,
252
+ 0xd1fd8346, 0xf6381fb0, 0x7745ae04, 0xd736fccc,
253
+ 0x83426b33, 0xf01eab71, 0xb0804187, 0x3c005e5f,
254
+ 0x77a057be, 0xbde8ae24, 0x55464299, 0xbf582e61,
255
+ 0x4e58f48f, 0xf2ddfda2, 0xf474ef38, 0x8789bdc2,
256
+ 0x5366f9c3, 0xc8b38e74, 0xb475f255, 0x46fcd9b9,
257
+ 0x7aeb2661, 0x8b1ddf84, 0x846a0e79, 0x915f95e2,
258
+ 0x466e598e, 0x20b45770, 0x8cd55591, 0xc902de4c,
259
+ 0xb90bace1, 0xbb8205d0, 0x11a86248, 0x7574a99e,
260
+ 0xb77f19b6, 0xe0a9dc09, 0x662d09a1, 0xc4324633,
261
+ 0xe85a1f02, 0x09f0be8c, 0x4a99a025, 0x1d6efe10,
262
+ 0x1ab93d1d, 0x0ba5a4df, 0xa186f20f, 0x2868f169,
263
+ 0xdcb7da83, 0x573906fe, 0xa1e2ce9b, 0x4fcd7f52,
264
+ 0x50115e01, 0xa70683fa, 0xa002b5c4, 0x0de6d027,
265
+ 0x9af88c27, 0x773f8641, 0xc3604c06, 0x61a806b5,
266
+ 0xf0177a28, 0xc0f586e0, 0x006058aa, 0x30dc7d62,
267
+ 0x11e69ed7, 0x2338ea63, 0x53c2dd94, 0xc2c21634,
268
+ 0xbbcbee56, 0x90bcb6de, 0xebfc7da1, 0xce591d76,
269
+ 0x6f05e409, 0x4b7c0188, 0x39720a3d, 0x7c927c24,
270
+ 0x86e3725f, 0x724d9db9, 0x1ac15bb4, 0xd39eb8fc,
271
+ 0xed545578, 0x08fca5b5, 0xd83d7cd3, 0x4dad0fc4,
272
+ 0x1e50ef5e, 0xb161e6f8, 0xa28514d9, 0x6c51133c,
273
+ 0x6fd5c7e7, 0x56e14ec4, 0x362abfce, 0xddc6c837,
274
+ 0xd79a3234, 0x92638212, 0x670efa8e, 0x406000e0,
275
+ 0x3a39ce37, 0xd3faf5cf, 0xabc27737, 0x5ac52d1b,
276
+ 0x5cb0679e, 0x4fa33742, 0xd3822740, 0x99bc9bbe,
277
+ 0xd5118e9d, 0xbf0f7315, 0xd62d1c7e, 0xc700c47b,
278
+ 0xb78c1b6b, 0x21a19045, 0xb26eb1be, 0x6a366eb4,
279
+ 0x5748ab2f, 0xbc946e79, 0xc6a376d2, 0x6549c2c8,
280
+ 0x530ff8ee, 0x468dde7d, 0xd5730a1d, 0x4cd04dc6,
281
+ 0x2939bbdb, 0xa9ba4650, 0xac9526e8, 0xbe5ee304,
282
+ 0xa1fad5f0, 0x6a2d519a, 0x63ef8ce2, 0x9a86ee22,
283
+ 0xc089c2b8, 0x43242ef6, 0xa51e03aa, 0x9cf2d0a4,
284
+ 0x83c061ba, 0x9be96a4d, 0x8fe51550, 0xba645bd6,
285
+ 0x2826a2f9, 0xa73a3ae1, 0x4ba99586, 0xef5562e9,
286
+ 0xc72fefd3, 0xf752f7da, 0x3f046f69, 0x77fa0a59,
287
+ 0x80e4a915, 0x87b08601, 0x9b09e6ad, 0x3b3ee593,
288
+ 0xe990fd5a, 0x9e34d797, 0x2cf0b7d9, 0x022b8b51,
289
+ 0x96d5ac3a, 0x017da67d, 0xd1cf3ed6, 0x7c7d2d28,
290
+ 0x1f9f25cf, 0xadf2b89b, 0x5ad6b472, 0x5a88f54c,
291
+ 0xe029ac71, 0xe019a5e6, 0x47b0acfd, 0xed93fa9b,
292
+ 0xe8d3c48d, 0x283b57cc, 0xf8d56629, 0x79132e28,
293
+ 0x785f0191, 0xed756055, 0xf7960e44, 0xe3d35e8c,
294
+ 0x15056dd4, 0x88f46dba, 0x03a16125, 0x0564f0bd,
295
+ 0xc3eb9e15, 0x3c9057a2, 0x97271aec, 0xa93a072a,
296
+ 0x1b3f6d9b, 0x1e6321f5, 0xf59c66fb, 0x26dcf319,
297
+ 0x7533d928, 0xb155fdf5, 0x03563482, 0x8aba3cbb,
298
+ 0x28517711, 0xc20ad9f8, 0xabcc5167, 0xccad925f,
299
+ 0x4de81751, 0x3830dc8e, 0x379d5862, 0x9320f991,
300
+ 0xea7a90c2, 0xfb3e7bce, 0x5121ce64, 0x774fbe32,
301
+ 0xa8b6e37e, 0xc3293d46, 0x48de5369, 0x6413e680,
302
+ 0xa2ae0810, 0xdd6db224, 0x69852dfd, 0x09072166,
303
+ 0xb39a460a, 0x6445c0dd, 0x586cdecf, 0x1c20c8ae,
304
+ 0x5bbef7dd, 0x1b588d40, 0xccd2017f, 0x6bb4e3bb,
305
+ 0xdda26a7e, 0x3a59ff45, 0x3e350a44, 0xbcb4cdd5,
306
+ 0x72eacea8, 0xfa6484bb, 0x8d6612ae, 0xbf3c6f47,
307
+ 0xd29be463, 0x542f5d9e, 0xaec2771b, 0xf64e6370,
308
+ 0x740e0d8d, 0xe75b1357, 0xf8721671, 0xaf537d5d,
309
+ 0x4040cb08, 0x4eb4e2cc, 0x34d2466a, 0x0115af84,
310
+ 0xe1b00428, 0x95983a1d, 0x06b89fb4, 0xce6ea048,
311
+ 0x6f3f3b82, 0x3520ab82, 0x011a1d4b, 0x277227f8,
312
+ 0x611560b1, 0xe7933fdc, 0xbb3a792b, 0x344525bd,
313
+ 0xa08839e1, 0x51ce794b, 0x2f32c9b7, 0xa01fbac9,
314
+ 0xe01cc87e, 0xbcc7d1f6, 0xcf0111c3, 0xa1e8aac7,
315
+ 0x1a908749, 0xd44fbd9a, 0xd0dadecb, 0xd50ada38,
316
+ 0x0339c32a, 0xc6913667, 0x8df9317c, 0xe0b12b4f,
317
+ 0xf79e59b7, 0x43f5bb3a, 0xf2d519ff, 0x27d9459c,
318
+ 0xbf97222c, 0x15e6fc2a, 0x0f91fc71, 0x9b941525,
319
+ 0xfae59361, 0xceb69ceb, 0xc2a86459, 0x12baa8d1,
320
+ 0xb6c1075e, 0xe3056a0c, 0x10d25065, 0xcb03a442,
321
+ 0xe0ec6e0e, 0x1698db3b, 0x4c98a0be, 0x3278e964,
322
+ 0x9f1f9532, 0xe0d392df, 0xd3a0342b, 0x8971f21e,
323
+ 0x1b0a7441, 0x4ba3348c, 0xc5be7120, 0xc37632d8,
324
+ 0xdf359f8d, 0x9b992f2e, 0xe60b6f47, 0x0fe3f11d,
325
+ 0xe54cda54, 0x1edad891, 0xce6279cf, 0xcd3e7e6f,
326
+ 0x1618b166, 0xfd2c1d05, 0x848fd2c5, 0xf6fb2299,
327
+ 0xf523f357, 0xa6327623, 0x93a83531, 0x56cccd02,
328
+ 0xacf08162, 0x5a75ebb5, 0x6e163697, 0x88d273cc,
329
+ 0xde966292, 0x81b949d0, 0x4c50901b, 0x71c65614,
330
+ 0xe6c6c7bd, 0x327a140a, 0x45e1d006, 0xc3f27b9a,
331
+ 0xc9aa53fd, 0x62a80f00, 0xbb25bfe2, 0x35bdd2f6,
332
+ 0x71126905, 0xb2040222, 0xb6cbcf7c, 0xcd769c2b,
333
+ 0x53113ec0, 0x1640e3d3, 0x38abbd60, 0x2547adf0,
334
+ 0xba38209c, 0xf746ce76, 0x77afa1c5, 0x20756060,
335
+ 0x85cbfe4e, 0x8ae88dd8, 0x7aaaf9b0, 0x4cf9aa7e,
336
+ 0x1948c25c, 0x02fb8a8c, 0x01c36ae4, 0xd6ebe1f9,
337
+ 0x90d4f869, 0xa65cdea0, 0x3f09252d, 0xc208e69f,
338
+ 0xb74e6132, 0xce77e25b, 0x578fdfe3, 0x3ac372e6
339
+ };
340
+
341
+ // bcrypt IV: "OrpheanBeholderScryDoubt"
342
+ static private final int bf_crypt_ciphertext[] = {
343
+ 0x4f727068, 0x65616e42, 0x65686f6c,
344
+ 0x64657253, 0x63727944, 0x6f756274
345
+ };
346
+
347
+ // Table for Base64 encoding
348
+ static private final char base64_code[] = {
349
+ '.', '/', 'A', 'B', 'C', 'D', 'E', 'F', 'G', 'H', 'I', 'J',
350
+ 'K', 'L', 'M', 'N', 'O', 'P', 'Q', 'R', 'S', 'T', 'U', 'V',
351
+ 'W', 'X', 'Y', 'Z', 'a', 'b', 'c', 'd', 'e', 'f', 'g', 'h',
352
+ 'i', 'j', 'k', 'l', 'm', 'n', 'o', 'p', 'q', 'r', 's', 't',
353
+ 'u', 'v', 'w', 'x', 'y', 'z', '0', '1', '2', '3', '4', '5',
354
+ '6', '7', '8', '9'
355
+ };
356
+
357
+ // Table for Base64 decoding
358
+ static private final byte index_64[] = {
359
+ -1, -1, -1, -1, -1, -1, -1, -1, -1, -1,
360
+ -1, -1, -1, -1, -1, -1, -1, -1, -1, -1,
361
+ -1, -1, -1, -1, -1, -1, -1, -1, -1, -1,
362
+ -1, -1, -1, -1, -1, -1, -1, -1, -1, -1,
363
+ -1, -1, -1, -1, -1, -1, 0, 1, 54, 55,
364
+ 56, 57, 58, 59, 60, 61, 62, 63, -1, -1,
365
+ -1, -1, -1, -1, -1, 2, 3, 4, 5, 6,
366
+ 7, 8, 9, 10, 11, 12, 13, 14, 15, 16,
367
+ 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27,
368
+ -1, -1, -1, -1, -1, -1, 28, 29, 30,
369
+ 31, 32, 33, 34, 35, 36, 37, 38, 39, 40,
370
+ 41, 42, 43, 44, 45, 46, 47, 48, 49, 50,
371
+ 51, 52, 53, -1, -1, -1, -1, -1
372
+ };
373
+
374
+ // Expanded Blowfish key
375
+ private int P[];
376
+ private int S[];
377
+
378
+ /**
379
+ * Encode a byte array using bcrypt's slightly-modified base64
380
+ * encoding scheme. Note that this is *not* compatible with
381
+ * the standard MIME-base64 encoding.
382
+ *
383
+ * @param d the byte array to encode
384
+ * @param len the number of bytes to encode
385
+ * @return base64-encoded string
386
+ * @exception IllegalArgumentException if the length is invalid
387
+ */
388
+ private static String encode_base64(byte d[], int len)
389
+ throws IllegalArgumentException {
390
+ int off = 0;
391
+ StringBuilder rs = new StringBuilder();
392
+ int c1, c2;
393
+
394
+ if (len <= 0 || len > d.length)
395
+ throw new IllegalArgumentException ("Invalid len");
396
+
397
+ while (off < len) {
398
+ c1 = d[off++] & 0xff;
399
+ rs.append(base64_code[(c1 >> 2) & 0x3f]);
400
+ c1 = (c1 & 0x03) << 4;
401
+ if (off >= len) {
402
+ rs.append(base64_code[c1 & 0x3f]);
403
+ break;
404
+ }
405
+ c2 = d[off++] & 0xff;
406
+ c1 |= (c2 >> 4) & 0x0f;
407
+ rs.append(base64_code[c1 & 0x3f]);
408
+ c1 = (c2 & 0x0f) << 2;
409
+ if (off >= len) {
410
+ rs.append(base64_code[c1 & 0x3f]);
411
+ break;
412
+ }
413
+ c2 = d[off++] & 0xff;
414
+ c1 |= (c2 >> 6) & 0x03;
415
+ rs.append(base64_code[c1 & 0x3f]);
416
+ rs.append(base64_code[c2 & 0x3f]);
417
+ }
418
+ return rs.toString();
419
+ }
420
+
421
+ /**
422
+ * Look up the 3 bits base64-encoded by the specified character,
423
+ * range-checking againt conversion table
424
+ * @param x the base64-encoded value
425
+ * @return the decoded value of x
426
+ */
427
+ private static byte char64(char x) {
428
+ if ((int)x < 0 || (int)x > index_64.length)
429
+ return -1;
430
+ return index_64[(int)x];
431
+ }
432
+
433
+ /**
434
+ * Decode a string encoded using bcrypt's base64 scheme to a
435
+ * byte array. Note that this is *not* compatible with
436
+ * the standard MIME-base64 encoding.
437
+ * @param s the string to decode
438
+ * @param maxolen the maximum number of bytes to decode
439
+ * @return an array containing the decoded bytes
440
+ * @throws IllegalArgumentException if maxolen is invalid
441
+ */
442
+ private static byte[] decode_base64(String s, int maxolen)
443
+ throws IllegalArgumentException {
444
+ StringBuilder rs = new StringBuilder();
445
+ int off = 0, slen = s.length(), olen = 0;
446
+ byte ret[];
447
+ byte c1, c2, c3, c4, o;
448
+
449
+ if (maxolen <= 0)
450
+ throw new IllegalArgumentException ("Invalid maxolen");
451
+
452
+ while (off < slen - 1 && olen < maxolen) {
453
+ c1 = char64(s.charAt(off++));
454
+ c2 = char64(s.charAt(off++));
455
+ if (c1 == -1 || c2 == -1)
456
+ break;
457
+ o = (byte)(c1 << 2);
458
+ o |= (c2 & 0x30) >> 4;
459
+ rs.append((char)o);
460
+ if (++olen >= maxolen || off >= slen)
461
+ break;
462
+ c3 = char64(s.charAt(off++));
463
+ if (c3 == -1)
464
+ break;
465
+ o = (byte)((c2 & 0x0f) << 4);
466
+ o |= (c3 & 0x3c) >> 2;
467
+ rs.append((char)o);
468
+ if (++olen >= maxolen || off >= slen)
469
+ break;
470
+ c4 = char64(s.charAt(off++));
471
+ o = (byte)((c3 & 0x03) << 6);
472
+ o |= c4;
473
+ rs.append((char)o);
474
+ ++olen;
475
+ }
476
+
477
+ ret = new byte[olen];
478
+ for (off = 0; off < olen; off++)
479
+ ret[off] = (byte)rs.charAt(off);
480
+ return ret;
481
+ }
482
+
483
+ /**
484
+ * Blowfish encipher a single 64-bit block encoded as
485
+ * two 32-bit halves
486
+ * @param lr an array containing the two 32-bit half blocks
487
+ * @param off the position in the array of the blocks
488
+ */
489
+ private final void encipher(int lr[], int off) {
490
+ int i, n, l = lr[off], r = lr[off + 1];
491
+
492
+ l ^= P[0];
493
+ for (i = 0; i <= BLOWFISH_NUM_ROUNDS - 2;) {
494
+ // Feistel substitution on left word
495
+ n = S[(l >> 24) & 0xff];
496
+ n += S[0x100 | ((l >> 16) & 0xff)];
497
+ n ^= S[0x200 | ((l >> 8) & 0xff)];
498
+ n += S[0x300 | (l & 0xff)];
499
+ r ^= n ^ P[++i];
500
+
501
+ // Feistel substitution on right word
502
+ n = S[(r >> 24) & 0xff];
503
+ n += S[0x100 | ((r >> 16) & 0xff)];
504
+ n ^= S[0x200 | ((r >> 8) & 0xff)];
505
+ n += S[0x300 | (r & 0xff)];
506
+ l ^= n ^ P[++i];
507
+ }
508
+ lr[off] = r ^ P[BLOWFISH_NUM_ROUNDS + 1];
509
+ lr[off + 1] = l;
510
+ }
511
+
512
+ /**
513
+ * Cycically extract a word of key material
514
+ * @param data the string to extract the data from
515
+ * @param offp a "pointer" (as a one-entry array) to the
516
+ * current offset into data
517
+ * @return the next word of material from data
518
+ */
519
+ private static int streamtoword(byte data[], int offp[]) {
520
+ int i;
521
+ int word = 0;
522
+ int off = offp[0];
523
+
524
+ for (i = 0; i < 4; i++) {
525
+ word = (word << 8) | (data[off] & 0xff);
526
+ off = (off + 1) % data.length;
527
+ }
528
+
529
+ offp[0] = off;
530
+ return word;
531
+ }
532
+
533
+ /**
534
+ * Initialise the Blowfish key schedule
535
+ */
536
+ private void init_key() {
537
+ P = (int[])P_orig.clone();
538
+ S = (int[])S_orig.clone();
539
+ }
540
+
541
+ /**
542
+ * Key the Blowfish cipher
543
+ * @param key an array containing the key
544
+ */
545
+ private void key(byte key[]) {
546
+ int i;
547
+ int koffp[] = { 0 };
548
+ int lr[] = { 0, 0 };
549
+ int plen = P.length, slen = S.length;
550
+
551
+ for (i = 0; i < plen; i++)
552
+ P[i] = P[i] ^ streamtoword(key, koffp);
553
+
554
+ for (i = 0; i < plen; i += 2) {
555
+ encipher(lr, 0);
556
+ P[i] = lr[0];
557
+ P[i + 1] = lr[1];
558
+ }
559
+
560
+ for (i = 0; i < slen; i += 2) {
561
+ encipher(lr, 0);
562
+ S[i] = lr[0];
563
+ S[i + 1] = lr[1];
564
+ }
565
+ }
566
+
567
+ /**
568
+ * Perform the "enhanced key schedule" step described by
569
+ * Provos and Mazieres in "A Future-Adaptable Password Scheme"
570
+ * http://www.openbsd.org/papers/bcrypt-paper.ps
571
+ * @param data salt information
572
+ * @param key password information
573
+ */
574
+ private void ekskey(byte data[], byte key[]) {
575
+ int i;
576
+ int koffp[] = { 0 }, doffp[] = { 0 };
577
+ int lr[] = { 0, 0 };
578
+ int plen = P.length, slen = S.length;
579
+
580
+ for (i = 0; i < plen; i++)
581
+ P[i] = P[i] ^ streamtoword(key, koffp);
582
+
583
+ for (i = 0; i < plen; i += 2) {
584
+ lr[0] ^= streamtoword(data, doffp);
585
+ lr[1] ^= streamtoword(data, doffp);
586
+ encipher(lr, 0);
587
+ P[i] = lr[0];
588
+ P[i + 1] = lr[1];
589
+ }
590
+
591
+ for (i = 0; i < slen; i += 2) {
592
+ lr[0] ^= streamtoword(data, doffp);
593
+ lr[1] ^= streamtoword(data, doffp);
594
+ encipher(lr, 0);
595
+ S[i] = lr[0];
596
+ S[i + 1] = lr[1];
597
+ }
598
+ }
599
+
600
+ /**
601
+ * Perform the central password hashing step in the
602
+ * bcrypt scheme
603
+ * @param password the password to hash
604
+ * @param salt the binary salt to hash with the password
605
+ * @param log_rounds the binary logarithm of the number
606
+ * of rounds of hashing to apply
607
+ * @return an array containing the binary hashed password
608
+ */
609
+ private byte[] crypt_raw(byte password[], byte salt[], int log_rounds) {
610
+ int rounds, i, j;
611
+ int cdata[] = (int[])bf_crypt_ciphertext.clone();
612
+ int clen = cdata.length;
613
+ byte ret[];
614
+
615
+ if (log_rounds < 4 || log_rounds > 31)
616
+ throw new IllegalArgumentException ("Bad number of rounds");
617
+ rounds = 1 << log_rounds;
618
+ if (salt.length != BCRYPT_SALT_LEN)
619
+ throw new IllegalArgumentException ("Bad salt length");
620
+
621
+ init_key();
622
+ ekskey(salt, password);
623
+ for (i = 0; i < rounds; i++) {
624
+ key(password);
625
+ key(salt);
626
+ }
627
+
628
+ for (i = 0; i < 64; i++) {
629
+ for (j = 0; j < (clen >> 1); j++)
630
+ encipher(cdata, j << 1);
631
+ }
632
+
633
+ ret = new byte[clen * 4];
634
+ for (i = 0, j = 0; i < clen; i++) {
635
+ ret[j++] = (byte)((cdata[i] >> 24) & 0xff);
636
+ ret[j++] = (byte)((cdata[i] >> 16) & 0xff);
637
+ ret[j++] = (byte)((cdata[i] >> 8) & 0xff);
638
+ ret[j++] = (byte)(cdata[i] & 0xff);
639
+ }
640
+ return ret;
641
+ }
642
+
643
+ /**
644
+ * Hash a password using the OpenBSD bcrypt scheme
645
+ * @param password the password to hash
646
+ * @param salt the salt to hash with (perhaps generated
647
+ * using BCrypt.gensalt)
648
+ * @return the hashed password
649
+ */
650
+ public static String hashpw(String password, String salt) {
651
+ byte passwordb[];
652
+
653
+ try {
654
+ passwordb = (password + "\000").getBytes("UTF-8");
655
+ } catch (UnsupportedEncodingException uee) {
656
+ throw new AssertionError("UTF-8 is not supported");
657
+ }
658
+
659
+ return hashpw(passwordb, salt);
660
+ }
661
+
662
+ /**
663
+ * Hash a password using the OpenBSD bcrypt scheme
664
+ * @param passwordb the password to hash, as a 0-terminated byte array
665
+ * @param salt the salt to hash with (perhaps generated
666
+ * using BCrypt.gensalt)
667
+ * @return the hashed password
668
+ */
669
+ public static String hashpw(byte passwordb[], String salt) {
670
+ BCrypt B;
671
+ String real_salt;
672
+ byte saltb[], hashed[];
673
+ char minor = (char)0;
674
+ int rounds, off = 0;
675
+ StringBuilder rs = new StringBuilder();
676
+
677
+ if (salt.charAt(0) != '$' || salt.charAt(1) != '2')
678
+ throw new IllegalArgumentException ("Invalid salt version");
679
+ if (salt.charAt(2) == '$')
680
+ off = 3;
681
+ else {
682
+ minor = salt.charAt(2);
683
+ if (minor != 'a' || salt.charAt(3) != '$')
684
+ throw new IllegalArgumentException ("Invalid salt revision");
685
+ off = 4;
686
+ }
687
+
688
+ // Extract number of rounds
689
+ if (salt.charAt(off + 2) > '$')
690
+ throw new IllegalArgumentException ("Missing salt rounds");
691
+ rounds = Integer.parseInt(salt.substring(off, off + 2));
692
+
693
+ real_salt = salt.substring(off + 3, off + 25);
694
+ saltb = decode_base64(real_salt, BCRYPT_SALT_LEN);
695
+
696
+ // Remove null terminator for $2$ prefix
697
+ if (minor < 'a')
698
+ passwordb = Arrays.copyOf(passwordb, passwordb.length - 1);
699
+
700
+ B = new BCrypt();
701
+ hashed = B.crypt_raw(passwordb, saltb, rounds);
702
+
703
+ rs.append("$2");
704
+ if (minor >= 'a')
705
+ rs.append(minor);
706
+ rs.append("$");
707
+ if (rounds < 10)
708
+ rs.append("0");
709
+ rs.append(Integer.toString(rounds));
710
+ rs.append("$");
711
+ rs.append(encode_base64(saltb, saltb.length));
712
+ rs.append(encode_base64(hashed,
713
+ bf_crypt_ciphertext.length * 4 - 1));
714
+ return rs.toString();
715
+ }
716
+
717
+ /**
718
+ * Generate a salt for use with the BCrypt.hashpw() method
719
+ * @param log_rounds the log2 of the number of rounds of
720
+ * hashing to apply - the work factor therefore increases as
721
+ * 2**log_rounds.
722
+ * @param random an instance of SecureRandom to use
723
+ * @return an encoded salt value
724
+ */
725
+ public static String gensalt(int log_rounds, SecureRandom random) {
726
+ StringBuilder rs = new StringBuilder();
727
+ byte rnd[] = new byte[BCRYPT_SALT_LEN];
728
+
729
+ random.nextBytes(rnd);
730
+
731
+ rs.append("$2a$");
732
+ if (log_rounds < 10)
733
+ rs.append("0");
734
+ rs.append(Integer.toString(log_rounds));
735
+ rs.append("$");
736
+ rs.append(encode_base64(rnd, rnd.length));
737
+ return rs.toString();
738
+ }
739
+
740
+ /**
741
+ * Generate a salt for use with the BCrypt.hashpw() method
742
+ * @param log_rounds the log2 of the number of rounds of
743
+ * hashing to apply - the work factor therefore increases as
744
+ * 2**log_rounds.
745
+ * @return an encoded salt value
746
+ */
747
+ public static String gensalt(int log_rounds) {
748
+ return gensalt(log_rounds, new SecureRandom());
749
+ }
750
+
751
+ /**
752
+ * Generate a salt for use with the BCrypt.hashpw() method,
753
+ * selecting a reasonable default for the number of hashing
754
+ * rounds to apply
755
+ * @return an encoded salt value
756
+ */
757
+ public static String gensalt() {
758
+ return gensalt(GENSALT_DEFAULT_LOG2_ROUNDS);
759
+ }
760
+
761
+ /**
762
+ * Check that a plaintext password matches a previously hashed
763
+ * one
764
+ * @param plaintext the plaintext password to verify
765
+ * @param hashed the previously-hashed password
766
+ * @return true if the passwords match, false otherwise
767
+ */
768
+ public static boolean checkpw(String plaintext, String hashed) {
769
+ return (hashed.compareTo(hashpw(plaintext, hashed)) == 0);
770
+ }
771
+
772
+ /**
773
+ * Check that a plaintext byte[] password matches a previously hashed
774
+ * one
775
+ * @param plaintext the plaintext password to verify
776
+ * @param hashed the previously-hashed password
777
+ * @return true if the passwords match, false otherwise
778
+ */
779
+ public static boolean checkpw(byte[] plaintext, String hashed) {
780
+ return (hashed.compareTo(hashpw(plaintext, hashed)) == 0);
781
+ }
782
+ }