module Raaz.Hash.Sha384
(
SHA384
, sha384, sha384File, sha384Source
, hmacSha384, hmacSha384File, hmacSha384Source
) 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.Sha384.Internal ( SHA384 )
import Raaz.Hash.Sha384.Recommendation()
sha384 :: PureByteSource src => src -> SHA384
sha384 :: src -> SHA384
sha384 = src -> SHA384
forall h src.
(Hash h, Recommendation h, PureByteSource src) =>
src -> h
hash
{-# SPECIALIZE sha384 :: B.ByteString -> SHA384 #-}
{-# SPECIALIZE sha384 :: L.ByteString -> SHA384 #-}
sha384File :: FilePath -> IO SHA384
sha384File :: FilePath -> IO SHA384
sha384File = FilePath -> IO SHA384
forall h. (Hash h, Recommendation h) => FilePath -> IO h
hashFile
sha384Source :: ByteSource src => src -> IO SHA384
sha384Source :: src -> IO SHA384
sha384Source = src -> IO SHA384
forall h src.
(Hash h, Recommendation h, ByteSource src) =>
src -> IO h
hashSource
hmacSha384 :: PureByteSource src
=> Key (HMAC SHA384)
-> src
-> HMAC SHA384
hmacSha384 :: Key (HMAC SHA384) -> src -> HMAC SHA384
hmacSha384 = Key (HMAC SHA384) -> src -> HMAC SHA384
forall h src.
(Hash h, Recommendation h, PureByteSource src) =>
Key (HMAC h) -> src -> HMAC h
hmac
hmacSha384File :: Key (HMAC SHA384)
-> FilePath
-> IO (HMAC SHA384)
hmacSha384File :: Key (HMAC SHA384) -> FilePath -> IO (HMAC SHA384)
hmacSha384File = Key (HMAC SHA384) -> FilePath -> IO (HMAC SHA384)
forall h.
(Hash h, Recommendation h) =>
Key (HMAC h) -> FilePath -> IO (HMAC h)
hmacFile
hmacSha384Source :: ByteSource src
=> Key (HMAC SHA384)
-> src
-> IO (HMAC SHA384)
hmacSha384Source :: Key (HMAC SHA384) -> src -> IO (HMAC SHA384)
hmacSha384Source = Key (HMAC SHA384) -> src -> IO (HMAC SHA384)
forall h src.
(Hash h, Recommendation h, ByteSource src) =>
Key (HMAC h) -> src -> IO (HMAC h)
hmacSource