Safe Haskell | Trustworthy |
---|---|
Language | Haskell2010 |
Documentation
Instances
Eq TyConArgs Source # | |
Show TyConArgs Source # | |
Generic TyConArgs Source # | |
MessagePack TyConArgs Source # | |
Defined in Test.MessagePack.Spec toObject :: Config -> TyConArgs -> Object # fromObjectWith :: (Applicative m, Monad m, MonadValidate DecodeError m) => Config -> Object -> m TyConArgs # | |
type Rep TyConArgs Source # | |
Defined in Test.MessagePack.Spec type Rep TyConArgs = D1 ('MetaData "TyConArgs" "Test.MessagePack.Spec" "msgpack-testsuite-0.0.15-inplace" 'False) (C1 ('MetaCons "TyConArgs" '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)))) |
Record | |
|
Instances
Eq Record Source # | |
Show Record Source # | |
Generic Record Source # | |
MessagePack Record Source # | |
Defined in Test.MessagePack.Spec toObject :: Config -> Record -> Object # fromObjectWith :: (Applicative m, Monad m, MonadValidate DecodeError m) => Config -> Object -> m Record # | |
type Rep Record Source # | |
Defined in Test.MessagePack.Spec type Rep Record = D1 ('MetaData "Record" "Test.MessagePack.Spec" "msgpack-testsuite-0.0.15-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)))) |
Instances
type UnpackResult a = Either DecodeError a Source #
checkMessage :: Show a => UnpackResult a -> Expectation Source #
spec :: BytePacker p => p -> Spec Source #
Orphan instances
Arbitrary ByteString Source # | |
arbitrary :: Gen ByteString # shrink :: ByteString -> [ByteString] # | |
Arbitrary ByteString Source # | |
arbitrary :: Gen ByteString # shrink :: ByteString -> [ByteString] # | |
Arbitrary Text Source # | |
(Arbitrary a, Unbox a) => Arbitrary (Vector a) Source # | |
(Arbitrary a, Storable a) => Arbitrary (Vector a) Source # | |
Arbitrary a => Arbitrary (Vector a) Source # | |
(Hashable k, Ord k, Eq k, Arbitrary k, Arbitrary v) => Arbitrary (HashMap k v) Source # | |