msgpack-testsuite-0.1.0: A Haskell implementation of MessagePack
Safe HaskellTrustworthy
LanguageHaskell2010

Test.MessagePack.Spec

Documentation

data Unit Source #

Constructors

Unit 

Instances

Instances details
Eq Unit Source # 
Instance details

Defined in Test.MessagePack.Spec

Methods

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

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

Show Unit Source # 
Instance details

Defined in Test.MessagePack.Spec

Methods

showsPrec :: Int -> Unit -> ShowS #

show :: Unit -> String #

showList :: [Unit] -> ShowS #

Generic Unit Source # 
Instance details

Defined in Test.MessagePack.Spec

Associated Types

type Rep Unit :: Type -> Type #

Methods

from :: Unit -> Rep Unit x #

to :: Rep Unit x -> Unit #

MessagePack Unit Source # 
Instance details

Defined in Test.MessagePack.Spec

type Rep Unit Source # 
Instance details

Defined in Test.MessagePack.Spec

type Rep Unit = D1 ('MetaData "Unit" "Test.MessagePack.Spec" "msgpack-testsuite-0.1.0-inplace" 'False) (C1 ('MetaCons "Unit" 'PrefixI 'False) (U1 :: Type -> Type))

data TyConArgs Source #

Constructors

TyConArgs Int Int Int 

Instances

Instances details
Eq TyConArgs Source # 
Instance details

Defined in Test.MessagePack.Spec

Show TyConArgs Source # 
Instance details

Defined in Test.MessagePack.Spec

Generic TyConArgs Source # 
Instance details

Defined in Test.MessagePack.Spec

Associated Types

type Rep TyConArgs :: Type -> Type #

MessagePack TyConArgs Source # 
Instance details

Defined in Test.MessagePack.Spec

type Rep TyConArgs Source # 
Instance details

Defined in Test.MessagePack.Spec

data Record Source #

Constructors

Record 

Instances

Instances details
Eq Record Source # 
Instance details

Defined in Test.MessagePack.Spec

Methods

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

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

Show Record Source # 
Instance details

Defined in Test.MessagePack.Spec

Generic Record Source # 
Instance details

Defined in Test.MessagePack.Spec

Associated Types

type Rep Record :: Type -> Type #

Methods

from :: Record -> Rep Record x #

to :: Rep Record x -> Record #

MessagePack Record Source # 
Instance details

Defined in Test.MessagePack.Spec

type Rep Record Source # 
Instance details

Defined in Test.MessagePack.Spec

type Rep Record = D1 ('MetaData "Record" "Test.MessagePack.Spec" "msgpack-testsuite-0.1.0-inplace" 'False) (C1 ('MetaCons "Record" 'PrefixI 'True) (S1 ('MetaSel ('Just "recordField1") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int) :*: (S1 ('MetaSel ('Just "recordField2") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Double) :*: S1 ('MetaSel ('Just "recordField3") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 String))))

data Foo Source #

Constructors

Foo1 
Foo2 Int 
Foo3 Int 
Foo4 Int 
Foo5 Int 
Foo6 

Fields

Foo7 Int 
Foo8 Int Int 
Foo9 Int Int Int 

Instances

Instances details
Eq Foo Source # 
Instance details

Defined in Test.MessagePack.Spec

Methods

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

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

Show Foo Source # 
Instance details

Defined in Test.MessagePack.Spec

Methods

showsPrec :: Int -> Foo -> ShowS #

show :: Foo -> String #

showList :: [Foo] -> ShowS #

Generic Foo Source # 
Instance details

Defined in Test.MessagePack.Spec

Associated Types

type Rep Foo :: Type -> Type #

Methods

from :: Foo -> Rep Foo x #

to :: Rep Foo x -> Foo #

Arbitrary Foo Source # 
Instance details

Defined in Test.MessagePack.Spec

Methods

arbitrary :: Gen Foo #

shrink :: Foo -> [Foo] #

MessagePack Foo Source # 
Instance details

Defined in Test.MessagePack.Spec

type Rep Foo Source # 
Instance details

Defined in Test.MessagePack.Spec

type Rep Foo = D1 ('MetaData "Foo" "Test.MessagePack.Spec" "msgpack-testsuite-0.1.0-inplace" 'False) (((C1 ('MetaCons "Foo1" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Foo2" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int))) :+: (C1 ('MetaCons "Foo3" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int)) :+: C1 ('MetaCons "Foo4" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int)))) :+: ((C1 ('MetaCons "Foo5" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int)) :+: C1 ('MetaCons "Foo6" 'PrefixI 'True) (S1 ('MetaSel ('Just "unFoo3") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int))) :+: (C1 ('MetaCons "Foo7" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int)) :+: (C1 ('MetaCons "Foo8" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int)) :+: C1 ('MetaCons "Foo9" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int)))))))

spec :: BytePacker p => p -> Spec Source #