hOpenPGP-2.7.4.1: native Haskell implementation of OpenPGP (RFC4880)

Safe HaskellNone
LanguageHaskell2010

Codec.Encryption.OpenPGP.Types

Documentation

data TK Source #

Instances
Eq TK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.TK

Methods

(==) :: TK -> TK -> Bool #

(/=) :: TK -> TK -> Bool #

Data TK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.TK

Methods

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

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

toConstr :: TK -> Constr #

dataTypeOf :: TK -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord TK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.TK

Methods

compare :: TK -> TK -> Ordering #

(<) :: TK -> TK -> Bool #

(<=) :: TK -> TK -> Bool #

(>) :: TK -> TK -> Bool #

(>=) :: TK -> TK -> Bool #

max :: TK -> TK -> TK #

min :: TK -> TK -> TK #

Show TK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.TK

Methods

showsPrec :: Int -> TK -> ShowS #

show :: TK -> String #

showList :: [TK] -> ShowS #

Generic TK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.TK

Associated Types

type Rep TK :: * -> * #

Methods

from :: TK -> Rep TK x #

to :: Rep TK x -> TK #

Semigroup TK # 
Instance details

Defined in Data.Conduit.OpenPGP.Keyring.Instances

Methods

(<>) :: TK -> TK -> TK #

sconcat :: NonEmpty TK -> TK #

stimes :: Integral b => b -> TK -> TK #

ToJSON TK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.TK

Binary TK # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Methods

put :: TK -> Put #

get :: Get TK #

putList :: [TK] -> Put #

Indexable KeyringIxs TK # 
Instance details

Defined in Data.Conduit.OpenPGP.Keyring.Instances

type Rep TK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.TK

data Pkt Source #

Instances
Eq Pkt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Pkt

Methods

(==) :: Pkt -> Pkt -> Bool #

(/=) :: Pkt -> Pkt -> Bool #

Data Pkt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Pkt

Methods

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

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

toConstr :: Pkt -> Constr #

dataTypeOf :: Pkt -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Pkt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Pkt

Methods

compare :: Pkt -> Pkt -> Ordering #

(<) :: Pkt -> Pkt -> Bool #

(<=) :: Pkt -> Pkt -> Bool #

(>) :: Pkt -> Pkt -> Bool #

(>=) :: Pkt -> Pkt -> Bool #

max :: Pkt -> Pkt -> Pkt #

min :: Pkt -> Pkt -> Pkt #

Show Pkt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Pkt

Methods

showsPrec :: Int -> Pkt -> ShowS #

show :: Pkt -> String #

showList :: [Pkt] -> ShowS #

Generic Pkt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Pkt

Associated Types

type Rep Pkt :: * -> * #

Methods

from :: Pkt -> Rep Pkt x #

to :: Rep Pkt x -> Pkt #

Hashable Pkt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Pkt

Methods

hashWithSalt :: Int -> Pkt -> Int #

hash :: Pkt -> Int #

ToJSON Pkt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Pkt

Binary Pkt # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Methods

put :: Pkt -> Put #

get :: Get Pkt #

putList :: [Pkt] -> Put #

Pretty Pkt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Pkt

Methods

pretty :: Pkt -> Doc ann #

prettyList :: [Pkt] -> Doc ann #

type Rep Pkt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Pkt

type Rep Pkt = D1 (MetaData "Pkt" "Codec.Encryption.OpenPGP.Types.Internal.Pkt" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) ((((C1 (MetaCons "PKESKPkt" PrefixI False) ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PacketVersion) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 EightOctetKeyId)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PubKeyAlgorithm) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty MPI)))) :+: C1 (MetaCons "SignaturePkt" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SignaturePayload))) :+: (C1 (MetaCons "SKESKPkt" PrefixI False) ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PacketVersion) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SymmetricAlgorithm)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 S2K) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe ByteString)))) :+: C1 (MetaCons "OnePassSignaturePkt" PrefixI False) ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PacketVersion) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SigType) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 HashAlgorithm))) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PubKeyAlgorithm) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 EightOctetKeyId) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 NestedFlag)))))) :+: ((C1 (MetaCons "SecretKeyPkt" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PKPayload) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SKAddendum)) :+: C1 (MetaCons "PublicKeyPkt" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PKPayload))) :+: (C1 (MetaCons "SecretSubkeyPkt" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PKPayload) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SKAddendum)) :+: (C1 (MetaCons "CompressedDataPkt" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 CompressionAlgorithm) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 CompressedDataPayload)) :+: C1 (MetaCons "SymEncDataPkt" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)))))) :+: (((C1 (MetaCons "MarkerPkt" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)) :+: C1 (MetaCons "LiteralDataPkt" PrefixI False) ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 DataType) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 FileName)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ThirtyTwoBitTimeStamp) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)))) :+: (C1 (MetaCons "TrustPkt" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)) :+: (C1 (MetaCons "UserIdPkt" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)) :+: C1 (MetaCons "PublicSubkeyPkt" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PKPayload))))) :+: ((C1 (MetaCons "UserAttributePkt" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [UserAttrSubPacket])) :+: C1 (MetaCons "SymEncIntegrityProtectedDataPkt" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PacketVersion) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString))) :+: (C1 (MetaCons "ModificationDetectionCodePkt" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)) :+: (C1 (MetaCons "OtherPacketPkt" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)) :+: C1 (MetaCons "BrokenPacketPkt" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString))))))))

data EdSigningCurve Source #

Constructors

Ed25519 
Instances
Eq EdSigningCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Data EdSigningCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

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

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

toConstr :: EdSigningCurve -> Constr #

dataTypeOf :: EdSigningCurve -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord EdSigningCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Show EdSigningCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Generic EdSigningCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Associated Types

type Rep EdSigningCurve :: * -> * #

Hashable EdSigningCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

ToJSON EdSigningCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

FromJSON EdSigningCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Pretty EdSigningCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

pretty :: EdSigningCurve -> Doc ann #

prettyList :: [EdSigningCurve] -> Doc ann #

type Rep EdSigningCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

type Rep EdSigningCurve = D1 (MetaData "EdSigningCurve" "Codec.Encryption.OpenPGP.Types.Internal.PKITypes" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) (C1 (MetaCons "Ed25519" PrefixI False) (U1 :: * -> *))

newtype EPoint Source #

Constructors

EPoint 

Fields

Instances
Eq EPoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

(==) :: EPoint -> EPoint -> Bool #

(/=) :: EPoint -> EPoint -> Bool #

Data EPoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

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

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

toConstr :: EPoint -> Constr #

dataTypeOf :: EPoint -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord EPoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Show EPoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Generic EPoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Associated Types

type Rep EPoint :: * -> * #

Methods

from :: EPoint -> Rep EPoint x #

to :: Rep EPoint x -> EPoint #

Hashable EPoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

hashWithSalt :: Int -> EPoint -> Int #

hash :: EPoint -> Int #

ToJSON EPoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

FromJSON EPoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Pretty EPoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

pretty :: EPoint -> Doc ann #

prettyList :: [EPoint] -> Doc ann #

type Rep EPoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

type Rep EPoint = D1 (MetaData "EPoint" "Codec.Encryption.OpenPGP.Types.Internal.PKITypes" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "EPoint" PrefixI True) (S1 (MetaSel (Just "unEPoint") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Integer)))

data PKey Source #

Instances
Eq PKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

(==) :: PKey -> PKey -> Bool #

(/=) :: PKey -> PKey -> Bool #

Data PKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

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

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

toConstr :: PKey -> Constr #

dataTypeOf :: PKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord PKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

compare :: PKey -> PKey -> Ordering #

(<) :: PKey -> PKey -> Bool #

(<=) :: PKey -> PKey -> Bool #

(>) :: PKey -> PKey -> Bool #

(>=) :: PKey -> PKey -> Bool #

