| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Data.Serialize.Describe.Combinators.FList
Synopsis
- flist :: (MonadTrans m, forall x. Monad x => Monad (m x), Describe a, Nullable a, Context m a) => Int -> (s -> [a]) -> DescriptorM m s [a]
- newtype FList (n :: Nat) a = FList {
- unwrapFList :: [a]
- class Nullable a where
- nullVal :: a
Documentation
flist :: (MonadTrans m, forall x. Monad x => Monad (m x), Describe a, Nullable a, Context m a) => Int -> (s -> [a]) -> DescriptorM m s [a] Source #
A fixed-length list combinator, with similar semantics to FText. The list element must be Nullable, meaning that it must have default value that can be used for padding the list if need be.
newtype FList (n :: Nat) a Source #
A type level wrapper around flist.
Constructors
| FList | |
Fields
| |
Instances
| Show a => Show (FList n a) Source # | |
| (KnownNat n, Nullable a, Describe a) => Describe (FList n a) Source # | |
Defined in Data.Serialize.Describe.Combinators.FList Associated Types type Context m (FList n a) :: Constraint Source # | |
| type Context m (FList n a) Source # | |
Defined in Data.Serialize.Describe.Combinators.FList | |
class Nullable a where Source #
Instances
| Num n => Nullable n Source # | |
Defined in Data.Serialize.Describe.Combinators.FList | |
| Num n => Nullable (LE n) Source # | |
Defined in Data.Serialize.Describe.Combinators.FList | |
| Num n => Nullable (BE n) Source # | |
Defined in Data.Serialize.Describe.Combinators.FList | |
| Nullable (Const n a) Source # | |
Defined in Data.Serialize.Describe.Combinators.FList | |