Created
March 27, 2012 07:10
-
-
Save rblaze/2213565 to your computer and use it in GitHub Desktop.
This file contains bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
module Main where | |
import Codec.Digest.SHA | |
import Control.Monad | |
import Data.Bits | |
import Data.ByteString as BS(ByteString, last, init, pack, unpack) | |
import Data.HashTable as H | |
import Data.Int | |
import Data.Maybe | |
import Data.Word | |
getTail :: Int -> ByteString -> [Word8] | |
getTail 0 _ = [] | |
getTail n str = BS.last str : getTail (n - 1) (BS.init str) | |
mkWord :: [Word8] -> Word64 | |
mkWord xs@(_:_:_:_:_:_:_:[]) = mergeWord xs .&. 0xFFFFFFFFFFF --0x3FFFFFFFFFFFF | |
mkWord _ = error "Wrong list" | |
mergeWord :: [Word8] -> Word64 | |
mergeWord [] = 0 | |
mergeWord (x:xs) = fromIntegral x .|. shift (mergeWord xs) 8 | |
mkByteString :: Integer -> ByteString | |
mkByteString i = pack (mksplit i) | |
where | |
mksplit :: Integer -> [Word8] | |
mksplit 0 = [] | |
mksplit n = fromIntegral r : mksplit q | |
where | |
(q, r) = quotRem n 256 | |
hashWord :: Word64 -> Int32 | |
hashWord w = if testBit w 40 then v else negate v | |
where | |
v :: Int32 | |
v = fromIntegral (w .&. 0x7FFFFFFF) | |
main::IO() | |
main = do | |
ht <- H.new (==) hashWord | |
forM_ [1..] $ \i -> do | |
let str = mkByteString i | |
let hv = mkWord (getTail 7 (hash SHA256 str)) | |
found <- liftM isJust (H.lookup ht hv) | |
when found $ do | |
iold <- liftM fromJust (H.lookup ht hv) | |
error (show (unpack $ mkByteString i) ++ " " ++ show (unpack $ mkByteString iold)) | |
H.update ht hv i |
Sign up for free
to join this conversation on GitHub.
Already have an account?
Sign in to comment
Linear, если не заказывать сразу большую таблицу, а использовать H.new
12,547,294,380 bytes allocated in the heap
17,997,812,764 bytes copied during GC
226,684,152 bytes maximum residency (16 sample(s))
3,446,416 bytes maximum slop
701 MB total memory in use (171 MB lost due to fragmentation)
Generation 0: 3300 collections, 0 parallel, 121.88s, 122.42s elapsed
Generation 1: 16 collections, 0 parallel, 1.84s, 1.88s elapsed
INIT time 0.00s ( 0.00s elapsed)
MUT time 26.65s ( 27.16s elapsed)
GC time 123.72s (124.30s elapsed)
EXIT time 0.00s ( 0.09s elapsed)
Total time 150.37s (151.46s elapsed)
%GC time 82.3% (82.1% elapsed)
Alloc rate 470,824,054 bytes per MUT second
Productivity 17.7% of total user, 17.6% of total elapsed