max :: PKey -> PKey -> PKey #

min :: PKey -> PKey -> PKey #

Show PKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

showsPrec :: Int -> PKey -> ShowS #

show :: PKey -> String #

showList :: [PKey] -> ShowS #

Generic PKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Associated Types

type Rep PKey :: * -> * #

Methods

from :: PKey -> Rep PKey x #

to :: Rep PKey x -> PKey #

Hashable PKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

hashWithSalt :: Int -> PKey -> Int #

hash :: PKey -> Int #

ToJSON PKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Pretty PKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

pretty :: PKey -> Doc ann #

prettyList :: [PKey] -> Doc ann #

type Rep PKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

type Rep PKey = D1 (MetaData "PKey" "Codec.Encryption.OpenPGP.Types.Internal.PKITypes" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) ((C1 (MetaCons "RSAPubKey" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 RSA_PublicKey)) :+: (C1 (MetaCons "DSAPubKey" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 DSA_PublicKey)) :+: C1 (MetaCons "ElGamalPubKey" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Integer) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Integer) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Integer))))) :+: ((C1 (MetaCons "ECDHPubKey" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PKey) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 HashAlgorithm) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SymmetricAlgorithm))) :+: C1 (MetaCons "ECDSAPubKey" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ECDSA_PublicKey))) :+: (C1 (MetaCons "EdDSAPubKey" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 EdSigningCurve) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 EPoint)) :+: C1 (MetaCons "UnknownPKey" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)))))

data SKey Source #

Instances
Eq SKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

(==) :: SKey -> SKey -> Bool #

(/=) :: SKey -> SKey -> Bool #

Data SKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

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

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

toConstr :: SKey -> Constr #

dataTypeOf :: SKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

showsPrec :: Int -> SKey -> ShowS #

show :: SKey -> String #

showList :: [SKey] -> ShowS #

Generic SKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Associated Types

type Rep SKey :: * -> * #

Methods

from :: SKey -> Rep SKey x #

to :: Rep SKey x -> SKey #

Hashable SKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

hashWithSalt :: Int -> SKey -> Int #

hash :: SKey -> Int #

ToJSON SKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Pretty SKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

pretty :: SKey -> Doc ann #

prettyList :: [SKey] -> Doc ann #

type Rep SKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

data PKPayload Source #

Instances
Eq PKPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Data PKPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

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

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

toConstr :: PKPayload -> Constr #

dataTypeOf :: PKPayload -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord PKPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Show PKPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Generic PKPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Associated Types

type Rep PKPayload :: * -> * #

Hashable PKPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

ToJSON PKPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Binary PKPayload # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty PKPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

pretty :: PKPayload -> Doc ann #

prettyList :: [PKPayload] -> Doc ann #

type Rep PKPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

data SKAddendum Source #

Instances
Eq SKAddendum Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Data SKAddendum Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

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

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

toConstr :: SKAddendum -> Constr #

dataTypeOf :: SKAddendum -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SKAddendum Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Show SKAddendum Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Generic SKAddendum Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Associated Types

type Rep SKAddendum :: * -> * #

Hashable SKAddendum Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

ToJSON SKAddendum Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Pretty SKAddendum Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

Methods

pretty :: SKAddendum -> Doc ann #

prettyList :: [SKAddendum] -> Doc ann #

type Rep SKAddendum Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PKITypes

type Rep SKAddendum = D1 (MetaData "SKAddendum" "Codec.Encryption.OpenPGP.Types.Internal.PKITypes" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) ((C1 (MetaCons "SUS16bit" PrefixI False) ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SymmetricAlgorithm) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 S2K)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 IV) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString))) :+: C1 (MetaCons "SUSSHA1" PrefixI False) ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SymmetricAlgorithm) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 S2K)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 IV) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)))) :+: (C1 (MetaCons "SUSym" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SymmetricAlgorithm) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 IV) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString))) :+: C1 (MetaCons "SUUnencrypted" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SKey) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word16))))

class Packet a where Source #

Minimal complete definition

packetType, packetCode, toPkt, fromPkt

Associated Types

data PacketType a :: * Source #

Instances
Packet BrokenPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType BrokenPacket :: * Source #

Packet OtherPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType OtherPacket :: * Source #

Packet ModificationDetectionCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Packet SymEncIntegrityProtectedData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Packet UserAttribute Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType UserAttribute :: * Source #

Packet PublicSubkey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType PublicSubkey :: * Source #

Packet UserId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType UserId :: * Source #

Packet Trust Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType Trust :: * Source #

Packet LiteralData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType LiteralData :: * Source #

Packet Marker Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType Marker :: * Source #

Packet SymEncData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType SymEncData :: * Source #

Packet CompressedData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType CompressedData :: * Source #

Packet SecretSubkey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType SecretSubkey :: * Source #

Packet PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType PublicKey :: * Source #

Packet SecretKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType SecretKey :: * Source #

Packet OnePassSignature Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType OnePassSignature :: * Source #

Packet SKESK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType SKESK :: * Source #

Packet Signature Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType Signature :: * Source #

Packet PKESK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType PKESK :: * Source #

data PKESK Source #

Instances
Eq PKESK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

(==) :: PKESK -> PKESK -> Bool #

(/=) :: PKESK -> PKESK -> Bool #

Data PKESK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: PKESK -> Constr #

dataTypeOf :: PKESK -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PKESK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

showsPrec :: Int -> PKESK -> ShowS #

show :: PKESK -> String #

showList :: [PKESK] -> ShowS #

Binary PKESK # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Methods

put :: PKESK -> Put #

get :: Get PKESK #

putList :: [PKESK] -> Put #

Pretty PKESK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

pretty :: PKESK -> Doc ann #

prettyList :: [PKESK] -> Doc ann #

Packet PKESK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType PKESK :: * Source #

Eq (PacketType PKESK) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType PKESK) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType PKESK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

newtype Signature Source #

Instances
Eq Signature Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Data Signature Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: Signature -> Constr #

dataTypeOf :: Signature -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Signature Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Binary Signature # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty Signature Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

pretty :: Signature -> Doc ann #

prettyList :: [Signature] -> Doc ann #

Packet Signature Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType Signature :: * Source #

Eq (PacketType Signature) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType Signature) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType Signature Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data SKESK Source #

Instances
Eq SKESK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

(==) :: SKESK -> SKESK -> Bool #

(/=) :: SKESK -> SKESK -> Bool #

Data SKESK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: SKESK -> Constr #

dataTypeOf :: SKESK -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SKESK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

showsPrec :: Int -> SKESK -> ShowS #

show :: SKESK -> String #

showList :: [SKESK] -> ShowS #

Binary SKESK # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Methods

put :: SKESK -> Put #

get :: Get SKESK #

putList :: [SKESK] -> Put #

Pretty SKESK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

pretty :: SKESK -> Doc ann #

prettyList :: [SKESK] -> Doc ann #

Packet SKESK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType SKESK :: * Source #

Eq (PacketType SKESK) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType SKESK) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType SKESK Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data OnePassSignature Source #

Instances
Eq OnePassSignature Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Data OnePassSignature Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: OnePassSignature -> Constr #

dataTypeOf :: OnePassSignature -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OnePassSignature Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Binary OnePassSignature # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty OnePassSignature Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Packet OnePassSignature Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType OnePassSignature :: * Source #

Eq (PacketType OnePassSignature) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType OnePassSignature) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType OnePassSignature Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data SecretKey Source #

Instances
Eq SecretKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Data SecretKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: SecretKey -> Constr #

dataTypeOf :: SecretKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SecretKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Binary SecretKey # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty SecretKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

pretty :: SecretKey -> Doc ann #

prettyList :: [SecretKey] -> Doc ann #

Packet SecretKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType SecretKey :: * Source #

Eq (PacketType SecretKey) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType SecretKey) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType SecretKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

