crypto-api-0.13.3: A generic interface for cryptographic operations

Safe HaskellSafe
LanguageHaskell98

Crypto.Types

Description

Type aliases used throughout the crypto-api modules.

Synopsis

Documentation

data IV k Source #

Initilization Vectors for BlockCipher implementations (IV k) are used for various modes and guarrenteed to be blockSize bits long. The common ways to obtain an IV are to generate one (getIV or getIVIO) or to use one provided with the ciphertext (using the Serialize instance of IV).

zeroIV also exists and is of particular use for starting ctr mode with a fresh key.

Constructors

IV 

Instances

Eq (IV k) Source # 

Methods

(==) :: IV k -> IV k -> Bool #

(/=) :: IV k -> IV k -> Bool #

Ord (IV k) Source # 

Methods

compare :: IV k -> IV k -> Ordering #

(<) :: IV k -> IV k -> Bool #

(<=) :: IV k -> IV k -> Bool #

(>) :: IV k -> IV k -> Bool #

(>=) :: IV k -> IV k -> Bool #

max :: IV k -> IV k -> IV k #

min :: IV k -> IV k -> IV k #

Show (IV k) Source # 

Methods

showsPrec :: Int -> IV k -> ShowS #

show :: IV k -> String #

showList :: [IV k] -> ShowS #

type BitLength = Int Source #

The length of a field (usually a ByteString) in bits

type ByteLength = Int Source #

The length fo a field in bytes.

data BlockCipherError Source #

Instances

Eq BlockCipherError Source # 
Data BlockCipherError Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BlockCipherError -> c BlockCipherError #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BlockCipherError #

toConstr :: BlockCipherError -> Constr #

dataTypeOf :: BlockCipherError -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c BlockCipherError) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BlockCipherError) #

gmapT :: (forall b. Data b => b -> b) -> BlockCipherError -> BlockCipherError #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BlockCipherError -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BlockCipherError -> r #

gmapQ :: (forall d. Data d => d -> u) -> BlockCipherError -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BlockCipherError -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BlockCipherError -> m BlockCipherError #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BlockCipherError -> m BlockCipherError #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BlockCipherError -> m BlockCipherError #

Ord BlockCipherError Source # 
Read BlockCipherError Source # 
Show BlockCipherError Source # 
Exception BlockCipherError Source #