binrep-0.3.0: Encode precise binary representations directly in types
Safe HaskellSafe-Inferred
LanguageHaskell2010

Binrep.Example

Documentation

data DV Source #

Instances

Instances details
Data DV Source # 
Instance details

Defined in Binrep.Example

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DV -> c DV #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DV #

toConstr :: DV -> Constr #

dataTypeOf :: DV -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DV) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DV) #

gmapT :: (forall b. Data b => b -> b) -> DV -> DV #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DV -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DV -> r #

gmapQ :: (forall d. Data d => d -> u) -> DV -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DV -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DV -> m DV #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DV -> m DV #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DV -> m DV #

Generic DV Source # 
Instance details

Defined in Binrep.Example

Associated Types

type Rep DV :: Type -> Type #

Methods

from :: DV -> Rep DV x #

to :: Rep DV x -> DV #

type Rep DV Source # 
Instance details

Defined in Binrep.Example

type Rep DV = D1 ('MetaData "DV" "Binrep.Example" "binrep-0.3.0-inplace" 'False) (V1 :: Type -> Type)

data DU Source #

Constructors

DU 

Instances

Instances details
Data DU Source # 
Instance details

Defined in Binrep.Example

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DU -> c DU #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DU #

toConstr :: DU -> Constr #

dataTypeOf :: DU -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DU) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DU) #

gmapT :: (forall b. Data b => b -> b) -> DU -> DU #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DU -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DU -> r #

gmapQ :: (forall d. Data d => d -> u) -> DU -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DU -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DU -> m DU #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DU -> m DU #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DU -> m DU #

Generic DU Source # 
Instance details

Defined in Binrep.Example

Associated Types

type Rep DU :: Type -> Type #

Methods

from :: DU -> Rep DU x #

to :: Rep DU x -> DU #

Show DU Source # 
Instance details

Defined in Binrep.Example

Methods

showsPrec :: Int -> DU -> ShowS #

show :: DU -> String #

showList :: [DU] -> ShowS #

BLen DU Source # 
Instance details

Defined in Binrep.Example

Associated Types

type CBLen DU :: Natural Source #

Methods

blen :: DU -> BLenT Source #

Get DU Source # 
Instance details

Defined in Binrep.Example

Methods

get :: Getter DU Source #

Put DU Source # 
Instance details

Defined in Binrep.Example

Methods

put :: DU -> Builder Source #

Eq DU Source # 
Instance details

Defined in Binrep.Example

Methods

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

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

type Rep DU Source # 
Instance details

Defined in Binrep.Example

type Rep DU = D1 ('MetaData "DU" "Binrep.Example" "binrep-0.3.0-inplace" 'False) (C1 ('MetaCons "DU" 'PrefixI 'False) (U1 :: Type -> Type))
type CBLen DU Source # 
Instance details

Defined in Binrep.Example

data DSS Source #

Constructors

DSS 

Fields

Instances

Instances details
Data DSS Source # 
Instance details

Defined in Binrep.Example

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DSS -> c DSS #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DSS #

toConstr :: DSS -> Constr #

dataTypeOf :: DSS -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DSS) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DSS) #

gmapT :: (forall b. Data b => b -> b) -> DSS -> DSS #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DSS -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DSS -> r #

gmapQ :: (forall d. Data d => d -> u) -> DSS -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DSS -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DSS -> m DSS #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DSS -> m DSS #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DSS -> m DSS #

Generic DSS Source # 
Instance details

Defined in Binrep.Example

Associated Types

type Rep DSS :: Type -> Type #

Methods

from :: DSS -> Rep DSS x #

to :: Rep DSS x -> DSS #

Show DSS Source # 
Instance details

Defined in Binrep.Example

Methods

showsPrec :: Int -> DSS -> ShowS #

show :: DSS -> String #

showList :: [DSS] -> ShowS #

BLen DSS Source # 
Instance details

Defined in Binrep.Example

Associated Types

type CBLen DSS :: Natural Source #

Methods

blen :: DSS -> BLenT Source #

Get DSS Source # 
Instance details

Defined in Binrep.Example

Methods

get :: Getter DSS Source #

Put DSS Source # 
Instance details

Defined in Binrep.Example