newtype PublicKey Source #

Constructors

PublicKey 
Instances
Eq PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Data PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: PublicKey -> Constr #

dataTypeOf :: PublicKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Binary PublicKey # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

pretty :: PublicKey -> Doc ann #

prettyList :: [PublicKey] -> Doc ann #

Packet PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType PublicKey :: * Source #

Eq (PacketType PublicKey) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType PublicKey) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data SecretSubkey Source #

Instances
Eq SecretSubkey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Data SecretSubkey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: SecretSubkey -> Constr #

dataTypeOf :: SecretSubkey -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SecretSubkey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Binary SecretSubkey # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty SecretSubkey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

pretty :: SecretSubkey -> Doc ann #

prettyList :: [SecretSubkey] -> Doc ann #

Packet SecretSubkey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType SecretSubkey :: * Source #

Eq (PacketType SecretSubkey) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType SecretSubkey) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType SecretSubkey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data CompressedData Source #

Instances
Eq CompressedData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Data CompressedData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: CompressedData -> Constr #

dataTypeOf :: CompressedData -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CompressedData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Binary CompressedData # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty CompressedData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

pretty :: CompressedData -> Doc ann #

prettyList :: [CompressedData] -> Doc ann #

Packet CompressedData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType CompressedData :: * Source #

Eq (PacketType CompressedData) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType CompressedData) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType CompressedData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

newtype SymEncData Source #

Constructors

SymEncData 
Instances
Eq SymEncData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Data SymEncData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: SymEncData -> Constr #

dataTypeOf :: SymEncData -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SymEncData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Binary SymEncData # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty SymEncData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

pretty :: SymEncData -> Doc ann #

prettyList :: [SymEncData] -> Doc ann #

Packet SymEncData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType SymEncData :: * Source #

Eq (PacketType SymEncData) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType SymEncData) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType SymEncData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

newtype Marker Source #

Constructors

Marker 
Instances
Eq Marker Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

(==) :: Marker -> Marker -> Bool #

(/=) :: Marker -> Marker -> Bool #

Data Marker Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: Marker -> Constr #

dataTypeOf :: Marker -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Marker Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Binary Marker # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Methods

put :: Marker -> Put #

get :: Get Marker #

putList :: [Marker] -> Put #

Pretty Marker Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

pretty :: Marker -> Doc ann #

prettyList :: [Marker] -> Doc ann #

Packet Marker Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType Marker :: * Source #

Eq (PacketType Marker) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType Marker) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType Marker Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data LiteralData Source #

Instances
Eq LiteralData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Data LiteralData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: LiteralData -> Constr #

dataTypeOf :: LiteralData -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LiteralData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Binary LiteralData # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty LiteralData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

pretty :: LiteralData -> Doc ann #

prettyList :: [LiteralData] -> Doc ann #

Packet LiteralData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType LiteralData :: * Source #

Eq (PacketType LiteralData) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType LiteralData) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType LiteralData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

newtype Trust Source #

Constructors

Trust 
Instances
Eq Trust Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

(==) :: Trust -> Trust -> Bool #

(/=) :: Trust -> Trust -> Bool #

Data Trust Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: Trust -> Constr #

dataTypeOf :: Trust -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Trust Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

showsPrec :: Int -> Trust -> ShowS #

show :: Trust -> String #

showList :: [Trust] -> ShowS #

Binary Trust # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Methods

put :: Trust -> Put #

get :: Get Trust #

putList :: [Trust] -> Put #

Pretty Trust Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

pretty :: Trust -> Doc ann #

prettyList :: [Trust] -> Doc ann #

Packet Trust Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType Trust :: * Source #

Eq (PacketType Trust) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType Trust) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType Trust Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

newtype UserId Source #

Constructors

UserId 

Fields

Instances
Eq UserId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

(==) :: UserId -> UserId -> Bool #

(/=) :: UserId -> UserId -> Bool #

Data UserId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: UserId -> Constr #

dataTypeOf :: UserId -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UserId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Binary UserId # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Methods

put :: UserId -> Put #

get :: Get UserId #

putList :: [UserId] -> Put #

Pretty UserId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

pretty :: UserId -> Doc ann #

prettyList :: [UserId] -> Doc ann #

Packet UserId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType UserId :: * Source #

Eq (PacketType UserId) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType UserId) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType UserId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

newtype PublicSubkey Source #

Instances
Eq PublicSubkey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Data PublicSubkey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: PublicSubkey -> Constr #

dataTypeOf :: PublicSubkey -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PublicSubkey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Binary PublicSubkey # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty PublicSubkey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

pretty :: PublicSubkey -> Doc ann #

prettyList :: [PublicSubkey] -> Doc ann #

Packet PublicSubkey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType PublicSubkey :: * Source #

Eq (PacketType PublicSubkey) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType PublicSubkey) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType PublicSubkey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

newtype UserAttribute Source #

Instances
Eq UserAttribute Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Data UserAttribute Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: UserAttribute -> Constr #

dataTypeOf :: UserAttribute -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UserAttribute Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Binary UserAttribute # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty UserAttribute Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

pretty :: UserAttribute -> Doc ann #

prettyList :: [UserAttribute] -> Doc ann #

Packet UserAttribute Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType UserAttribute :: * Source #

Eq (PacketType UserAttribute) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType UserAttribute) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType UserAttribute Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data SymEncIntegrityProtectedData Source #

Instances
Eq SymEncIntegrityProtectedData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Data SymEncIntegrityProtectedData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: SymEncIntegrityProtectedData -> Constr #

dataTypeOf :: SymEncIntegrityProtectedData -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SymEncIntegrityProtectedData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Binary SymEncIntegrityProtectedData # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty SymEncIntegrityProtectedData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Packet SymEncIntegrityProtectedData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Eq (PacketType SymEncIntegrityProtectedData) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType SymEncIntegrityProtectedData) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType SymEncIntegrityProtectedData Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

newtype ModificationDetectionCode Source #

Instances
Eq ModificationDetectionCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Data ModificationDetectionCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: ModificationDetectionCode -> Constr #

dataTypeOf :: ModificationDetectionCode -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ModificationDetectionCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Binary ModificationDetectionCode # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty ModificationDetectionCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Packet ModificationDetectionCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Eq (PacketType ModificationDetectionCode) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType ModificationDetectionCode) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType ModificationDetectionCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data OtherPacket Source #

Instances
Eq OtherPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Data OtherPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: OtherPacket -> Constr #

dataTypeOf :: OtherPacket -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OtherPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Binary OtherPacket # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty OtherPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

pretty :: OtherPacket -> Doc ann #

prettyList :: [OtherPacket] -> Doc ann #

Packet OtherPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType OtherPacket :: * Source #

Eq (PacketType OtherPacket) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType OtherPacket) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType OtherPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data BrokenPacket Source #

Instances
Eq BrokenPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Data BrokenPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

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

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

toConstr :: BrokenPacket -> Constr #

dataTypeOf :: BrokenPacket -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BrokenPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Pretty BrokenPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Methods

pretty :: BrokenPacket -> Doc ann #

prettyList :: [BrokenPacket] -> Doc ann #

Packet BrokenPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Associated Types

data PacketType BrokenPacket :: * Source #

Eq (PacketType BrokenPacket) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

Show (PacketType BrokenPacket) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

data PacketType BrokenPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.PacketClass

newtype DSA_PublicKey Source #

Constructors

DSA_PublicKey 
Instances
Eq DSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Data DSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Methods

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

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

toConstr :: DSA_PublicKey -> Constr #

dataTypeOf :: DSA_PublicKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Show DSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Generic DSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Associated Types

type Rep DSA_PublicKey :: * -> * #

Hashable DSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

ToJSON DSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Pretty DSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Methods

pretty :: DSA_PublicKey -> Doc ann #

