{-|

This module exposes combinators to compute the SHA256 hash and the
associated HMAC for some common types.

-}

module Raaz.Hash.Sha256
       ( -- * The SHA256 cryptographic hash
         SHA256
       , sha256, sha256File, sha256Source
       -- * HMAC computation using SHA256
       , hmacSha256, hmacSha256File, hmacSha256Source
       ) 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.Sha256.Internal ( SHA256 )
import Raaz.Hash.Sha256.Recommendation()

-- | Compute the sha256 hash of an instance of `PureByteSource`. Use
-- this for computing the sha256 hash of a strict or lazy byte string.
sha256       :: PureByteSource src => src -> SHA256
sha256 :: src -> SHA256
sha256       = src -> SHA256
forall h src.
(Hash h, Recommendation h, PureByteSource src) =>
src -> h
hash
{-# SPECIALIZE sha256 :: B.ByteString -> SHA256 #-}
{-# SPECIALIZE sha256 :: L.ByteString -> SHA256 #-}


-- | Compute the sha256 hash of a file.
sha256File   :: FilePath -> IO SHA256
sha256File :: FilePath -> IO SHA256
sha256File   = FilePath -> IO SHA256
forall h. (Hash h, Recommendation h) => FilePath -> IO h
hashFile

-- | Compute the sha256 hash of a general byte source.
sha256Source :: ByteSource src => src -> IO SHA256
sha256Source :: src -> IO SHA256
sha256Source = src -> IO SHA256
forall h src.
(Hash h, Recommendation h, ByteSource src) =>
src -> IO h
hashSource

-- | Compute the message authentication code using hmac-sha256.
hmacSha256 :: PureByteSource src
           => Key (HMAC SHA256)  -- ^ Key to use
           -> src                -- ^ pure source whose hmac is to be
                                 -- computed
           -> HMAC SHA256
hmacSha256 :: Key (HMAC SHA256) -> src -> HMAC SHA256
hmacSha256 = Key (HMAC SHA256) -> src -> HMAC SHA256
forall h src.
(Hash h, Recommendation h, PureByteSource src) =>
Key (HMAC h) -> src -> HMAC h
hmac

-- | Compute the message authentication code for a file.
hmacSha256File :: Key (HMAC SHA256) -- ^ Key to use
               -> FilePath          -- ^ File whose hmac is to be computed
               -> IO (HMAC SHA256)
hmacSha256File :: Key (HMAC SHA256) -> FilePath -> IO (HMAC SHA256)
hmacSha256File = Key (HMAC SHA256) -> FilePath -> IO (HMAC SHA256)
forall h.
(Hash h, Recommendation h) =>
Key (HMAC h) -> FilePath -> IO (HMAC h)
hmacFile

-- | Compute the message authetication code for a generic byte source.
hmacSha256Source :: ByteSource src
                 => Key (HMAC SHA256)
                 -> src
                 -> IO (HMAC SHA256)
hmacSha256Source :: Key (HMAC SHA256) -> src -> IO (HMAC SHA256)
hmacSha256Source = Key (HMAC SHA256) -> src -> IO (HMAC SHA256)
forall h src.
(Hash h, Recommendation h, ByteSource src) =>
Key (HMAC h) -> src -> IO (HMAC h)
hmacSource