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

Codec.CBOR.Cuddle.CDDL.Postlude

Synopsis

Documentation

data PTerm Source #

CDDL predefines a number of names. This subsection summarizes these names, but please see Appendix D for the exact definitions.

The following keywords for primitive datatypes are defined:

"bool" Boolean value (major type 7, additional information 20 or 21).

"uint" An unsigned integer (major type 0).

"nint" A negative integer (major type 1).

"int" An unsigned integer or a negative integer.

"float16" A number representable as a half-precision float [IEEE754] (major type 7, additional information 25).

"float32" A number representable as a single-precision float [IEEE754] (major type 7, additional information 26).

"float64" A number representable as a double-precision float [IEEE754] (major type 7, additional information 27).

"float" One of float16, float32, or float64.

"bstr" or "bytes" A byte string (major type 2).

"tstr" or "text" Text string (major type 3).

(Note that there are no predefined names for arrays or maps; these are defined with the syntax given below.)

Instances

Instances details
Generic PTerm Source # 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL.Postlude

Associated Types

type Rep PTerm 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL.Postlude

type Rep PTerm = D1 ('MetaData "PTerm" "Codec.CBOR.Cuddle.CDDL.Postlude" "cuddle-0.5.0.0-H0bbRBZdSvH43WSgb38tp7" 'False) (((C1 ('MetaCons "PTBool" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PTUInt" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PTNInt" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "PTInt" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PTHalf" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PTFloat" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "PTDouble" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PTBytes" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PTText" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "PTAny" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PTNil" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PTUndefined" 'PrefixI 'False) (U1 :: Type -> Type)))))

Methods

from :: PTerm -> Rep PTerm x #

to :: Rep PTerm x -> PTerm #

Show PTerm Source # 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL.Postlude

Methods

showsPrec :: Int -> PTerm -> ShowS #

show :: PTerm -> String #

showList :: [PTerm] -> ShowS #

Eq PTerm Source # 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL.Postlude

Methods

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

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

Ord PTerm Source # 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL.Postlude

Methods

compare :: PTerm -> PTerm -> Ordering #

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

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

(>) :: PTerm -> PTerm -> Bool #

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

max :: PTerm -> PTerm -> PTerm #

min :: PTerm -> PTerm -> PTerm #

Hashable PTerm Source # 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL.Postlude

Methods

hashWithSalt :: Int -> PTerm -> Int #

hash :: PTerm -> Int #

type Rep PTerm Source # 
Instance details

Defined in Codec.CBOR.Cuddle.CDDL.Postlude

type Rep PTerm = D1 ('MetaData "PTerm" "Codec.CBOR.Cuddle.CDDL.Postlude" "cuddle-0.5.0.0-H0bbRBZdSvH43WSgb38tp7" 'False) (((C1 ('MetaCons "PTBool" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PTUInt" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PTNInt" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "PTInt" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PTHalf" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PTFloat" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "PTDouble" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PTBytes" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PTText" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "PTAny" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PTNil" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PTUndefined" 'PrefixI 'False) (U1 :: Type -> Type)))))