otp-authenticator-0.1.0.0: OTP Authenticator (a la google) command line client

Safe HaskellNone
LanguageHaskell2010

Encrypted

Documentation

data Enc a Source #

Constructors

Enc 

Fields

Instances

Generic (Enc a) Source # 

Associated Types

type Rep (Enc a) :: * -> * #

Methods

from :: Enc a -> Rep (Enc a) x #

to :: Rep (Enc a) x -> Enc a #

Binary (Enc a) Source # 

Methods

put :: Enc a -> Put #

get :: Get (Enc a) #

putList :: [Enc a] -> Put #

type Rep (Enc a) Source # 
type Rep (Enc a) = D1 (MetaData "Enc" "Encrypted" "otp-authenticator-0.1.0.0-BSCTJlTxmg85yc13Q26PHJ" False) (C1 (MetaCons "Enc" PrefixI True) (S1 (MetaSel (Just Symbol "encBytes") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Encrypted)))

withEnc :: Binary a => Ctx -> Key -> Enc a -> (a -> IO (b, a)) -> IO (b, Enc a) Source #

overEnc :: Binary a => Ctx -> Key -> Enc a -> (a -> IO a) -> IO (Enc a) Source #

getEnc :: Binary a => Ctx -> Enc a -> IO a Source #

mkEnc :: Binary a => Ctx -> Key -> a -> IO (Enc a) Source #