cuddle-0.5.0.0: CDDL Generator and test utilities
Safe HaskellNone
LanguageGHC2021

Codec.CBOR.Cuddle.CDDL.CtlOp

Synopsis

Documentation

data CtlOp Source #

A _control_ allows relating a _target_ type with a _controller_ type via a _control operator_.

Constructors

Size 
Bits 
Regexp 
Cbor 
Cborseq 
Within 
And 
Lt 
Le 
Gt 
Ge 
Eq 
Ne 
Default 

Instances

Instances details
Generic CtlOp Source # 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL.CtlOp

Associated Types

type Rep CtlOp 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL.CtlOp

type Rep CtlOp = D1 ('MetaData "CtlOp" "Codec.CBOR.Cuddle.CDDL.CtlOp" "cuddle-0.5.0.0-H0bbRBZdSvH43WSgb38tp7" 'False) (((C1 ('MetaCons "Size" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Bits" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Regexp" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Cbor" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Cborseq" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Within" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "And" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "Lt" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Le" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Gt" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Ge" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Eq" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Ne" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Default" 'PrefixI 'False) (U1 :: Type -> Type)))))

Methods

from :: CtlOp -> Rep CtlOp x #

to :: Rep CtlOp x -> CtlOp #

Show CtlOp Source # 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL.CtlOp

Methods

showsPrec :: Int -> CtlOp -> ShowS #

show :: CtlOp -> String #

showList :: [CtlOp] -> ShowS #

Eq CtlOp Source # 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL.CtlOp

Methods

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

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

Hashable CtlOp Source # 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL.CtlOp

Methods

hashWithSalt :: Int -> CtlOp -> Int #

hash :: CtlOp -> Int #

Pretty CtlOp Source # 
Instance details

Defined in Codec.CBOR.Cuddle.Pretty

Methods

pretty :: CtlOp -> Doc ann #

prettyList :: [CtlOp] -> Doc ann #

ToExpr CtlOp Source # 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL.CtlOp

Methods

toExpr :: CtlOp -> Expr #

listToExpr :: [CtlOp] -> Expr #

type Rep CtlOp Source # 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL.CtlOp

type Rep CtlOp = D1 ('MetaData "CtlOp" "Codec.CBOR.Cuddle.CDDL.CtlOp" "cuddle-0.5.0.0-H0bbRBZdSvH43WSgb38tp7" 'False) (((C1 ('MetaCons "Size" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Bits" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Regexp" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Cbor" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Cborseq" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Within" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "And" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "Lt" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Le" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Gt" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Ge" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Eq" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Ne" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Default" 'PrefixI 'False) (U1 :: Type -> Type)))))