strongweak-0.1.0: Convert between strong and weak representations of types
Safe HaskellSafe-Inferred
LanguageHaskell2010

Strongweak.Example

Documentation

data Ex1D (s :: Strength) Source #

Constructors

Ex1C 

Fields

Instances

Instances details
Generic (Ex1D s) Source # 
Instance details

Defined in Strongweak.Example

Associated Types

type Rep (Ex1D s) :: Type -> Type #

Methods

from :: Ex1D s -> Rep (Ex1D s) x #

to :: Rep (Ex1D s) x -> Ex1D s #

Show (Ex1D 'Strong) Source # 
Instance details

Defined in Strongweak.Example

Show (Ex1D 'Weak) Source # 
Instance details

Defined in Strongweak.Example

Methods

showsPrec :: Int -> Ex1D 'Weak -> ShowS #

show :: Ex1D 'Weak -> String #

showList :: [Ex1D 'Weak] -> ShowS #

Strengthen (Ex1D 'Weak) (Ex1D 'Strong) Source # 
Instance details

Defined in Strongweak.Example

Weaken (Ex1D 'Strong) (Ex1D 'Weak) Source # 
Instance details

Defined in Strongweak.Example

Methods

weaken :: Ex1D 'Strong -> Ex1D 'Weak Source #

type Rep (Ex1D s) Source # 
Instance details

Defined in Strongweak.Example

type Rep (Ex1D s) = D1 ('MetaData "Ex1D" "Strongweak.Example" "strongweak-0.1.0-inplace" 'False) (C1 ('MetaCons "Ex1C" 'PrefixI 'True) (S1 ('MetaSel ('Just "ex1f1") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SW s Word8)) :*: S1 ('MetaSel ('Just "ex1f2") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SW s (Refined (LessThan 100) Natural)))))

data Ex2D (s :: Strength) Source #

Constructors

Ex2C 

Fields

Instances

Instances details
Generic (Ex2D s) Source # 
Instance details

Defined in Strongweak.Example

Associated Types

type Rep (Ex2D s) :: Type -> Type #

Methods

from :: Ex2D s -> Rep (Ex2D s) x #

to :: Rep (Ex2D s) x -> Ex2D s #

Show (Ex2D 'Strong) Source # 
Instance details

Defined in Strongweak.Example

Show (Ex2D 'Weak) Source # 
Instance details

Defined in Strongweak.Example

Methods

showsPrec :: Int -> Ex2D 'Weak -> ShowS #

show :: Ex2D 'Weak -> String #

showList :: [Ex2D 'Weak] -> ShowS #

Strengthen (Ex2D 'Weak) (Ex2D 'Strong) Source # 
Instance details

Defined in Strongweak.Example

Weaken (Ex2D 'Strong) (Ex2D 'Weak) Source # 
Instance details

Defined in Strongweak.Example

Methods

weaken :: Ex2D 'Strong -> Ex2D 'Weak Source #

type Rep (Ex2D s) Source # 
Instance details

Defined in Strongweak.Example

type Rep (Ex2D s) = D1 ('MetaData "Ex2D" "Strongweak.Example" "strongweak-0.1.0-inplace" 'False) (C1 ('MetaCons "Ex2C" 'PrefixI 'True) (S1 ('MetaSel ('Just "ex2f1") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ex1D s)) :*: S1 ('MetaSel ('Just "ex2f2") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SW s Word8))))

data ExVoid (s :: Strength) Source #

Instances

Instances details
Generic (ExVoid s) Source # 
Instance details

Defined in Strongweak.Example

Associated Types

type Rep (ExVoid s) :: Type -> Type #

Methods

from :: ExVoid s -> Rep (ExVoid s) x #

to :: Rep (ExVoid s) x -> ExVoid s #

Strengthen (ExVoid 'Weak) (ExVoid 'Strong) Source # 
Instance details

Defined in Strongweak.Example

Weaken (ExVoid 'Strong) (ExVoid 'Weak) Source # 
Instance details

Defined in Strongweak.Example

type Rep (ExVoid s) Source # 
Instance details

Defined in Strongweak.Example

type Rep (ExVoid s) = D1 ('MetaData "ExVoid" "Strongweak.Example" "strongweak-0.1.0-inplace" 'False) (V1 :: Type -> Type)

data ExUnit (s :: Strength) Source #

Constructors

ExUnit 

Instances

Instances details
Generic (ExUnit s) Source # 
Instance details

Defined in Strongweak.Example

Associated Types

type Rep (ExUnit s) :: Type -> Type #

Methods

from :: ExUnit s -> Rep (ExUnit s) x #

to :: Rep (ExUnit s) x -> ExUnit s #

Strengthen (ExUnit 'Weak) (ExUnit 'Strong) Source # 
Instance details

Defined in Strongweak.Example

Weaken (ExUnit 'Strong) (ExUnit 'Weak) Source # 
Instance details

Defined in Strongweak.Example

type Rep (ExUnit s) Source # 
Instance details

Defined in Strongweak.Example

type Rep (ExUnit s) = D1 ('MetaData "ExUnit" "Strongweak.Example" "strongweak-0.1.0-inplace" 'False) (C1 ('MetaCons "ExUnit" 'PrefixI 'False) (U1 :: Type -> Type))