quickcheck-state-machine-distributed-0.0.1: Test monadic programs using state machine based models

Safe HaskellNone
LanguageHaskell2010

Scheduler

Documentation

newtype SchedulerCount Source #

Constructors

SchedulerCount Int 

Instances

Generic SchedulerCount Source # 

Associated Types

type Rep SchedulerCount :: * -> * #

Binary SchedulerCount Source # 
type Rep SchedulerCount Source # 
type Rep SchedulerCount = D1 * (MetaData "SchedulerCount" "Scheduler" "quickcheck-state-machine-distributed-0.0.1-9t7n298Zc725FUIrkZnY2T" True) (C1 * (MetaCons "SchedulerCount" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int)))

newtype SchedulerHistory pid inv resp Source #

Constructors

SchedulerHistory (History pid inv resp) 

Instances

Generic (SchedulerHistory pid inv resp) Source # 

Associated Types

type Rep (SchedulerHistory pid inv resp) :: * -> * #

Methods

from :: SchedulerHistory pid inv resp -> Rep (SchedulerHistory pid inv resp) x #

to :: Rep (SchedulerHistory pid inv resp) x -> SchedulerHistory pid inv resp #

(Binary pid, Binary inv, Binary resp) => Binary (SchedulerHistory pid inv resp) Source # 

Methods

put :: SchedulerHistory pid inv resp -> Put #

get :: Get (SchedulerHistory pid inv resp) #

putList :: [SchedulerHistory pid inv resp] -> Put #

type Rep (SchedulerHistory pid inv resp) Source # 
type Rep (SchedulerHistory pid inv resp) = D1 * (MetaData "SchedulerHistory" "Scheduler" "quickcheck-state-machine-distributed-0.0.1-9t7n298Zc725FUIrkZnY2T" True) (C1 * (MetaCons "SchedulerHistory" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * (History pid inv resp))))

data SchedulerEnv input output model Source #

Constructors

SchedulerEnv 

Fields

schedulerP :: forall input output model. (Binary input, Typeable input) => (Binary output, Typeable output) => SchedulerEnv input output model -> SchedulerState input output model -> Process () Source #

makeSchedulerState :: Int -> model -> SchedulerState input output model Source #