polysemy-conc-0.12.1.0: Polysemy effects for concurrency
Safe HaskellSafe-Inferred
LanguageHaskell2010

Polysemy.Conc.Effect.Monitor

Description

 
Synopsis

Documentation

data Restart Source #

Marker type for the restarting action for Monitor.

Constructors

Restart 

Instances

Instances details
Show Restart Source # 
Instance details

Defined in Polysemy.Conc.Effect.Monitor

Eq Restart Source # 
Instance details

Defined in Polysemy.Conc.Effect.Monitor

Methods

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

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

data Monitor (action :: Type) :: Effect where Source #

Mark a region as being subject to intervention by a monitoring program. This can mean that a thread is repeatedly checking a condition and cancelling this region when it is unmet. A use case could be checking whether a remote service is available, or whether the system was suspended and resumed. This should be used in a Scoped_ context, like withMonitor.

Constructors

Monitor :: m a -> Monitor action m a 

monitor :: forall action r a. Member (Monitor action) r => Sem r a -> Sem r a Source #

Mark a region as being subject to intervention by a monitoring program.

type ScopedMonitor (action :: Type) = Scoped_ (Monitor action) Source #

Convenience alias for a Scoped_ Monitor.

type RestartingMonitor = ScopedMonitor Restart Source #

Monitor specialized to the Restart action.

data MonitorCheck r Source #

Resources for a Scoped_ Monitor.

Constructors

MonitorCheck 

Fields

hoistMonitorCheck :: (forall x. Sem r x -> Sem r' x) -> MonitorCheck r -> MonitorCheck r' Source #

Transform the stack of the check in a MonitorCheck.

withMonitor :: forall action r. Member (ScopedMonitor action) r => InterpreterFor (Monitor action) r Source #

Start a region that can contain monitor-intervention regions.

restart :: Member (ScopedMonitor Restart) r => InterpreterFor (Monitor Restart) r Source #

Variant of withMonitor that uses the Restart strategy.