pipes-3.3.0: Compositional pipelines

Safe HaskellSafe-Inferred

Control.Pipe

Contents

Description

Deprecated: Use Proxy instead of Pipe

This module remains as a wistful reminder of this library's humble origins. This library now builds upon the more general Proxy type, but still keeps the pipes name. Read Control.Proxy.Tutorial to learn about this new implementation.

The Pipe type is a monad transformer that enriches the base monad with the ability to await or yield data to and from other Pipes.

Synopsis

Types

The Pipe type is strongly inspired by Mario Blazevic's Coroutine type in his concurrency article from Issue 19 of The Monad Reader.

data Pipe a b m r Source

The base type for pipes

  • a - The type of input received from upstream pipes
  • b - The type of output delivered to downstream pipes
  • m - The base monad
  • r - The type of the return value

Constructors

Await (a -> Pipe a b m r) 
Yield b (Pipe a b m r) 
M (m (Pipe a b m r)) 
Pure r 

Instances

MonadTrans (Pipe a b) 
Monad m => Monad (Pipe a b m) 
Monad m => Functor (Pipe a b m) 
Monad m => Applicative (Pipe a b m) 

type Producer b m r = Pipe () b m rSource

A pipe that produces values

type Consumer a m r = Pipe a C m rSource

A pipe that consumes values

type Pipeline m r = Pipe () C m rSource

A self-contained pipeline that is ready to be run

Create Pipes

yield and await are the only two primitives you need to create pipes. Since Pipe a b m is a monad, you can assemble yield and await statements using ordinary do notation. Since Pipe a b is also a monad transformer, you can use lift to invoke the base monad. For example, you could write a pipe stage that requests permission before forwarding any output:

 check :: (Show a) => Pipe a a IO r
 check = forever $ do
     x <- await
     lift $ putStrLn $ "Can '" ++ (show x) ++ "' pass?"
     ok <- read <$> lift getLine
     when ok (yield x)

await :: Pipe a b m aSource

Wait for input from upstream.

await blocks until input is available from upstream.

yield :: b -> Pipe a b m ()Source

Deliver output downstream.

yield restores control back upstream and binds its value to await.

pipe :: Monad m => (a -> b) -> Pipe a b m rSource

Convert a pure function into a pipe

 pipe f = forever $ do
     x <- await
     yield (f x)

Compose Pipes

Pipes form a Category, meaning that you can compose Pipes using (>+>) and also define an identity Pipe: idP. These satisfy the category laws:

 idP >+> p = p

 p >+> idP = p

 (p1 >+> p2) >+> p3 = p1 >+> (p2 >+> p3)

(p1 >+> p2) satisfies all awaits in p2 with yields in p1. If any Pipe terminates the entire Pipeline terminates.

(<+<) :: Monad m => Pipe b c m r -> Pipe a b m r -> Pipe a c m rSource

Corresponds to (<<<)/(.) from Control.Category

(>+>) :: Monad m => Pipe a b m r -> Pipe b c m r -> Pipe a c m rSource

Corresponds to (>>>) from Control.Category

idP :: Monad m => Pipe a a m rSource

Corresponds to id from Control.Category

newtype PipeC m r a b Source

Pipes form a Category instance when you rearrange the type variables

Constructors

PipeC 

Fields

unPipeC :: Pipe a b m r
 

Instances

Monad m => Category (PipeC m r) 

Run Pipes

runPipe :: Monad m => Pipe () b m r -> m rSource

Run the Pipe monad transformer, converting it back into the base monad