module Raaz.Hash.Sha1
{-# DEPRECATED "SHA1 is broken. This module is here only for transition." #-}
(
SHA1
, sha1, sha1File, sha1Source
, hmacSha1, hmacSha1File, hmacSha1Source
) where
import qualified Data.ByteString as B
import qualified Data.ByteString.Lazy as L
import Raaz.Core
import Raaz.Hash.Internal ( hashSource, hash, hashFile )
import Raaz.Hash.Internal.HMAC ( hmacSource, hmac, hmacFile, HMAC )
import Raaz.Hash.Sha1.Internal ( SHA1 )
import Raaz.Hash.Sha1.Recommendation()
{-# DEPRECATED sha1, sha1File, sha1Source
"SHA1 is broken. This functions are here only for transition." #-}
sha1 :: PureByteSource src => src -> SHA1
sha1 :: src -> SHA1
sha1 = src -> SHA1
forall h src.
(Hash h, Recommendation h, PureByteSource src) =>
src -> h
hash
{-# SPECIALIZE sha1 :: B.ByteString -> SHA1 #-}
{-# SPECIALIZE sha1 :: L.ByteString -> SHA1 #-}
sha1File :: FilePath -> IO SHA1
sha1File :: FilePath -> IO SHA1
sha1File = FilePath -> IO SHA1
forall h. (Hash h, Recommendation h) => FilePath -> IO h
hashFile
sha1Source :: ByteSource src => src -> IO SHA1
sha1Source :: src -> IO SHA1
sha1Source = src -> IO SHA1
forall h src.
(Hash h, Recommendation h, ByteSource src) =>
src -> IO h
hashSource
{-# DEPRECATED hmacSha1, hmacSha1File, hmacSha1Source
"SHA1 is broken. This functions are here only for transition." #-}
hmacSha1 :: PureByteSource src => Key (HMAC SHA1) -> src -> HMAC SHA1
hmacSha1 :: Key (HMAC SHA1) -> src -> HMAC SHA1
hmacSha1 = Key (HMAC SHA1) -> src -> HMAC SHA1
forall h src.
(Hash h, Recommendation h, PureByteSource src) =>
Key (HMAC h) -> src -> HMAC h
hmac
hmacSha1File :: Key (HMAC SHA1) -> FilePath -> IO (HMAC SHA1)
hmacSha1File :: Key (HMAC SHA1) -> FilePath -> IO (HMAC SHA1)
hmacSha1File = Key (HMAC SHA1) -> FilePath -> IO (HMAC SHA1)
forall h.
(Hash h, Recommendation h) =>
Key (HMAC h) -> FilePath -> IO (HMAC h)
hmacFile
hmacSha1Source :: ByteSource src => Key (HMAC SHA1) -> src -> IO (HMAC SHA1)
hmacSha1Source :: Key (HMAC SHA1) -> src -> IO (HMAC SHA1)
hmacSha1Source = Key (HMAC SHA1) -> src -> IO (HMAC SHA1)
forall h src.
(Hash h, Recommendation h, ByteSource src) =>
Key (HMAC h) -> src -> IO (HMAC h)
hmacSource