Safe Haskell | Trustworthy |
---|---|
Language | Haskell2010 |
Synopsis
- data Pool
- addToPoolMulti :: Pool -> IO t -> IO ()
- newPool :: Int -> IO Pool
- stopPool_ :: Pool -> IO ()
- globalPool :: Pool
- class ThreadPool pool where
- class Interruptible pool where
- data NoPool = NoPool
- data BoxedThreadPool where
- BoxedThreadPool :: ThreadPool pool => pool -> BoxedThreadPool
Documentation
Instances
Data Pool Source # | |
Defined in Control.CUtils.ThreadPool gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Pool -> c Pool # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Pool # dataTypeOf :: Pool -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Pool) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Pool) # gmapT :: (forall b. Data b => b -> b) -> Pool -> Pool # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Pool -> r # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Pool -> r # gmapQ :: (forall d. Data d => d -> u) -> Pool -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Pool -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Pool -> m Pool # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Pool -> m Pool # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Pool -> m Pool # | |
Interruptible Pool Source # | |
ThreadPool Pool Source # | |
Global thread pools
globalPool :: Pool Source #
Compatibility shims
class ThreadPool pool where Source #
Thread pools support some standard operations....
Instances
ThreadPool BoxedThreadPool Source # | |
Defined in Control.CUtils.ThreadPool | |
ThreadPool NoPool Source # | |
ThreadPool Pool Source # | |
class Interruptible pool where Source #
Instances
Interruptible Pool Source # | |
Use if you don't want to use a thread pool. The implementation of addToPool
spawns a green thread.
Instances
Data NoPool Source # | |
Defined in Control.CUtils.ThreadPool gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NoPool -> c NoPool # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NoPool # toConstr :: NoPool -> Constr # dataTypeOf :: NoPool -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NoPool) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NoPool) # gmapT :: (forall b. Data b => b -> b) -> NoPool -> NoPool # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NoPool -> r # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NoPool -> r # gmapQ :: (forall d. Data d => d -> u) -> NoPool -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> NoPool -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NoPool -> m NoPool # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NoPool -> m NoPool # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NoPool -> m NoPool # | |
ThreadPool NoPool Source # | |
data BoxedThreadPool where Source #
BoxedThreadPool :: ThreadPool pool => pool -> BoxedThreadPool |
Instances
ThreadPool BoxedThreadPool Source # | |
Defined in Control.CUtils.ThreadPool |