prettyList :: [DSA_PublicKey] -> Doc ann #

type Rep DSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

type Rep DSA_PublicKey = D1 (MetaData "DSA_PublicKey" "Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "DSA_PublicKey" PrefixI True) (S1 (MetaSel (Just "unDSA_PublicKey") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PublicKey)))

newtype RSA_PublicKey Source #

Constructors

RSA_PublicKey 
Instances
Eq RSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Data RSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Methods

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

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

toConstr :: RSA_PublicKey -> Constr #

dataTypeOf :: RSA_PublicKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord RSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Show RSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Generic RSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Associated Types

type Rep RSA_PublicKey :: * -> * #

Hashable RSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

ToJSON RSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Pretty RSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Methods

pretty :: RSA_PublicKey -> Doc ann #

prettyList :: [RSA_PublicKey] -> Doc ann #

type Rep RSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

type Rep RSA_PublicKey = D1 (MetaData "RSA_PublicKey" "Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "RSA_PublicKey" PrefixI True) (S1 (MetaSel (Just "unRSA_PublicKey") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PublicKey)))

newtype ECDSA_PublicKey Source #

Instances
Eq ECDSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Data ECDSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Methods

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

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

toConstr :: ECDSA_PublicKey -> Constr #

dataTypeOf :: ECDSA_PublicKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ECDSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Show ECDSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Generic ECDSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Associated Types

type Rep ECDSA_PublicKey :: * -> * #

Hashable ECDSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

ToJSON ECDSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Pretty ECDSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

type Rep ECDSA_PublicKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

type Rep ECDSA_PublicKey = D1 (MetaData "ECDSA_PublicKey" "Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "ECDSA_PublicKey" PrefixI True) (S1 (MetaSel (Just "unECDSA_PublicKey") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PublicKey)))

newtype DSA_PrivateKey Source #

Instances
Eq DSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Data DSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Methods

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

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

toConstr :: DSA_PrivateKey -> Constr #

dataTypeOf :: DSA_PrivateKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Show DSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Generic DSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Associated Types

type Rep DSA_PrivateKey :: * -> * #

Hashable DSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

ToJSON DSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Pretty DSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Methods

pretty :: DSA_PrivateKey -> Doc ann #

prettyList :: [DSA_PrivateKey] -> Doc ann #

type Rep DSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

type Rep DSA_PrivateKey = D1 (MetaData "DSA_PrivateKey" "Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "DSA_PrivateKey" PrefixI True) (S1 (MetaSel (Just "unDSA_PrivateKey") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PrivateKey)))

newtype RSA_PrivateKey Source #

Instances
Eq RSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Data RSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Methods

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

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

toConstr :: RSA_PrivateKey -> Constr #

dataTypeOf :: RSA_PrivateKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord RSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Show RSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Generic RSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Associated Types

type Rep RSA_PrivateKey :: * -> * #

Hashable RSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

ToJSON RSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Pretty RSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Methods

pretty :: RSA_PrivateKey -> Doc ann #

prettyList :: [RSA_PrivateKey] -> Doc ann #

type Rep RSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

type Rep RSA_PrivateKey = D1 (MetaData "RSA_PrivateKey" "Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "RSA_PrivateKey" PrefixI True) (S1 (MetaSel (Just "unRSA_PrivateKey") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PrivateKey)))

newtype ECDSA_PrivateKey Source #

Instances
Eq ECDSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Data ECDSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Methods

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

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

toConstr :: ECDSA_PrivateKey -> Constr #

dataTypeOf :: ECDSA_PrivateKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ECDSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Show ECDSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Generic ECDSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Associated Types

type Rep ECDSA_PrivateKey :: * -> * #

Hashable ECDSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

ToJSON ECDSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Pretty ECDSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

type Rep ECDSA_PrivateKey Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

type Rep ECDSA_PrivateKey = D1 (MetaData "ECDSA_PrivateKey" "Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "ECDSA_PrivateKey" PrefixI True) (S1 (MetaSel (Just "unECDSA_PrivateKey") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PrivateKey)))

newtype DSA_Params Source #

Constructors

DSA_Params 

Fields

Instances
Eq DSA_Params Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Data DSA_Params Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Methods

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

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

toConstr :: DSA_Params -> Constr #

dataTypeOf :: DSA_Params -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DSA_Params Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Generic DSA_Params Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Associated Types

type Rep DSA_Params :: * -> * #

Hashable DSA_Params Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

ToJSON DSA_Params Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Pretty DSA_Params Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Methods

pretty :: DSA_Params -> Doc ann #

prettyList :: [DSA_Params] -> Doc ann #

type Rep DSA_Params Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

type Rep DSA_Params = D1 (MetaData "DSA_Params" "Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "DSA_Params" PrefixI True) (S1 (MetaSel (Just "unDSA_Params") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Params)))

newtype ECurvePoint Source #

Constructors

ECurvePoint 

Fields

Instances
Eq ECurvePoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Data ECurvePoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Methods

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

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

toConstr :: ECurvePoint -> Constr #

dataTypeOf :: ECurvePoint -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ECurvePoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Generic ECurvePoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

Associated Types

type Rep ECurvePoint :: * -> * #

ToJSON ECurvePoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

FromJSON ECurvePoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

type Rep ECurvePoint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes

type Rep ECurvePoint = D1 (MetaData "ECurvePoint" "Codec.Encryption.OpenPGP.Types.Internal.CryptoniteNewtypes" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "ECurvePoint" PrefixI True) (S1 (MetaSel (Just "unECurvepoint") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Point)))

class (Eq a, Ord a) => FutureVal a where Source #

Minimal complete definition

fromFVal, toFVal

Methods

fromFVal :: a -> Word8 Source #

toFVal :: Word8 -> a Source #

Instances
FutureVal SymmetricAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FutureVal PubKeyAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FutureVal HashAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FutureVal CompressionAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FutureVal RevocationCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FutureVal SigType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FutureVal DataType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FutureVal ImageFormat Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

data SymmetricAlgorithm Source #

Instances
Eq SymmetricAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data SymmetricAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: SymmetricAlgorithm -> Constr #

dataTypeOf :: SymmetricAlgorithm -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SymmetricAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show SymmetricAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic SymmetricAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep SymmetricAlgorithm :: * -> * #

Hashable SymmetricAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON SymmetricAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON SymmetricAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Binary SymmetricAlgorithm # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty SymmetricAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FutureVal SymmetricAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep SymmetricAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep SymmetricAlgorithm = D1 (MetaData "SymmetricAlgorithm" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) (((C1 (MetaCons "Plaintext" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "IDEA" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "TripleDES" PrefixI False) (U1 :: * -> *))) :+: ((C1 (MetaCons "CAST5" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "Blowfish" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "ReservedSAFER" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "ReservedDES" PrefixI False) (U1 :: * -> *)))) :+: (((C1 (MetaCons "AES128" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "AES192" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "AES256" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "Twofish" PrefixI False) (U1 :: * -> *))) :+: ((C1 (MetaCons "Camellia128" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "Camellia192" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "Camellia256" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "OtherSA" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8))))))

data NotationFlag Source #

Constructors

HumanReadable 
OtherNF Word8 
Instances
Eq NotationFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data NotationFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: NotationFlag -> Constr #

dataTypeOf :: NotationFlag -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord NotationFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show NotationFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic NotationFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep NotationFlag :: * -> * #

Hashable NotationFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON NotationFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON NotationFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty NotationFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: NotationFlag -> Doc ann #

prettyList :: [NotationFlag] -> Doc ann #

FutureFlag NotationFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep NotationFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep NotationFlag = D1 (MetaData "NotationFlag" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) (C1 (MetaCons "HumanReadable" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "OtherNF" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8)))

newtype ThirtyTwoBitTimeStamp Source #

Instances
Bounded ThirtyTwoBitTimeStamp Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Enum ThirtyTwoBitTimeStamp Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Eq ThirtyTwoBitTimeStamp Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Integral ThirtyTwoBitTimeStamp Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data ThirtyTwoBitTimeStamp Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: ThirtyTwoBitTimeStamp -> Constr #

dataTypeOf :: ThirtyTwoBitTimeStamp -> DataType #

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

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

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

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

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

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

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

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

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

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

Num ThirtyTwoBitTimeStamp Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Ord ThirtyTwoBitTimeStamp Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Real ThirtyTwoBitTimeStamp Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show ThirtyTwoBitTimeStamp Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic ThirtyTwoBitTimeStamp Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep ThirtyTwoBitTimeStamp :: * -> * #

Hashable ThirtyTwoBitTimeStamp Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON ThirtyTwoBitTimeStamp Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON ThirtyTwoBitTimeStamp Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty ThirtyTwoBitTimeStamp Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Newtype ThirtyTwoBitTimeStamp Word32 Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep ThirtyTwoBitTimeStamp Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep ThirtyTwoBitTimeStamp = D1 (MetaData "ThirtyTwoBitTimeStamp" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "ThirtyTwoBitTimeStamp" PrefixI True) (S1 (MetaSel (Just "unThirtyTwoBitTimeStamp") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word32)))

durU :: (Integral a, Show a) => a -> Maybe (String, a) Source #

newtype ThirtyTwoBitDuration Source #

Instances
Bounded ThirtyTwoBitDuration Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Enum ThirtyTwoBitDuration Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Eq ThirtyTwoBitDuration Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Integral ThirtyTwoBitDuration Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data ThirtyTwoBitDuration Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: ThirtyTwoBitDuration -> Constr #

dataTypeOf :: ThirtyTwoBitDuration -> DataType #

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

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

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

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

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

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

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

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

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

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

Num ThirtyTwoBitDuration Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Ord ThirtyTwoBitDuration Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Real ThirtyTwoBitDuration Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show ThirtyTwoBitDuration Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic ThirtyTwoBitDuration Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep ThirtyTwoBitDuration :: * -> * #

Hashable ThirtyTwoBitDuration Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON ThirtyTwoBitDuration Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON ThirtyTwoBitDuration Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty ThirtyTwoBitDuration Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Newtype ThirtyTwoBitDuration Word32 Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep ThirtyTwoBitDuration Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep ThirtyTwoBitDuration = D1 (MetaData "ThirtyTwoBitDuration" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "ThirtyTwoBitDuration" PrefixI True) (S1 (MetaSel (Just "unThirtyTwoBitDuration") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word32)))

data RevocationClass Source #

Constructors

SensitiveRK 
RClOther Word8 
Instances
Eq RevocationClass Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data RevocationClass Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: RevocationClass -> Constr #

dataTypeOf :: RevocationClass -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord RevocationClass Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show RevocationClass Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic RevocationClass Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep RevocationClass :: * -> * #

Hashable RevocationClass Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON RevocationClass Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON RevocationClass Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty RevocationClass Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FutureFlag RevocationClass Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep RevocationClass Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep RevocationClass = D1 (MetaData "RevocationClass" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) (C1 (MetaCons "SensitiveRK" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "RClOther" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8)))

data PubKeyAlgorithm Source #

Instances
Eq PubKeyAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data PubKeyAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: PubKeyAlgorithm -> Constr #

dataTypeOf :: PubKeyAlgorithm -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord PubKeyAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show PubKeyAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic PubKeyAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep PubKeyAlgorithm :: * -> * #

Hashable PubKeyAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON PubKeyAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON PubKeyAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Binary PubKeyAlgorithm # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty PubKeyAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FutureVal PubKeyAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep PubKeyAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep PubKeyAlgorithm = D1 (MetaData "PubKeyAlgorithm" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) (((C1 (MetaCons "RSA" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "DeprecatedRSAEncryptOnly" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "DeprecatedRSASignOnly" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "ElgamalEncryptOnly" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "DSA" PrefixI False) (U1 :: * -> *)))) :+: ((C1 (MetaCons "ECDH" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "ECDSA" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "ForbiddenElgamal" PrefixI False) (U1 :: * -> *))) :+: (C1 (MetaCons "DH" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "EdDSA" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "OtherPKA" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8))))))

newtype TwentyOctetFingerprint Source #

Constructors

TwentyOctetFingerprint 

Fields

Instances
Eq TwentyOctetFingerprint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data TwentyOctetFingerprint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: TwentyOctetFingerprint -> Constr #

dataTypeOf :: TwentyOctetFingerprint -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord TwentyOctetFingerprint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Read TwentyOctetFingerprint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show TwentyOctetFingerprint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic TwentyOctetFingerprint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep TwentyOctetFingerprint :: * -> * #

Hashable TwentyOctetFingerprint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON TwentyOctetFingerprint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON TwentyOctetFingerprint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty TwentyOctetFingerprint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Indexable KeyringIxs TK # 
Instance details

Defined in Data.Conduit.OpenPGP.Keyring.Instances

Newtype SpacedFingerprint TwentyOctetFingerprint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Newtype TwentyOctetFingerprint ByteString Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep TwentyOctetFingerprint Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep TwentyOctetFingerprint = D1 (MetaData "TwentyOctetFingerprint" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "TwentyOctetFingerprint" PrefixI True) (S1 (MetaSel (Just "unTOF") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)))

newtype EightOctetKeyId Source #

Constructors

EightOctetKeyId 

Fields

Instances
Eq EightOctetKeyId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data EightOctetKeyId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: EightOctetKeyId -> Constr #

dataTypeOf :: EightOctetKeyId -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord EightOctetKeyId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Read EightOctetKeyId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show EightOctetKeyId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic EightOctetKeyId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep EightOctetKeyId :: * -> * #

Hashable EightOctetKeyId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON EightOctetKeyId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON EightOctetKeyId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty EightOctetKeyId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Indexable KeyringIxs TK # 
Instance details

Defined in Data.Conduit.OpenPGP.Keyring.Instances

Newtype EightOctetKeyId ByteString Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep EightOctetKeyId Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep EightOctetKeyId = D1 (MetaData "EightOctetKeyId" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "EightOctetKeyId" PrefixI True) (S1 (MetaSel (Just "unEOKI") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)))

