SciFlow-0.6.0: Scientific workflow management system

Safe HaskellNone
LanguageHaskell2010

Scientific.Workflow.Internal.Builder.Types

Synopsis

Documentation

data Node Source #

A computation node.

Constructors

Node 

data Edge Source #

Links between computational nodes

Constructors

Edge 

Fields

type Builder = State ([Node], [Edge]) Source #

data Attribute Source #

Node attributes.

Constructors

Attribute 

Fields

data ParallelMode Source #

Constructors

None

No parallelism.

Standard Int

Turn input a into [a] and process them in parallel.

ShareData Int

Assume the input is ContextData d a, where d is shared and a becomes [a].

Instances

data FunctionType Source #

Constructors

Pure

The function is pure, i.e., a -> b.

IOAction

A IO function, i.e., a -> IO b.

Stateful

A function that has access to configuration, i.e., a -> WorkflowConfig config b.

Instances

Generic FunctionType Source # 

Associated Types

type Rep FunctionType :: * -> * #

Lift FunctionType Source # 

Methods

lift :: FunctionType -> Q Exp #

Serialize FunctionType Source # 
type Rep FunctionType Source # 
type Rep FunctionType = D1 (MetaData "FunctionType" "Scientific.Workflow.Internal.Builder.Types" "SciFlow-0.6.0-FPairtChN7xIhKqUE6E6ei" False) ((:+:) (C1 (MetaCons "Pure" PrefixI False) U1) ((:+:) (C1 (MetaCons "IOAction" PrefixI False) U1) (C1 (MetaCons "Stateful" PrefixI False) U1)))

class ToExpQ a where Source #

Objects that can be converted to ExpQ

Minimal complete definition

toExpQ

Methods

toExpQ :: a -> ExpQ Source #

Instances

data ContextData context dat Source #

Data and its environment.

Constructors

ContextData 

Fields

Instances

Generic (ContextData context dat) Source # 

Associated Types

type Rep (ContextData context dat) :: * -> * #

Methods

from :: ContextData context dat -> Rep (ContextData context dat) x #

to :: Rep (ContextData context dat) x -> ContextData context dat #

(ToJSON c, ToJSON d) => ToJSON (ContextData c d) Source # 
(FromJSON c, FromJSON d) => FromJSON (ContextData c d) Source # 
(Serialize c, Serialize d) => Serialize (ContextData c d) Source # 

Methods

put :: Putter (ContextData c d) #

get :: Get (ContextData c d) #

type Rep (ContextData context dat) Source # 
type Rep (ContextData context dat) = D1 (MetaData "ContextData" "Scientific.Workflow.Internal.Builder.Types" "SciFlow-0.6.0-FPairtChN7xIhKqUE6E6ei" False) (C1 (MetaCons "ContextData" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_context") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 context)) (S1 (MetaSel (Just Symbol "_data") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 dat))))