module Simulation.Aivika.GPSS.Block.Gather
(gatherBlock) where
import Simulation.Aivika
import Simulation.Aivika.GPSS.Block
import Simulation.Aivika.GPSS.AssemblySet
import Simulation.Aivika.GPSS.Transact
gatherBlock :: Int
-> Block (Transact a) (Transact a)
gatherBlock :: Int -> Block (Transact a) (Transact a)
gatherBlock Int
n =
Block :: forall a b. (a -> Process b) -> Block a b
Block { blockProcess :: Transact a -> Process (Transact a)
blockProcess = \Transact a
a -> Transact a -> Int -> Process ()
forall a. Transact a -> Int -> Process ()
gatherTransacts Transact a
a Int
n Process () -> Process (Transact a) -> Process (Transact a)
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Transact a -> Process (Transact a)
forall (m :: * -> *) a. Monad m => a -> m a
return Transact a
a }