newtype NotationName Source #

Constructors

NotationName 
Instances
Eq NotationName Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data NotationName Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: NotationName -> Constr #

dataTypeOf :: NotationName -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord NotationName Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show NotationName Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic NotationName Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep NotationName :: * -> * #

Hashable NotationName Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON NotationName Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON NotationName Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty NotationName Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: NotationName -> Doc ann #

prettyList :: [NotationName] -> Doc ann #

Newtype NotationName ByteString Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep NotationName Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep NotationName = D1 (MetaData "NotationName" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "NotationName" PrefixI True) (S1 (MetaSel (Just "unNotationName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)))

newtype NotationValue Source #

Constructors

NotationValue 
Instances
Eq NotationValue Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data NotationValue Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: NotationValue -> Constr #

dataTypeOf :: NotationValue -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord NotationValue Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show NotationValue Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic NotationValue Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep NotationValue :: * -> * #

Hashable NotationValue Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON NotationValue Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON NotationValue Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty NotationValue Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: NotationValue -> Doc ann #

prettyList :: [NotationValue] -> Doc ann #

Newtype NotationValue ByteString Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep NotationValue Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep NotationValue = D1 (MetaData "NotationValue" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "NotationValue" PrefixI True) (S1 (MetaSel (Just "unNotationValue") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)))

data HashAlgorithm Source #

Instances
Eq HashAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data HashAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: HashAlgorithm -> Constr #

dataTypeOf :: HashAlgorithm -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord HashAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show HashAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic HashAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep HashAlgorithm :: * -> * #

Hashable HashAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON HashAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON HashAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Binary HashAlgorithm # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty HashAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: HashAlgorithm -> Doc ann #

prettyList :: [HashAlgorithm] -> Doc ann #

FutureVal HashAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep HashAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep HashAlgorithm = D1 (MetaData "HashAlgorithm" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) (((C1 (MetaCons "DeprecatedMD5" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "SHA1" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "RIPEMD160" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "SHA256" PrefixI False) (U1 :: * -> *))) :+: ((C1 (MetaCons "SHA384" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "SHA512" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "SHA224" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "OtherHA" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8)))))

data CompressionAlgorithm Source #

Instances
Eq CompressionAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data CompressionAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: CompressionAlgorithm -> Constr #

dataTypeOf :: CompressionAlgorithm -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord CompressionAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show CompressionAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic CompressionAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep CompressionAlgorithm :: * -> * #

Hashable CompressionAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON CompressionAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON CompressionAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Binary CompressionAlgorithm # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty CompressionAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FutureVal CompressionAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep CompressionAlgorithm Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep CompressionAlgorithm = D1 (MetaData "CompressionAlgorithm" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) ((C1 (MetaCons "Uncompressed" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "ZIP" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "ZLIB" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "BZip2" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "OtherCA" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8)))))

data KSPFlag Source #

Constructors

NoModify 
KSPOther Int 
Instances
Eq KSPFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

(==) :: KSPFlag -> KSPFlag -> Bool #

(/=) :: KSPFlag -> KSPFlag -> Bool #

Data KSPFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: KSPFlag -> Constr #

dataTypeOf :: KSPFlag -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord KSPFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show KSPFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic KSPFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep KSPFlag :: * -> * #

Methods

from :: KSPFlag -> Rep KSPFlag x #

to :: Rep KSPFlag x -> KSPFlag #

Hashable KSPFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

hashWithSalt :: Int -> KSPFlag -> Int #

hash :: KSPFlag -> Int #

ToJSON KSPFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON KSPFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty KSPFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: KSPFlag -> Doc ann #

prettyList :: [KSPFlag] -> Doc ann #

FutureFlag KSPFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep KSPFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep KSPFlag = D1 (MetaData "KSPFlag" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) (C1 (MetaCons "NoModify" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "KSPOther" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)))

