-- | This sets up the recommended implementation of Sha1.
{-# OPTIONS_GHC -fno-warn-orphans #-}
--
-- The orphan instance declaration separates the implementation and
-- setting the recommended instances. Therefore, we ignore the warning.
--

module Raaz.Hash.Sha1.Recommendation where

import Raaz.Core
import Raaz.Hash.Sha1.Internal
import qualified Raaz.Hash.Sha1.Implementation.CPortable as CPortable

-- | Recommended implementation for SHA1.
instance Recommendation SHA1 where
  recommended :: SHA1 -> Implementation SHA1
recommended SHA1
_ = Implementation SHA1
CPortable.implementation