describe-0.4.0.5: Combinators for describing binary data structures

Safe HaskellNone
LanguageHaskell2010

Data.Serialize.Describe.Combinators.LPList

Synopsis

Documentation

newtype LPList t a Source #

A type level wrapper around a length-prefixed list combinator. The parameter t is the integral descriptor to encode the length in.

Constructors

LPList 

Fields

Instances
Show a => Show (LPList t a) Source # 
Instance details

Defined in Data.Serialize.Describe.Combinators.LPList

Methods

showsPrec :: Int -> LPList t a -> ShowS #

show :: LPList t a -> String #

showList :: [LPList t a] -> ShowS #

(Describe t, Describe a, Integral t) => Describe (LPList t a) Source # 
Instance details

Defined in Data.Serialize.Describe.Combinators.LPList

Associated Types

type Context m (LPList t a) :: Constraint Source #

Methods

describe :: (MonadTrans m, forall (x :: Type -> Type). Monad x => Monad (m x), Context m (LPList t a)) => DescriptorM m (LPList t a) (LPList t a) Source #

type Context m (LPList t a) Source # 
Instance details

Defined in Data.Serialize.Describe.Combinators.LPList

type Context m (LPList t a) = (Context m a, Context m t)