chiasma-0.10.1.0: A tmux client for Polysemy
Safe HaskellSafe-Inferred
LanguageGHC2021

Chiasma.Interpreter.TmuxApi

Documentation

type family (f :: l -> k) <$> (fa :: [l]) :: [k] where ... Source #

Equations

f <$> fa = FMap (Pure1 f) @@ fa 

interpretTmuxApi :: forall command i o err r. Members [TmuxClient i o, Codec command i o !! err] r => InterpreterFor (TmuxApi command !! err) r Source #

data TmuxApiEffect :: Type -> (Type -> Type) -> Exp Effect Source #

Instances

Instances details
type Eval (TmuxApiEffect err command :: Effect -> Type) Source # 
Instance details

Defined in Chiasma.Interpreter.TmuxApi

type Eval (TmuxApiEffect err command :: Effect -> Type) = TmuxApi command !! err

type family TmuxApis (commands :: [Type -> Type]) (err :: Type) :: EffectRow where ... Source #

Equations

TmuxApis commands err = FMap (TmuxApiEffect err) @@ commands 

class InterpretApis (commands :: [Type -> Type]) err i o r where Source #

Methods

interpretApis :: InterpretersFor (TmuxApis commands err) (TmuxClient i o : r) Source #

Instances

Instances details
InterpretApis ('[] :: [Type -> Type]) err i o r Source # 
Instance details

Defined in Chiasma.Interpreter.TmuxApi

Methods

interpretApis :: InterpretersFor (TmuxApis '[] err) (TmuxClient i o ': r) Source #

(r1 ~ (TmuxApis commands err ++ (TmuxClient i o ': r)), Member (TmuxClient i o) r1, Member (Codec command i o !! err) r1, InterpretApis commands err i o r) => InterpretApis (command ': commands) err i o r Source # 
Instance details

Defined in Chiasma.Interpreter.TmuxApi

Methods

interpretApis :: InterpretersFor (TmuxApis (command ': commands) err) (TmuxClient i o ': r) Source #

class RestopApis (commands :: [Type -> Type]) err i o r where Source #

Methods

restopApis :: InterpretersFor (TmuxApi <$> commands) (TmuxClient i o : r) Source #

Instances

Instances details
RestopApis ('[] :: [Type -> Type]) (err :: k) i o r Source # 
Instance details

Defined in Chiasma.Interpreter.TmuxApi

(r1 ~ ((TmuxApi <$> commands) ++ (TmuxClient i o ': r)), Members '[TmuxClient i o, Stop err] r1, Member (Codec command i o !! err) r1, RestopApis commands err i o r) => RestopApis (command ': commands) (err :: Type) i o r Source # 
Instance details

Defined in Chiasma.Interpreter.TmuxApi

Methods

restopApis :: InterpretersFor (TmuxApi <$> (command ': commands)) (TmuxClient i o ': r) Source #