data KeyFlag Source #

Instances
Eq KeyFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

(==) :: KeyFlag -> KeyFlag -> Bool #

(/=) :: KeyFlag -> KeyFlag -> Bool #

Data KeyFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: KeyFlag -> Constr #

dataTypeOf :: KeyFlag -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord KeyFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show KeyFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic KeyFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep KeyFlag :: * -> * #

Methods

from :: KeyFlag -> Rep KeyFlag x #

to :: Rep KeyFlag x -> KeyFlag #

Hashable KeyFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

hashWithSalt :: Int -> KeyFlag -> Int #

hash :: KeyFlag -> Int #

ToJSON KeyFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON KeyFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty KeyFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: KeyFlag -> Doc ann #

prettyList :: [KeyFlag] -> Doc ann #

FutureFlag KeyFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep KeyFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep KeyFlag = D1 (MetaData "KeyFlag" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) (((C1 (MetaCons "GroupKey" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "AuthKey" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "SplitKey" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "EncryptStorageKey" PrefixI False) (U1 :: * -> *))) :+: ((C1 (MetaCons "EncryptCommunicationsKey" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "SignDataKey" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "CertifyKeysKey" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "KFOther" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)))))

data RevocationCode Source #

Instances
Eq RevocationCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data RevocationCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: RevocationCode -> Constr #

dataTypeOf :: RevocationCode -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord RevocationCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show RevocationCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic RevocationCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep RevocationCode :: * -> * #

Hashable RevocationCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON RevocationCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON RevocationCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty RevocationCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: RevocationCode -> Doc ann #

prettyList :: [RevocationCode] -> Doc ann #

FutureVal RevocationCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep RevocationCode Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep RevocationCode = D1 (MetaData "RevocationCode" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) ((C1 (MetaCons "NoReason" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "KeySuperseded" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "KeyMaterialCompromised" PrefixI False) (U1 :: * -> *))) :+: (C1 (MetaCons "KeyRetiredAndNoLongerUsed" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "UserIdInfoNoLongerValid" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "RCoOther" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8)))))

data FeatureFlag Source #

Instances
Eq FeatureFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data FeatureFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: FeatureFlag -> Constr #

dataTypeOf :: FeatureFlag -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord FeatureFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show FeatureFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic FeatureFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep FeatureFlag :: * -> * #

Hashable FeatureFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON FeatureFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON FeatureFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty FeatureFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: FeatureFlag -> Doc ann #

prettyList :: [FeatureFlag] -> Doc ann #

FutureFlag FeatureFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep FeatureFlag Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep FeatureFlag = D1 (MetaData "FeatureFlag" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) (C1 (MetaCons "ModificationDetection" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "FeatureOther" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)))

newtype URL Source #

Constructors

URL 

Fields

Instances
Eq URL Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

(==) :: URL -> URL -> Bool #

(/=) :: URL -> URL -> Bool #

Data URL Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: URL -> Constr #

dataTypeOf :: URL -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord URL Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

compare :: URL -> URL -> Ordering #

(<) :: URL -> URL -> Bool #

(<=) :: URL -> URL -> Bool #

(>) :: URL -> URL -> Bool #

(>=) :: URL -> URL -> Bool #

max :: URL -> URL -> URL #

min :: URL -> URL -> URL #

Show URL Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

showsPrec :: Int -> URL -> ShowS #

show :: URL -> String #

showList :: [URL] -> ShowS #

Generic URL Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep URL :: * -> * #

Methods

from :: URL -> Rep URL x #

to :: Rep URL x -> URL #

Hashable URL Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

hashWithSalt :: Int -> URL -> Int #

hash :: URL -> Int #

ToJSON URL Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON URL Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty URL Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: URL -> Doc ann #

prettyList :: [URL] -> Doc ann #

Newtype URL URI Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pack :: URI -> URL #

unpack :: URL -> URI #

type Rep URL Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep URL = D1 (MetaData "URL" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "URL" PrefixI True) (S1 (MetaSel (Just "unURL") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 URI)))

data SigType Source #

Instances
Eq SigType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

(==) :: SigType -> SigType -> Bool #

(/=) :: SigType -> SigType -> Bool #

Data SigType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: SigType -> Constr #

dataTypeOf :: SigType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SigType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show SigType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic SigType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep SigType :: * -> * #

Methods

from :: SigType -> Rep SigType x #

to :: Rep SigType x -> SigType #

Hashable SigType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

hashWithSalt :: Int -> SigType -> Int #

hash :: SigType -> Int #

ToJSON SigType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON SigType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Binary SigType # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Methods

put :: SigType -> Put #

get :: Get SigType #

putList :: [SigType] -> Put #

Pretty SigType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: SigType -> Doc ann #

prettyList :: [SigType] -> Doc ann #

FutureVal SigType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep SigType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep SigType = D1 (MetaData "SigType" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) ((((C1 (MetaCons "BinarySig" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "CanonicalTextSig" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "StandaloneSig" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "GenericCert" PrefixI False) (U1 :: * -> *))) :+: ((C1 (MetaCons "PersonaCert" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "CasualCert" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "PositiveCert" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "SubkeyBindingSig" PrefixI False) (U1 :: * -> *)))) :+: (((C1 (MetaCons "PrimaryKeyBindingSig" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "SignatureDirectlyOnAKey" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "KeyRevocationSig" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "SubkeyRevocationSig" PrefixI False) (U1 :: * -> *))) :+: ((C1 (MetaCons "CertRevocationSig" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "TimestampSig" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "ThirdPartyConfirmationSig" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "OtherSig" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8))))))

