describe-0.4.0.1: Combinators for describing binary data structures

Safe HaskellNone
LanguageHaskell2010

Data.Serialize.Describe.Combinators.Const

Synopsis

Documentation

data Const (n :: Nat) t Source #

A type level wrapper around the equivalent of the pure . const descriptor forall KnownNat.

Constructors

Const 
Instances
KnownNat n => Show (Const n t) Source # 
Instance details

Defined in Data.Serialize.Describe.Combinators.Const

Methods

showsPrec :: Int -> Const n t -> ShowS #

show :: Const n t -> String #

showList :: [Const n t] -> ShowS #

(KnownNat n, Describe t, Integral t) => Describe (Const n t) Source # 
Instance details

Defined in Data.Serialize.Describe.Combinators.Const

Associated Types

type Context m (Const n t) :: Constraint Source #

Methods

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

Nullable (Const n a) Source # 
Instance details

Defined in Data.Serialize.Describe.Combinators.FList

Methods

nullVal :: Const n a Source #

type Context m (Const n t) Source # 
Instance details

Defined in Data.Serialize.Describe.Combinators.Const

type Context m (Const n t) = Context m t