mpv-0.1.0.0: Mpv Client for Polysemy
Safe HaskellSafe-Inferred
LanguageHaskell2010

Mpv.Effect.Ipc

Documentation

data Ipc (fmt :: Type) (command :: Type -> Type) :: Effect where Source #

Constructors

Sync :: command a -> Ipc fmt command m a 
WaitEvent :: TimeUnit u => EventName -> u -> m a -> Ipc fmt command m (Maybe (Some Event), a) 

Instances

Instances details
type DefiningModule Ipc Source # 
Instance details

Defined in Mpv.Effect.Ipc

type DefiningModule Ipc = "Mpv.Effect.Ipc"

waitEvent :: forall fmt command r u a. (MemberWithError (Ipc fmt command) r, TimeUnit u) => EventName -> u -> Sem r a -> Sem r (Maybe (Some Event), a) Source #

sync :: forall fmt command r a. MemberWithError (Ipc fmt command) r => command a -> Sem r a Source #