Methods

put :: DSS -> Builder Source #

Eq DSS Source # 
Instance details

Defined in Binrep.Example

Methods

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

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

type Rep DSS Source # 
Instance details

Defined in Binrep.Example

type CBLen DSS Source # 
Instance details

Defined in Binrep.Example

type CBLen DSS = TypeError ('Text "No CBLen associated family instance defined for " :<>: 'ShowType DSS) :: Natural

data DCS Source #

Constructors

DCS1 
DCS2 
DCS3 
DCS4 
DCS5 

Instances

Instances details
Data DCS Source # 
Instance details

Defined in Binrep.Example

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DCS -> c DCS #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DCS #

toConstr :: DCS -> Constr #

dataTypeOf :: DCS -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DCS) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DCS) #

gmapT :: (forall b. Data b => b -> b) -> DCS -> DCS #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DCS -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DCS -> r #

gmapQ :: (forall d. Data d => d -> u) -> DCS -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DCS -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DCS -> m DCS #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DCS -> m DCS #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DCS -> m DCS #

Generic DCS Source # 
Instance details

Defined in Binrep.Example

Associated Types

type Rep DCS :: Type -> Type #

Methods

from :: DCS -> Rep DCS x #

to :: Rep DCS x -> DCS #

Show DCS Source # 
Instance details

Defined in Binrep.Example

Methods

showsPrec :: Int -> DCS -> ShowS #

show :: DCS -> String #

showList :: [DCS] -> ShowS #

BLen DCS Source # 
Instance details

Defined in Binrep.Example

Associated Types

type CBLen DCS :: Natural Source #

Methods

blen :: DCS -> BLenT Source #

Get DCS Source # 
Instance details

Defined in Binrep.Example

Methods

get :: Getter DCS Source #

Put DCS Source # 
Instance details

Defined in Binrep.Example

Methods

put :: DCS -> Builder Source #

Eq DCS Source # 
Instance details

Defined in Binrep.Example

Methods

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

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

type Rep DCS Source # 
Instance details

Defined in Binrep.Example

type Rep DCS = D1 ('MetaData "DCS" "Binrep.Example" "binrep-0.3.0-inplace" 'False) ((C1 ('MetaCons "DCS1" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DCS2" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "DCS3" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "DCS4" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DCS5" 'PrefixI 'False) (U1 :: Type -> Type))))
type CBLen DCS Source # 
Instance details

Defined in Binrep.Example

type BrSumDCS = I 'U 'I1 'LE Source #

data DX Source #

Constructors

DX DU 

Instances

Instances details
Data DX Source # 
Instance details

Defined in Binrep.Example

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DX -> c DX #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DX #

toConstr :: DX -> Constr #

dataTypeOf :: DX -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DX) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DX) #

gmapT :: (forall b. Data b => b -> b) -> DX -> DX #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DX -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DX -> r #

gmapQ :: (forall d. Data d => d -> u) -> DX -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DX -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DX -> m DX #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DX -> m DX #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DX -> m DX #

Generic DX Source # 
Instance details

Defined in Binrep.Example

Associated Types

type Rep DX :: Type -> Type #

Methods

from :: DX -> Rep DX x #

to :: Rep DX x -> DX #

Show DX Source # 
Instance details

Defined in Binrep.Example

Methods

showsPrec :: Int -> DX -> ShowS #

show :: DX -> String #

showList :: [DX] -> ShowS #

BLen DX Source # 
Instance details

Defined in Binrep.Example

Associated Types

type CBLen DX :: Natural Source #

Methods

blen :: DX -> BLenT Source #

Get DX Source # 
Instance details

Defined in Binrep.Example

Methods

get :: Getter DX Source #

Put DX Source # 
Instance details

Defined in Binrep.Example

Methods

put :: DX -> Builder Source #

Eq DX Source # 
Instance details

Defined in Binrep.Example

Methods

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

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

type Rep DX Source # 
Instance details

Defined in Binrep.Example

type Rep DX = D1 ('MetaData "DX" "Binrep.Example" "binrep-0.3.0-inplace" 'False) (C1 ('MetaCons "DX" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DU)))
type CBLen DX Source # 
Instance details

Defined in Binrep.Example