以下步驟描述了在Jeff Moser's popular tutorial中的關鍵擴展,我已經編寫了用於密鑰擴展的代碼。這裏是整個文件(它也計算S-Box),所以人們可以編譯和嘗試它。Haskell AES密鑰擴展有什麼問題?
{-# LANGUAGE NoMonomorphismRestriction #-}
import Control.Applicative (liftA2)
import Data.Bits (xor, shiftL, shiftR, (.|.), (.&.))
import Data.List (transpose, sortBy)
import Data.Ord (comparing)
import Data.Word (Word8)
import Numeric (showHex)
keys = f 16 $ f 8 $ f 4 $ f 2 $ f 1 key
where
f w n = xpndC . xpndB . xpndA $ xpndD w n
xpndC :: [[Word8]] -> [[Word8]]
xpndC ws = transpose [head ws, b, zipWith xor b c, last ws]
where
(b,c) = (ws !! 1, ws !! 2)
xpndB :: [[Word8]] -> [[Word8]]
xpndB ws = a : zipWith xor a b : drop 2 ws
where
(a,b) = (head ws, ws !! 1)
xpndA :: [[Word8]] -> [[Word8]]
xpndA ws = zipWith xor a d : tail ws
where
(a,d) = (head ws, last ws)
xpndD rc ws = take 3 tW ++ [w']
where
w' = zipWith xor (map sub w) [rc, 0, 0, 0]
tW = transpose ws
w = take 4 $ tail $ cycle $ last tW
--------------------------------------------------------------
sub w = get sbox (fromIntegral lo) $ fromIntegral hi
where
(hi, lo) = nibs w
get wss x y = (wss !! y) !! x
print' = print . w128 . concat . transpose
where
w128 = concatMap (f . (`showHex` ""))
f w = (length w < 2) ? (' ':'0':w, ' ':w)
grid _ [] = []
grid n xs = take n xs : grid n (drop n xs)
nibs w = (shiftR (w .&. 0xF0) 4, w .&. 0x0F)
(⊕) = xor
p ? (a,b) = if p then a else b; infix 2 ?
---------------------------------------------------
sbox :: [[Word8]]
sbox = grid 16 $ map snd $ sortBy (comparing fst) $ sbx 1 1 []
sbx :: Word8 -> Word8 -> [(Word8, Word8)] -> [(Word8, Word8)]
sbx p q ws
| length ws == 255 = (0, 0x63) : ws
| otherwise = sbx p' r $ (p', xf ⊕ 0x63) : ws
where
p' = p ⊕ shiftL p 1 ⊕ ((p .&. 0x80 /= 0) ? (0x1B, 0))
q1 = foldl (liftA2 (.) xor shiftL) q [1, 2, 4]
r = q1 ⊕ ((q1 .&. 0x80 /= 0) ? (0x09, 0))
xf = r ⊕ rotl8 r 1 ⊕ rotl8 r 2 ⊕ rotl8 r 3 ⊕ rotl8 r 4
rotl8 w n = (w `shiftL` n) .|. (w `shiftR` (8 - n))
key = [[0,0,0,0],
[0,0,0,0],
[0,0,0,0],
[0,0,0,0]] :: [[Word8]]
當我測試針對全零測試關鍵這段代碼,它公佈的預期相匹配的第四次迭代:ee 06 da 7b 87 6a 15 81 75 9e 42 b2 7e 91 ee 2b
。
但是,當我嘗試下一次迭代:keys = f 16 $ f 8 $ f 4 $ f 2 $ f 1
, 結果的最後32位是錯誤的:7f 2e 2b 88 f8 44 3e 09 8d da 7c bb 91 28 f1 f3
。
當我使用全部0xFF作爲初始密鑰時,會發生同樣的行爲 - 最後32位錯誤。在後續的迭代中,所有的位都是錯誤的。
如果我使用測試矢量00 01 02 03 04 05 06 07 08 09 0a 0b 0c 0d 0e 0f
,事情出錯得快得多 - 我開始在第二次迭代中出錯位。
這是怎麼回事?我注意到Moser先生在部分2b中寫道:4到xor
第一列的上一輪密鑰 - 但是沒有前一輪的初始密鑰,所以這讓我很困惑。這是我做錯了什麼?
僅供參考,here are the test vectors.
你能產生一個完整,編譯,測試案例?碎片在這裏不是很有幫助。 –
高興!我已經添加了一個編譯和演示問題的最小版本。 – sacheie