-- Hoogle documentation, generated by Haddock -- See Hoogle, http://www.haskell.org/hoogle/ -- | Software Transactional Memory -- -- Software Transactional Memory, or STM, is an abstraction for -- concurrent communication. The main benefits of STM are -- composability and modularity. That is, using STM you can -- write concurrent abstractions that can be easily composed with any -- other abstraction built using STM, without exposing the details of how -- your abstraction ensures safety. This is typically not the case with -- other forms of concurrent communication, such as locks or -- MVars. @package stm @version 2.5.3.1 -- | TBQueue is a bounded version of TQueue. The queue has -- a maximum capacity set when it is created. If the queue already -- contains the maximum number of elements, then writeTBQueue -- retries until an element is removed from the queue. -- -- The implementation is based on an array to obtain O(1) enqueue -- and dequeue operations. module Control.Concurrent.STM.TBQueue -- | TBQueue is an abstract type representing a bounded FIFO -- channel. data TBQueue a -- | Builds and returns a new instance of TBQueue. newTBQueue :: Natural -> STM (TBQueue a) -- | IO version of newTBQueue. This is useful for creating -- top-level TBQueues using unsafePerformIO, because using -- atomically inside unsafePerformIO isn't possible. newTBQueueIO :: Natural -> IO (TBQueue a) -- | Read the next value from the TBQueue. readTBQueue :: TBQueue a -> STM a -- | A version of readTBQueue which does not retry. Instead it -- returns Nothing if no value is available. tryReadTBQueue :: TBQueue a -> STM (Maybe a) -- | Efficiently read the entire contents of a TBQueue into a list. -- This function never retries. flushTBQueue :: TBQueue a -> STM [a] -- | Get the next value from the TBQueue without removing it, -- retrying if the channel is empty. peekTBQueue :: TBQueue a -> STM a -- | A version of peekTBQueue which does not retry. Instead it -- returns Nothing if no value is available. tryPeekTBQueue :: TBQueue a -> STM (Maybe a) -- | Write a value to a TBQueue; blocks if the queue is full. writeTBQueue :: TBQueue a -> a -> STM () -- | Put a data item back onto a channel, where it will be the next item -- read. Blocks if the queue is full. unGetTBQueue :: TBQueue a -> a -> STM () -- | Return the length of a TBQueue. lengthTBQueue :: TBQueue a -> STM Natural -- | Returns True if the supplied TBQueue is empty. isEmptyTBQueue :: TBQueue a -> STM Bool -- | Returns True if the supplied TBQueue is full. isFullTBQueue :: TBQueue a -> STM Bool -- | The maximum number of elements the queue can hold. capacityTBQueue :: TBQueue a -> Natural instance GHC.Classes.Eq (Control.Concurrent.STM.TBQueue.TBQueue a) -- | (GHC only) module Control.Concurrent.STM.TChan -- | TChan is an abstract type representing an unbounded FIFO -- channel. data TChan a -- | Build and return a new instance of TChan newTChan :: STM (TChan a) -- | IO version of newTChan. This is useful for creating -- top-level TChans using unsafePerformIO, because using -- atomically inside unsafePerformIO isn't possible. newTChanIO :: IO (TChan a) -- | Create a write-only TChan. More precisely, readTChan -- will retry even after items have been written to the channel. -- The only way to read a broadcast channel is to duplicate it with -- dupTChan. -- -- Consider a server that broadcasts messages to clients: -- --
--   serve :: TChan Message -> Client -> IO loop
--   serve broadcastChan client = do
--       myChan <- dupTChan broadcastChan
--       forever $ do
--           message <- readTChan myChan
--           send client message
--   
-- -- The problem with using newTChan to create the broadcast channel -- is that if it is only written to and never read, items will pile up in -- memory. By using newBroadcastTChan to create the broadcast -- channel, items can be garbage collected after clients have seen them. newBroadcastTChan :: STM (TChan a) -- | IO version of newBroadcastTChan. newBroadcastTChanIO :: IO (TChan a) -- | Duplicate a TChan: the duplicate channel begins empty, but data -- written to either channel from then on will be available from both. -- Hence this creates a kind of broadcast channel, where data written by -- anyone is seen by everyone else. dupTChan :: TChan a -> STM (TChan a) -- | Clone a TChan: similar to dupTChan, but the cloned channel -- starts with the same content available as the original channel. cloneTChan :: TChan a -> STM (TChan a) -- | Read the next value from the TChan. readTChan :: TChan a -> STM a -- | A version of readTChan which does not retry. Instead it returns -- Nothing if no value is available. tryReadTChan :: TChan a -> STM (Maybe a) -- | Get the next value from the TChan without removing it, -- retrying if the channel is empty. peekTChan :: TChan a -> STM a -- | A version of peekTChan which does not retry. Instead it returns -- Nothing if no value is available. tryPeekTChan :: TChan a -> STM (Maybe a) -- | Write a value to a TChan. writeTChan :: TChan a -> a -> STM () -- | Put a data item back onto a channel, where it will be the next item -- read. unGetTChan :: TChan a -> a -> STM () -- | Returns True if the supplied TChan is empty. isEmptyTChan :: TChan a -> STM Bool instance GHC.Classes.Eq (Control.Concurrent.STM.TChan.TChan a) -- | (GHC only) module Control.Concurrent.STM.TMVar -- | A TMVar is a synchronising variable, used for communication -- between concurrent threads. It can be thought of as a box, which may -- be empty or full. data TMVar a -- | Create a TMVar which contains the supplied value. newTMVar :: a -> STM (TMVar a) -- | Create a TMVar which is initially empty. newEmptyTMVar :: STM (TMVar a) -- | IO version of newTMVar. This is useful for creating -- top-level TMVars using unsafePerformIO, because using -- atomically inside unsafePerformIO isn't possible. newTMVarIO :: a -> IO (TMVar a) -- | IO version of newEmptyTMVar. This is useful for -- creating top-level TMVars using unsafePerformIO, because -- using atomically inside unsafePerformIO isn't possible. newEmptyTMVarIO :: IO (TMVar a) -- | Return the contents of the TMVar. If the TMVar is -- currently empty, the transaction will retry. After a -- takeTMVar, the TMVar is left empty. takeTMVar :: TMVar a -> STM a -- | Put a value into a TMVar. If the TMVar is currently -- full, putTMVar will retry. putTMVar :: TMVar a -> a -> STM () -- | This is a combination of takeTMVar and putTMVar; ie. it -- takes the value from the TMVar, puts it back, and also returns -- it. readTMVar :: TMVar a -> STM a -- | Non-blocking write of a new value to a TMVar Puts if empty. -- Replaces if populated. writeTMVar :: TMVar a -> a -> STM () -- | A version of readTMVar which does not retry. Instead it returns -- Nothing if no value is available. tryReadTMVar :: TMVar a -> STM (Maybe a) -- | Swap the contents of a TMVar for a new value. swapTMVar :: TMVar a -> a -> STM a -- | A version of takeTMVar that does not retry. The -- tryTakeTMVar function returns Nothing if the -- TMVar was empty, or Just a if the TMVar -- was full with contents a. After tryTakeTMVar, the -- TMVar is left empty. tryTakeTMVar :: TMVar a -> STM (Maybe a) -- | A version of putTMVar that does not retry. The -- tryPutTMVar function attempts to put the value a into -- the TMVar, returning True if it was successful, or -- False otherwise. tryPutTMVar :: TMVar a -> a -> STM Bool -- | Check whether a given TMVar is empty. isEmptyTMVar :: TMVar a -> STM Bool -- | Make a Weak pointer to a TMVar, using the second -- argument as a finalizer to run when the TMVar is -- garbage-collected. mkWeakTMVar :: TMVar a -> IO () -> IO (Weak (TMVar a)) instance GHC.Classes.Eq (Control.Concurrent.STM.TMVar.TMVar a) -- | A TQueue is like a TChan, with two important -- differences: -- -- -- -- The implementation is based on the traditional purely-functional queue -- representation that uses two lists to obtain amortised O(1) -- enqueue and dequeue operations. module Control.Concurrent.STM.TQueue -- | TQueue is an abstract type representing an unbounded FIFO -- channel. data TQueue a -- | Build and returns a new instance of TQueue newTQueue :: STM (TQueue a) -- | IO version of newTQueue. This is useful for creating -- top-level TQueues using unsafePerformIO, because using -- atomically inside unsafePerformIO isn't possible. newTQueueIO :: IO (TQueue a) -- | Read the next value from the TQueue. readTQueue :: TQueue a -> STM a -- | A version of readTQueue which does not retry. Instead it -- returns Nothing if no value is available. tryReadTQueue :: TQueue a -> STM (Maybe a) -- | Efficiently read the entire contents of a TQueue into a list. -- This function never retries. flushTQueue :: TQueue a -> STM [a] -- | Get the next value from the TQueue without removing it, -- retrying if the channel is empty. peekTQueue :: TQueue a -> STM a -- | A version of peekTQueue which does not retry. Instead it -- returns Nothing if no value is available. tryPeekTQueue :: TQueue a -> STM (Maybe a) -- | Write a value to a TQueue. writeTQueue :: TQueue a -> a -> STM () -- | Put a data item back onto a channel, where it will be the next item -- read. unGetTQueue :: TQueue a -> a -> STM () -- | Returns True if the supplied TQueue is empty. isEmptyTQueue :: TQueue a -> STM Bool instance GHC.Classes.Eq (Control.Concurrent.STM.TQueue.TQueue a) module Control.Concurrent.STM.TVar data TVar a newTVar :: a -> STM (TVar a) newTVarIO :: a -> IO (TVar a) readTVar :: TVar a -> STM a readTVarIO :: TVar a -> IO a writeTVar :: TVar a -> a -> STM () -- | Mutate the contents of a TVar. N.B., this version is -- non-strict. modifyTVar :: TVar a -> (a -> a) -> STM () -- | Strict version of modifyTVar. modifyTVar' :: TVar a -> (a -> a) -> STM () -- | Like modifyTVar' but the function is a simple state transition -- that can return a side value which is passed on as the result of the -- STM. stateTVar :: TVar s -> (s -> (a, s)) -> STM a -- | Swap the contents of a TVar for a new value. swapTVar :: TVar a -> a -> STM a registerDelay :: Int -> IO (TVar Bool) -- | Make a Weak pointer to a TVar, using the second argument -- as a finalizer to run when TVar is garbage-collected mkWeakTVar :: TVar a -> IO () -> IO (Weak (TVar a)) -- | Software Transactional Memory: a modular composable concurrency -- abstraction. See -- -- -- -- This module only defines the STM monad; you probably want to -- import Control.Concurrent.STM (which exports -- Control.Monad.STM). -- -- Note that invariant checking (namely the always and -- alwaysSucceeds functions) has been removed. See ticket -- #14324 and the removal proposal. Existing users are -- encouraged to encapsulate their STM operations in safe abstractions -- which can perform the invariant checking without help from the runtime -- system. module Control.Monad.STM data STM a atomically :: STM a -> IO a retry :: STM a orElse :: STM a -> STM a -> STM a -- | Check that the boolean condition is true and, if not, retry. -- -- In other words, check b = unless b retry. check :: Bool -> STM () throwSTM :: Exception e => e -> STM a catchSTM :: Exception e => STM a -> (e -> STM a) -> STM a instance GHC.Internal.Control.Monad.Fix.MonadFix GHC.Internal.Conc.Sync.STM module Control.Concurrent.STM.TArray -- | TArray is a transactional array, supporting the usual -- MArray interface for mutable arrays. -- -- It is conceptually implemented as Array i (TVar e). data TArray i e instance (GHC.Classes.Eq i, GHC.Classes.Eq e) => GHC.Classes.Eq (Control.Concurrent.STM.TArray.TArray i e) instance Data.Array.Base.MArray Control.Concurrent.STM.TArray.TArray e GHC.Types.IO instance Data.Array.Base.MArray Control.Concurrent.STM.TArray.TArray e GHC.Internal.Conc.Sync.STM -- | Software Transactional Memory: a modular composable concurrency -- abstraction. See -- -- module Control.Concurrent.STM -- | TSem: transactional semaphores. module Control.Concurrent.STM.TSem -- | TSem is a transactional semaphore. It holds a certain number of -- units, and units may be acquired or released by waitTSem and -- signalTSem respectively. When the TSem is empty, -- waitTSem blocks. -- -- Note that TSem has no concept of fairness, and there is no -- guarantee that threads blocked in waitTSem will be unblocked in -- the same order; in fact they will all be unblocked at the same time -- and will fight over the TSem. Hence TSem is not suitable -- if you expect there to be a high number of threads contending for the -- resource. However, like other STM abstractions, TSem is -- composable. data TSem -- | Construct new TSem with an initial counter value. -- -- A positive initial counter value denotes availability of units -- waitTSem can acquire. -- -- The initial counter value can be negative which denotes a resource -- "debt" that requires a respective amount of signalTSem -- operations to counter-balance. newTSem :: Integer -> STM TSem -- | Wait on TSem (aka P operation). -- -- This operation acquires a unit from the semaphore (i.e. decreases the -- internal counter) and blocks (via retry) if no units are -- available (i.e. if the counter is not positive). waitTSem :: TSem -> STM () -- | Signal a TSem (aka V operation). -- -- This operation adds/releases a unit back to the semaphore (i.e. -- increments the internal counter). signalTSem :: TSem -> STM () -- | Multi-signal a TSem -- -- This operation adds/releases multiple units back to the semaphore -- (i.e. increments the internal counter). -- --
--   signalTSem == signalTSemN 1
--   
signalTSemN :: Natural -> TSem -> STM () instance GHC.Classes.Eq Control.Concurrent.STM.TSem.TSem