par package:monad-par

The monad-par package provides a family of Par monads, for speeding up pure computations using parallel processors. (for a similar programming model for use with IO, see Control.Monad.Par.IO.) The result of a given Par computation is always the same - i.e. it is deterministic, but the computation may be performed more quickly if there are processors available to share the work. For example, the following program fragment computes the values of (f x) and (g x) in parallel, and returns a pair of their results:
runPar $ do
fx <- spawnP (f x)  -- start evaluating (f x)
gx <- spawnP (g x)  -- start evaluating (g x)
a  <- get fx        -- wait for fx
b  <- get gx        -- wait for gx
return (a,b)        -- return results
Par can be used for specifying pure parallel computations in which the order of the computation is not known beforehand. The programmer specifies how information flows from one part of the computation to another, but not the order in which computations will be evaluated at runtime. Information flow is described using "variables" called IVars, which support put and get operations. For example, suppose you have a problem that can be expressed as a network with four nodes, where b and c require the value of a, and d requires the value of b and c:
a
/ \               
b   c             
\ /  
d
Then you could express this in the Par monad like this:
runPar $ do
[a,b,c,d] <- sequence [new,new,new,new]
fork $ do x <- get a; put b (x+1)
fork $ do x <- get a; put c (x+2)
fork $ do x <- get b; y <- get c; put d (x+y)
fork $ do put a (3 :: Int)
get d
The result of the above computation is always 9. The get operation waits until its input is available; multiple puts to the same IVar are not allowed, and result in a runtime error. Values stored in IVars are usually fully evaluated (although there are ways provided to pass lazy values if necessary). In the above example, b and c will be evaluated in parallel. In practice the work involved at each node is too small here to see the benefits of parallelism though: typically each node should involve much more work. The granularity is completely under your control - too small and the overhead of the Par monad will outweigh any parallelism benefits, whereas if the nodes are too large then there might not be enough parallelism to use all the available processors. Unlike Control.Parallel, in Control.Monad.Par parallelism is not combined with laziness, so sharing and granularity are completely under the control of the programmer. New units of parallel work are only created by fork and a few other combinators. The default implementation is based on a work-stealing scheduler that divides the work as evenly as possible between the available processors at runtime. Other schedulers are available that are based on different policies and have different performance characteristics. To use one of these other schedulers, just import its module instead of Control.Monad.Par: For more information on the programming model, please see these sources:
A wrapper around an underlying Par type which allows IO.
A library for parallel programming based on a monad The Par monad offers a simple API for parallel programming. The library works for parallelising both pure and IO computations, although only the pure version is deterministic. The default implementation provides a work-stealing scheduler and supports forking tasks that are much lighter weight than IO-threads. For complete documentation see Control.Monad.Par. Some examples of use can be found in the examples/ directory of the source package. Other related packages:
  • abstract-par provides the type classes that abstract over different implementations of the Par monad.
  • monad-par-extras provides extra combinators and monad transformers layered on top of the Par monad.
Changes in 0.3.4 relative to 0.3:
Run a parallel, deterministic computation and return its result. Note: you must NOT return an IVar in the output of the parallel computation. This is unfortunately not enforced, as it is with runST or with newer libraries that export a Par monad, such as lvish.
A version that avoids an internal unsafePerformIO for calling contexts that are already in the IO monad. Returning any value containing IVar is still disallowed, as it can compromise type safety.
A run method which allows actual IO to occur on top of the Par monad. Of course this means that all the normal problems of parallel IO computations are present, including nondeterminsm. A simple example program:
runParIO (liftIO $ putStrLn "hi" :: ParIO ())
Take the monadic fixpoint of a Par computation. This is the definition of mfix for Par. Throws FixParException if the result is demanded strictly within the computation.
This scheduler uses sparks (par/pseq) directly, but only supplies the Monad.Par.Class.ParFuture interface.
Take the monadic fixpoint of a Par computation. This is the definition of mfix for Par.
An asynchronous version in which the main thread of control in a Par computation can return while forked computations still run in the background.