typed-session-state-algorithm-0.3.0.1: Automatically generate status for typed-session.
Safe HaskellNone
LanguageHaskell2010

TypedSession.State.Render

Documentation

data RenderProt Source #

Instances

Instances details
type XBranch RenderProt Source # 
Instance details

Defined in TypedSession.State.Render

type XBranchSt RenderProt Source # 
Instance details

Defined in TypedSession.State.Render

type XGoto RenderProt Source # 
Instance details

Defined in TypedSession.State.Render

type XLabel RenderProt Source # 
Instance details

Defined in TypedSession.State.Render

type XMsg RenderProt Source # 
Instance details

Defined in TypedSession.State.Render

type XTerminal RenderProt Source # 
Instance details

Defined in TypedSession.State.Render

newtype LV Source #

Constructors

LV Int 

Instances

Instances details
Bounded LV Source # 
Instance details

Defined in TypedSession.State.Render

Methods

minBound :: LV #

maxBound :: LV #

Num LV Source # 
Instance details

Defined in TypedSession.State.Render

Methods

(+) :: LV -> LV -> LV #

(-) :: LV -> LV -> LV #

(*) :: LV -> LV -> LV #

negate :: LV -> LV #

abs :: LV -> LV #

signum :: LV -> LV #

fromInteger :: Integer -> LV #

Show LV Source # 
Instance details

Defined in TypedSession.State.Render

Methods

showsPrec :: Int -> LV -> ShowS #

show :: LV -> String #

showList :: [LV] -> ShowS #

Eq LV Source # 
Instance details

Defined in TypedSession.State.Render

Methods

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

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

Ord LV Source # 
Instance details

Defined in TypedSession.State.Render

Methods

compare :: LV -> LV -> Ordering #

(<) :: LV -> LV -> Bool #

(<=) :: LV -> LV -> Bool #

(>) :: LV -> LV -> Bool #

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

max :: LV -> LV -> LV #

min :: LV -> LV -> LV #

newtype RV Source #

Constructors

RV Int 

Instances

Instances details
Bounded RV Source # 
Instance details

Defined in TypedSession.State.Render

Methods

minBound :: RV #

maxBound :: RV #

Num RV Source # 
Instance details

Defined in TypedSession.State.Render

Methods

(+) :: RV -> RV -> RV #

(-) :: RV -> RV -> RV #

(*) :: RV -> RV -> RV #

negate :: RV -> RV #

abs :: RV -> RV #

signum :: RV -> RV #

fromInteger :: Integer -> RV #

Show RV Source # 
Instance details

Defined in TypedSession.State.Render

Methods

showsPrec :: Int -> RV -> ShowS #

show :: RV -> String #

showList :: [RV] -> ShowS #

Eq RV Source # 
Instance details

Defined in TypedSession.State.Render

Methods

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

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

Ord RV Source # 
Instance details

Defined in TypedSession.State.Render

Methods

compare :: RV -> RV -> Ordering #

(<) :: RV -> RV -> Bool #

(<=) :: RV -> RV -> Bool #

(>) :: RV -> RV -> Bool #

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

max :: RV -> RV -> RV #

min :: RV -> RV -> RV #

mkLeftStr :: forall (sig :: (Type -> Type) -> Type -> Type) m. Has (State Int :+: Writer (Max LV)) sig m => String -> m String Source #

render1XTraverse :: forall r bst (sig :: (Type -> Type) -> Type -> Type) m. (Has (State Int :+: (Writer (Max LV) :+: Writer (Max RV))) sig m, Show bst, Enum r, Bounded r, Eq r, Ord r, Show r) => XTraverse m (MsgT r bst) RenderProt r bst Source #

mkLine :: forall r (sig :: (Type -> Type) -> Type -> Type) m. (Has (Reader (LV, RV) :+: Writer [String]) sig m, Enum r, Bounded r) => (String, [String]) -> m () Source #

render2XTraverse :: forall r bst (sig :: (Type -> Type) -> Type -> Type) m. (Has (Reader (LV, RV) :+: Writer [String]) sig m, Enum r, Bounded r) => XFold m RenderProt r bst Source #

runRender1 :: (Enum r, Bounded r, Ord r, Show bst, Show r) => Protocol (MsgT r bst) r bst -> (Max LV, (Max RV, (Int, Protocol RenderProt r bst))) Source #

runRender :: (Enum r, Bounded r, Ord r, Show bst, Show r) => Protocol (MsgT r bst) r bst -> String Source #