{-# LANGUAGE DataKinds #-}
{-# LANGUAGE TypeFamilies #-}
module Cardano.Crypto.Hash.NeverUsed (NeverHash) where
import Cardano.Crypto.Hash.Class
data NeverHash
instance HashAlgorithm NeverHash where
type SizeHash NeverHash = 0
hashAlgorithmName :: forall (proxy :: * -> *). proxy NeverHash -> String
hashAlgorithmName proxy NeverHash
_ = String
"never"
digest :: forall (proxy :: * -> *).
proxy NeverHash -> ByteString -> ByteString
digest = forall a. HasCallStack => String -> a
error String
"HASH not available"