asn1-codec-0.1.0: Encode and decode ASN.1

Safe HaskellNone
LanguageHaskell2010

Language.Asn.Types.Internal

Documentation

newtype Subtypes a Source #

Constructors

Subtypes 

Fields

Instances

newtype ObjectIdentifier Source #

Instances

Eq ObjectIdentifier Source # 
Ord ObjectIdentifier Source # 
Read ObjectIdentifier Source # 
Show ObjectIdentifier Source # 
Generic ObjectIdentifier Source # 
Hashable ObjectIdentifier Source # 
type Rep ObjectIdentifier Source # 
type Rep ObjectIdentifier = D1 (MetaData "ObjectIdentifier" "Language.Asn.Types.Internal" "asn1-codec-0.1.0-7rIq478WJPVBr12Jb1pAeL" True) (C1 (MetaCons "ObjectIdentifier" PrefixI True) (S1 (MetaSel (Just Symbol "getObjectIdentifier") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Vector Integer))))

newtype ObjectIdentifierSuffix Source #

Instances

Eq ObjectIdentifierSuffix Source # 
Ord ObjectIdentifierSuffix Source # 
Read ObjectIdentifierSuffix Source # 
Show ObjectIdentifierSuffix Source # 
Generic ObjectIdentifierSuffix Source # 
Hashable ObjectIdentifierSuffix Source # 
type Rep ObjectIdentifierSuffix Source # 
type Rep ObjectIdentifierSuffix = D1 (MetaData "ObjectIdentifierSuffix" "Language.Asn.Types.Internal" "asn1-codec-0.1.0-7rIq478WJPVBr12Jb1pAeL" True) (C1 (MetaCons "ObjectIdentifierSuffix" PrefixI True) (S1 (MetaSel (Just Symbol "getObjectIdentifierSuffix") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Vector Integer))))

data Choice a Source #

Constructors

Choice (a -> b) [b] (b -> ValueAndEncoding) 

Instances

Contravariant Choice Source # 

Methods

contramap :: (a -> b) -> Choice b -> Choice a #

(>$) :: b -> Choice b -> Choice a #

data Field a Source #

Constructors

FieldRequired FieldName (a -> b) (AsnEncoding b) 
FieldOptional FieldName (a -> Maybe b) (AsnEncoding b) 
FieldDefaulted FieldName (a -> b) b (b -> String) (b -> b -> Bool) (AsnEncoding b) 

Instances

Contravariant Field Source # 

Methods

contramap :: (a -> b) -> Field b -> Field a #

(>$) :: b -> Field b -> Field a #

newtype FieldName Source #

Constructors

FieldName 

Fields

newtype OptionName Source #

Constructors

OptionName 

data Tag Source #

Constructors

Tag 

Instances

Eq Tag Source # 

Methods

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

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

Num Tag Source # 

Methods

(+) :: Tag -> Tag -> Tag #

(-) :: Tag -> Tag -> Tag #

(*) :: Tag -> Tag -> Tag #

negate :: Tag -> Tag #

abs :: Tag -> Tag #

signum :: Tag -> Tag #

fromInteger :: Integer -> Tag #

Show Tag Source # 

Methods

showsPrec :: Int -> Tag -> ShowS #

show :: Tag -> String #

showList :: [Tag] -> ShowS #

data Ap f a where Source #

Constructors

Pure :: a -> Ap f a 
Ap :: f a -> Ap f (a -> b) -> Ap f b 

Instances

Functor (Ap f) Source # 

Methods

fmap :: (a -> b) -> Ap f a -> Ap f b #

(<$) :: a -> Ap f b -> Ap f a #

Applicative (Ap f) Source # 

Methods

pure :: a -> Ap f a #

(<*>) :: Ap f (a -> b) -> Ap f a -> Ap f b #

(*>) :: Ap f a -> Ap f b -> Ap f b #

(<*) :: Ap f a -> Ap f b -> Ap f a #

newtype DecodePart a Source #

Constructors

DecodePart 

Instances

runAp :: Applicative g => (forall x. f x -> g x) -> Ap f a -> g a Source #

liftAp :: f a -> Ap f a Source #