module Raaz.Hash.Sha224
(
SHA224
, sha224, sha224File, sha224Source
, hmacSha224, hmacSha224File, hmacSha224Source
) 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.Sha224.Internal ( SHA224 )
import Raaz.Hash.Sha224.Recommendation()
sha224 :: PureByteSource src => src -> SHA224
sha224 :: src -> SHA224
sha224 = src -> SHA224
forall h src.
(Hash h, Recommendation h, PureByteSource src) =>
src -> h
hash
{-# SPECIALIZE sha224 :: B.ByteString -> SHA224 #-}
{-# SPECIALIZE sha224 :: L.ByteString -> SHA224 #-}
sha224File :: FilePath -> IO SHA224
sha224File :: FilePath -> IO SHA224
sha224File = FilePath -> IO SHA224
forall h. (Hash h, Recommendation h) => FilePath -> IO h
hashFile
sha224Source :: ByteSource src => src -> IO SHA224
sha224Source :: src -> IO SHA224
sha224Source = src -> IO SHA224
forall h src.
(Hash h, Recommendation h, ByteSource src) =>
src -> IO h
hashSource
hmacSha224 :: PureByteSource src
=> Key (HMAC SHA224)
-> src
-> HMAC SHA224
hmacSha224 :: Key (HMAC SHA224) -> src -> HMAC SHA224
hmacSha224 = Key (HMAC SHA224) -> src -> HMAC SHA224
forall h src.
(Hash h, Recommendation h, PureByteSource src) =>
Key (HMAC h) -> src -> HMAC h
hmac
hmacSha224File :: Key (HMAC SHA224)
-> FilePath
-> IO (HMAC SHA224)
hmacSha224File :: Key (HMAC SHA224) -> FilePath -> IO (HMAC SHA224)
hmacSha224File = Key (HMAC SHA224) -> FilePath -> IO (HMAC SHA224)
forall h.
(Hash h, Recommendation h) =>
Key (HMAC h) -> FilePath -> IO (HMAC h)
hmacFile
hmacSha224Source :: ByteSource src
=> Key (HMAC SHA224)
-> src
-> IO (HMAC SHA224)
hmacSha224Source :: Key (HMAC SHA224) -> src -> IO (HMAC SHA224)
hmacSha224Source = Key (HMAC SHA224) -> src -> IO (HMAC SHA224)
forall h src.
(Hash h, Recommendation h, ByteSource src) =>
Key (HMAC h) -> src -> IO (HMAC h)
hmacSource