newtype MPI Source #

Constructors

MPI 

Fields

Instances
Eq MPI Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

(==) :: MPI -> MPI -> Bool #

(/=) :: MPI -> MPI -> Bool #

Data MPI Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: MPI -> Constr #

dataTypeOf :: MPI -> DataType #

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

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

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

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

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

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

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

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

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

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

Show MPI Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

showsPrec :: Int -> MPI -> ShowS #

show :: MPI -> String #

showList :: [MPI] -> ShowS #

Generic MPI Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep MPI :: * -> * #

Methods

from :: MPI -> Rep MPI x #

to :: Rep MPI x -> MPI #

Hashable MPI Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

hashWithSalt :: Int -> MPI -> Int #

hash :: MPI -> Int #

ToJSON MPI Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON MPI Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Binary MPI # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Methods

put :: MPI -> Put #

get :: Get MPI #

putList :: [MPI] -> Put #

Pretty MPI Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: MPI -> Doc ann #

prettyList :: [MPI] -> Doc ann #

Newtype MPI Integer Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pack :: Integer -> MPI #

unpack :: MPI -> Integer #

type Rep MPI Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep MPI = D1 (MetaData "MPI" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "MPI" PrefixI True) (S1 (MetaSel (Just "unMPI") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Integer)))

data SignaturePayload Source #

Instances
Eq SignaturePayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data SignaturePayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: SignaturePayload -> Constr #

dataTypeOf :: SignaturePayload -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SignaturePayload # 
Instance details

Defined in Data.Conduit.OpenPGP.Keyring.Instances

Show SignaturePayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic SignaturePayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep SignaturePayload :: * -> * #

Hashable SignaturePayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON SignaturePayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Binary SignaturePayload # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty SignaturePayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep SignaturePayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep SignaturePayload = D1 (MetaData "SignaturePayload" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) (C1 (MetaCons "SigV3" PrefixI False) ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SigType) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ThirtyTwoBitTimeStamp) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 EightOctetKeyId))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PubKeyAlgorithm) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 HashAlgorithm)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word16) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty MPI))))) :+: (C1 (MetaCons "SigV4" PrefixI False) ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SigType) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PubKeyAlgorithm) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 HashAlgorithm))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [SigSubPacket]) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [SigSubPacket])) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word16) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty MPI))))) :+: C1 (MetaCons "SigVOther" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString))))

data SigSubPacketPayload Source #

Instances
Eq SigSubPacketPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data SigSubPacketPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: SigSubPacketPayload -> Constr #

dataTypeOf :: SigSubPacketPayload -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SigSubPacketPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic SigSubPacketPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep SigSubPacketPayload :: * -> * #

Hashable SigSubPacketPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON SigSubPacketPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON SigSubPacketPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty SigSubPacketPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep SigSubPacketPayload Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep SigSubPacketPayload = D1 (MetaData "SigSubPacketPayload" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) ((((C1 (MetaCons "SigCreationTime" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ThirtyTwoBitTimeStamp)) :+: (C1 (MetaCons "SigExpirationTime" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ThirtyTwoBitDuration)) :+: C1 (MetaCons "ExportableCertification" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Exportability)))) :+: (C1 (MetaCons "TrustSignature" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 TrustLevel) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 TrustAmount)) :+: (C1 (MetaCons "RegularExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 AlmostPublicDomainRegex)) :+: C1 (MetaCons "Revocable" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Revocability))))) :+: ((C1 (MetaCons "KeyExpirationTime" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ThirtyTwoBitDuration)) :+: (C1 (MetaCons "PreferredSymmetricAlgorithms" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [SymmetricAlgorithm])) :+: C1 (MetaCons "RevocationKey" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Set RevocationClass)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PubKeyAlgorithm) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 TwentyOctetFingerprint))))) :+: ((C1 (MetaCons "Issuer" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 EightOctetKeyId)) :+: C1 (MetaCons "NotationData" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Set NotationFlag)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 NotationName) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 NotationValue)))) :+: (C1 (MetaCons "PreferredHashAlgorithms" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [HashAlgorithm])) :+: C1 (MetaCons "PreferredCompressionAlgorithms" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [CompressionAlgorithm])))))) :+: (((C1 (MetaCons "KeyServerPreferences" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Set KSPFlag))) :+: (C1 (MetaCons "PreferredKeyServer" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 KeyServer)) :+: C1 (MetaCons "PrimaryUserId" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Bool)))) :+: (C1 (MetaCons "PolicyURL" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 URL)) :+: (C1 (MetaCons "KeyFlags" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Set KeyFlag))) :+: C1 (MetaCons "SignersUserId" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text))))) :+: ((C1 (MetaCons "ReasonForRevocation" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 RevocationCode) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 RevocationReason)) :+: (C1 (MetaCons "Features" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Set FeatureFlag))) :+: C1 (MetaCons "SignatureTarget" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PubKeyAlgorithm) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 HashAlgorithm) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SignatureHash))))) :+: ((C1 (MetaCons "EmbeddedSignature" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SignaturePayload)) :+: C1 (MetaCons "IssuerFingerprint" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 TwentyOctetFingerprint))) :+: (C1 (MetaCons "UserDefinedSigSub" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)) :+: C1 (MetaCons "OtherSigSub" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)))))))

uc3 :: (a -> b -> c -> d) -> (a, b, c) -> d Source #

data SigSubPacket Source #

Instances
Eq SigSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data SigSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: SigSubPacket -> Constr #

dataTypeOf :: SigSubPacket -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SigSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic SigSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep SigSubPacket :: * -> * #

Hashable SigSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON SigSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON SigSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Binary SigSubPacket # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty SigSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: SigSubPacket -> Doc ann #

prettyList :: [SigSubPacket] -> Doc ann #

type Rep SigSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep SigSubPacket = D1 (MetaData "SigSubPacket" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) (C1 (MetaCons "SigSubPacket" PrefixI True) (S1 (MetaSel (Just "_sspCriticality") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Bool) :*: S1 (MetaSel (Just "_sspPayload") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SigSubPacketPayload)))

data KeyVersion Source #

Constructors

DeprecatedV3 
V4 
Instances
Eq KeyVersion Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data KeyVersion Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: KeyVersion -> Constr #

dataTypeOf :: KeyVersion -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord KeyVersion Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show KeyVersion Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic KeyVersion Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep KeyVersion :: * -> * #

Hashable KeyVersion Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON KeyVersion Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON KeyVersion Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty KeyVersion Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: KeyVersion -> Doc ann #

prettyList :: [KeyVersion] -> Doc ann #

type Rep KeyVersion Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep KeyVersion = D1 (MetaData "KeyVersion" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) (C1 (MetaCons "DeprecatedV3" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "V4" PrefixI False) (U1 :: * -> *))

newtype IV Source #

Constructors

IV 

Fields

Instances
Eq IV Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

Data IV Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: IV -> Constr #

dataTypeOf :: IV -> DataType #

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

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

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

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

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

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

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

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

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

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

Show IV Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

showsPrec :: Int -> IV -> ShowS #

show :: IV -> String #

showList :: [IV] -> ShowS #

Generic IV Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep IV :: * -> * #

Methods

from :: IV -> Rep IV x #

to :: Rep IV x -> IV #

Semigroup IV Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

sconcat :: NonEmpty IV -> IV #

stimes :: Integral b => b -> IV -> IV #

Monoid IV Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

mempty :: IV #

mappend :: IV -> IV -> IV #

mconcat :: [IV] -> IV #

Hashable IV Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

hashWithSalt :: Int -> IV -> Int #

hash :: IV -> Int #

ToJSON IV Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ByteArrayAccess IV Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

length :: IV -> Int #

withByteArray :: IV -> (Ptr p -> IO a) -> IO a #

copyByteArrayToPtr :: IV -> Ptr p -> IO () #

Pretty IV Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: IV -> Doc ann #

prettyList :: [IV] -> Doc ann #

Newtype IV ByteString Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pack :: ByteString -> IV #

unpack :: IV -> ByteString #

type Rep IV Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep IV = D1 (MetaData "IV" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "IV" PrefixI True) (S1 (MetaSel (Just "unIV") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)))

data DataType Source #

Instances
Eq DataType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data DataType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: DataType -> Constr #

dataTypeOf :: DataType -> DataType0 #

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

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

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

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

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

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

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

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

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

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

Ord DataType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show DataType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic DataType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep DataType :: * -> * #

Methods

from :: DataType -> Rep DataType x #

to :: Rep DataType x -> DataType #

Hashable DataType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

hashWithSalt :: Int -> DataType -> Int #

hash :: DataType -> Int #

ToJSON DataType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON DataType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty DataType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: DataType -> Doc ann #

prettyList :: [DataType] -> Doc ann #

FutureVal DataType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep DataType Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep DataType = D1 (MetaData "DataType" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) ((C1 (MetaCons "BinaryData" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "TextData" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "UTF8Data" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "OtherData" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8))))

