{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE Trustworthy #-}
module Data.RedisBloom.Internal where
import GHC.Generics (Generic)
import Data.Typeable (Typeable)
import qualified Data.ByteString.Char8 as BS
newtype HashCount = HashCount Int deriving (Generic, Typeable, Show, Eq, Ord, Enum, Num, Real, Integral, Bounded)
newtype Capacity = Capacity Int deriving (Generic, Typeable, Show, Eq, Ord, Enum, Num, Real, Integral)
type Key = BS.ByteString