bond-haskell-0.1.5.0: Runtime support for BOND serialization

Safe HaskellNone
LanguageHaskell2010

Data.Bond.Struct

Synopsis

Documentation

data Value Source #

Representation of bond serializable type used in runtime-schema operations.

Instances

Eq Value Source # 

Methods

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

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

Show Value Source # 

Methods

showsPrec :: Int -> Value -> ShowS #

show :: Value -> String #

showList :: [Value] -> ShowS #

Generic Value Source # 

Associated Types

type Rep Value :: * -> * #

Methods

from :: Value -> Rep Value x #

to :: Rep Value x -> Value #

NFData Value Source # 

Methods

rnf :: Value -> () #

type Rep Value Source # 
type Rep Value = D1 (MetaData "Value" "Data.Bond.Struct" "bond-haskell-0.1.5.0-5YZ4ohYlsGS7OUiNgWkBDp" False) ((:+:) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "BOOL" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Bool))) (C1 (MetaCons "INT8" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int8)))) ((:+:) (C1 (MetaCons "INT16" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int16))) (C1 (MetaCons "INT32" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int32))))) ((:+:) ((:+:) (C1 (MetaCons "INT64" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int64))) (C1 (MetaCons "UINT8" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word8)))) ((:+:) (C1 (MetaCons "UINT16" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word16))) ((:+:) (C1 (MetaCons "UINT32" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word32))) (C1 (MetaCons "UINT64" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word64))))))) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "FLOAT" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Float))) (C1 (MetaCons "DOUBLE" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Double)))) ((:+:) (C1 (MetaCons "STRING" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Utf8))) (C1 (MetaCons "WSTRING" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Utf16))))) ((:+:) ((:+:) (C1 (MetaCons "STRUCT" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Struct))) (C1 (MetaCons "LIST" PrefixI False) ((:*:) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 BondDataType)) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Value]))))) ((:+:) (C1 (MetaCons "SET" PrefixI False) ((:*:) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 BondDataType)) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Value])))) ((:+:) (C1 (MetaCons "MAP" PrefixI False) ((:*:) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 BondDataType)) ((:*:) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 BondDataType)) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [(Value, Value)]))))) (C1 (MetaCons "BONDED" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Bonded Struct)))))))))

data Struct Source #

Representation of bond structure used in runtime-schema operations.

Constructors

Struct 

Instances

Eq Struct Source # 

Methods

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

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

Show Struct Source # 
Generic Struct Source # 

Associated Types

type Rep Struct :: * -> * #

Methods

from :: Struct -> Rep Struct x #

to :: Rep Struct x -> Struct #

NFData Struct Source # 

Methods

rnf :: Struct -> () #

type Rep Struct Source # 
type Rep Struct = D1 (MetaData "Struct" "Data.Bond.Struct" "bond-haskell-0.1.5.0-5YZ4ohYlsGS7OUiNgWkBDp" False) (C1 (MetaCons "Struct" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "base") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Struct))) (S1 (MetaSel (Just Symbol "fields") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Map Ordinal Value)))))