newtype Salt Source #

Constructors

Salt 

Fields

Instances
Eq Salt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

(==) :: Salt -> Salt -> Bool #

(/=) :: Salt -> Salt -> Bool #

Data Salt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: Salt -> Constr #

dataTypeOf :: Salt -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Salt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

showsPrec :: Int -> Salt -> ShowS #

show :: Salt -> String #

showList :: [Salt] -> ShowS #

Generic Salt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep Salt :: * -> * #

Methods

from :: Salt -> Rep Salt x #

to :: Rep Salt x -> Salt #

Hashable Salt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

hashWithSalt :: Int -> Salt -> Int #

hash :: Salt -> Int #

ToJSON Salt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty Salt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: Salt -> Doc ann #

prettyList :: [Salt] -> Doc ann #

Newtype Salt ByteString Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep Salt Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep Salt = D1 (MetaData "Salt" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "Salt" PrefixI True) (S1 (MetaSel (Just "unSalt") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)))

newtype IterationCount Source #

Constructors

IterationCount 
Instances
Bounded IterationCount Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Enum IterationCount Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Eq IterationCount Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Integral IterationCount Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data IterationCount Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: IterationCount -> Constr #

dataTypeOf :: IterationCount -> DataType #

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

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

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

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

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

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

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

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

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

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

Num IterationCount Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Ord IterationCount Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Real IterationCount Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show IterationCount Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic IterationCount Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep IterationCount :: * -> * #

Hashable IterationCount Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON IterationCount Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON IterationCount Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty IterationCount Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: IterationCount -> Doc ann #

prettyList :: [IterationCount] -> Doc ann #

Newtype IterationCount Int Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep IterationCount Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep IterationCount = D1 (MetaData "IterationCount" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "IterationCount" PrefixI True) (S1 (MetaSel (Just "unIterationCount") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)))

data S2K Source #

Instances
Eq S2K Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

(==) :: S2K -> S2K -> Bool #

(/=) :: S2K -> S2K -> Bool #

Data S2K Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: S2K -> Constr #

dataTypeOf :: S2K -> DataType #

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

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

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

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

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

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

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

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

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

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

Show S2K Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

showsPrec :: Int -> S2K -> ShowS #

show :: S2K -> String #

showList :: [S2K] -> ShowS #

Generic S2K Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep S2K :: * -> * #

Methods

from :: S2K -> Rep S2K x #

to :: Rep S2K x -> S2K #

Hashable S2K Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

hashWithSalt :: Int -> S2K -> Int #

hash :: S2K -> Int #

ToJSON S2K Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Binary S2K # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Methods

put :: S2K -> Put #

get :: Get S2K #

putList :: [S2K] -> Put #

Pretty S2K Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: S2K -> Doc ann #

prettyList :: [S2K] -> Doc ann #

type Rep S2K Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

data ImageFormat Source #

Constructors

JPEG 
OtherImage Word8 
Instances
Eq ImageFormat Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data ImageFormat Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: ImageFormat -> Constr #

dataTypeOf :: ImageFormat -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ImageFormat Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show ImageFormat Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic ImageFormat Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep ImageFormat :: * -> * #

Hashable ImageFormat Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON ImageFormat Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON ImageFormat Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty ImageFormat Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: ImageFormat -> Doc ann #

prettyList :: [ImageFormat] -> Doc ann #

FutureVal ImageFormat Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep ImageFormat Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep ImageFormat = D1 (MetaData "ImageFormat" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) (C1 (MetaCons "JPEG" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "OtherImage" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8)))

newtype ImageHeader Source #

Constructors

ImageHV1 ImageFormat 
Instances
Eq ImageHeader Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data ImageHeader Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: ImageHeader -> Constr #

dataTypeOf :: ImageHeader -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ImageHeader Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show ImageHeader Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic ImageHeader Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep ImageHeader :: * -> * #

Hashable ImageHeader Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON ImageHeader Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

FromJSON ImageHeader Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Pretty ImageHeader Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: ImageHeader -> Doc ann #

prettyList :: [ImageHeader] -> Doc ann #

type Rep ImageHeader Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep ImageHeader = D1 (MetaData "ImageHeader" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" True) (C1 (MetaCons "ImageHV1" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ImageFormat)))

data UserAttrSubPacket Source #

Instances
Eq UserAttrSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data UserAttrSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: UserAttrSubPacket -> Constr #

dataTypeOf :: UserAttrSubPacket -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord UserAttrSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show UserAttrSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic UserAttrSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep UserAttrSubPacket :: * -> * #

Hashable UserAttrSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

ToJSON UserAttrSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Binary UserAttrSubPacket # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Pretty UserAttrSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep UserAttrSubPacket Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

data ECCCurve Source #

Instances
Eq ECCCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Data ECCCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

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

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

toConstr :: ECCCurve -> Constr #

dataTypeOf :: ECCCurve -> DataType #

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

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

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

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ECCCurve -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ECCCurve -> r #

gmapQ :: (forall d. Data d => d -> u) -> ECCCurve -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ECCCurve -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ECCCurve -> m ECCCurve #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ECCCurve -> m ECCCurve #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ECCCurve -> m ECCCurve #

Ord ECCCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Show ECCCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Generic ECCCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Associated Types

type Rep ECCCurve :: * -> * #

Methods

from :: ECCCurve -> Rep ECCCurve x #

to :: Rep ECCCurve x -> ECCCurve #

Hashable ECCCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

hashWithSalt :: Int -> ECCCurve -> Int #

hash :: ECCCurve -> Int #

Pretty ECCCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

pretty :: ECCCurve -> Doc ann #

prettyList :: [ECCCurve] -> Doc ann #

type Rep ECCCurve Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

type Rep ECCCurve = D1 (MetaData "ECCCurve" "Codec.Encryption.OpenPGP.Types.Internal.Base" "hOpenPGP-2.7.4.1-8lafjkG8JSBe6BupWajTv" False) ((C1 (MetaCons "NISTP256" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "NISTP384" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "NISTP521" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "Curve25519" PrefixI False) (U1 :: * -> *)))

newtype Block a Source #

Constructors

Block 

Fields

Instances
Eq a => Eq (Block a) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

(==) :: Block a -> Block a -> Bool #

(/=) :: Block a -> Block a -> Bool #

Show a => Show (Block a) Source # 
Instance details

Defined in Codec.Encryption.OpenPGP.Types.Internal.Base

Methods

showsPrec :: Int -> Block a -> ShowS #

show :: Block a -> String #

showList :: [Block a] -> ShowS #

Binary a => Binary (Block a) # 
Instance details

Defined in Codec.Encryption.OpenPGP.Serialize

Methods

put :: Block a -> Put #

get :: Get (Block a) #

putList :: [Block a] -> Put #