jsaddle-0.9.7.0: Interface for JavaScript that works with GHCJS and GHC

Safe HaskellNone
LanguageHaskell2010

GHCJS.Concurrent

Synopsis

Documentation

data OnBlocked Source #

The runtime tries to run synchronous threads to completion. Sometimes it's not possible to continue running a thread, for example when the thread tries to take an empty MVar. The runtime can then either throw a WouldBlockException, aborting the blocking action, or continue the thread asynchronously.

Constructors

ContinueAsync

continue the thread asynchronously if blocked

ThrowWouldBlock

throw WouldBlockException if blocked

Instances
Enum OnBlocked Source # 
Instance details

Defined in GHCJS.Concurrent

Eq OnBlocked Source # 
Instance details

Defined in GHCJS.Concurrent

Data OnBlocked Source # 
Instance details

Defined in GHCJS.Concurrent

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OnBlocked -> c OnBlocked #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OnBlocked #

toConstr :: OnBlocked -> Constr #

dataTypeOf :: OnBlocked -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OnBlocked) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OnBlocked) #

gmapT :: (forall b. Data b => b -> b) -> OnBlocked -> OnBlocked #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OnBlocked -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OnBlocked -> r #

gmapQ :: (forall d. Data d => d -> u) -> OnBlocked -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OnBlocked -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OnBlocked -> m OnBlocked #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OnBlocked -> m OnBlocked #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OnBlocked -> m OnBlocked #

Ord OnBlocked Source # 
Instance details

Defined in GHCJS.Concurrent

Show OnBlocked Source # 
Instance details

Defined in GHCJS.Concurrent

data WouldBlockException Source #

If a synchronous thread tries to do something that can only be done asynchronously, and the thread is set up to not continue asynchronously, it receives this exception.

Constructors

WouldBlockException