Copyright | Copyright (c) 2009-2017 David Sorokin <david.sorokin@gmail.com> |
---|---|
License | BSD3 |
Maintainer | David Sorokin <david.sorokin@gmail.com> |
Stability | experimental |
Safe Haskell | Safe-Inferred |
Language | Haskell2010 |
Tested with: GHC 8.0.1
This module defines the signal which we can subscribe handlers to. These handlers can be disposed. The signal is triggered in the current time point actuating the corresponded computations from the handlers.
Synopsis
- data Signal a = Signal {
- handleSignal :: (a -> Event ()) -> Event DisposableEvent
- handleSignal_ :: Signal a -> (a -> Event ()) -> Event ()
- handleSignalComposite :: Signal a -> (a -> Event ()) -> Composite ()
- data SignalSource a
- newSignalSource :: Simulation (SignalSource a)
- publishSignal :: SignalSource a -> Signal a
- triggerSignal :: SignalSource a -> a -> Event ()
- mapSignal :: (a -> b) -> Signal a -> Signal b
- mapSignalM :: (a -> Event b) -> Signal a -> Signal b
- apSignal :: Event (a -> b) -> Signal a -> Signal b
- filterSignal :: (a -> Bool) -> Signal a -> Signal a
- filterSignal_ :: (a -> Bool) -> Signal a -> Signal ()
- filterSignalM :: (a -> Event Bool) -> Signal a -> Signal a
- filterSignalM_ :: (a -> Event Bool) -> Signal a -> Signal ()
- emptySignal :: Signal a
- merge2Signals :: Signal a -> Signal a -> Signal a
- merge3Signals :: Signal a -> Signal a -> Signal a -> Signal a
- merge4Signals :: Signal a -> Signal a -> Signal a -> Signal a -> Signal a
- merge5Signals :: Signal a -> Signal a -> Signal a -> Signal a -> Signal a -> Signal a
- arrivalSignal :: Signal a -> Signal (Arrival a)
- newSignalInTimes :: [Double] -> Event (Signal Double)
- newSignalInIntegTimes :: Event (Signal Double)
- newSignalInStartTime :: Event (Signal Double)
- newSignalInStopTime :: Event (Signal Double)
- newSignalInTimeGrid :: Int -> Event (Signal Int)
- delaySignal :: Double -> Signal a -> Signal a
- delaySignalM :: Event Double -> Signal a -> Signal a
- data SignalHistory a
- signalHistorySignal :: SignalHistory a -> Signal a
- newSignalHistory :: Signal a -> Composite (SignalHistory a)
- newSignalHistoryStartingWith :: Maybe a -> Signal a -> Composite (SignalHistory a)
- readSignalHistory :: SignalHistory a -> Event (Array Int Double, Array Int a)
- data Signalable a = Signalable {
- readSignalable :: Event a
- signalableChanged_ :: Signal ()
- signalableChanged :: Signalable a -> Signal a
- emptySignalable :: Monoid a => Signalable a
- appendSignalable :: Semigroup a => Signalable a -> Signalable a -> Signalable a
- traceSignal :: String -> Signal a -> Signal a
Handling and Triggering Signal
The signal that can have disposable handlers.
Signal | |
|
handleSignal_ :: Signal a -> (a -> Event ()) -> Event () Source #
Subscribe the handler to the specified signal forever.
To subscribe the disposable handlers, use function handleSignal
.
handleSignalComposite :: Signal a -> (a -> Event ()) -> Composite () Source #
Like handleSignal
but within the Composite
computation.
data SignalSource a Source #
The signal source that can publish its signal.
newSignalSource :: Simulation (SignalSource a) Source #
Create a new signal source.
publishSignal :: SignalSource a -> Signal a Source #
Publish the signal.
triggerSignal :: SignalSource a -> a -> Event () Source #
Trigger the signal actuating all its handlers at the current simulation time point.
Useful Combinators
mapSignal :: (a -> b) -> Signal a -> Signal b Source #
Map the signal according the specified function.
filterSignal :: (a -> Bool) -> Signal a -> Signal a Source #
Filter only those signal values that satisfy the specified predicate.
filterSignal_ :: (a -> Bool) -> Signal a -> Signal () Source #
Filter only those signal values that satisfy the specified predicate, but then ignoring the values.
filterSignalM :: (a -> Event Bool) -> Signal a -> Signal a Source #
Filter only those signal values that satisfy the specified predicate.
filterSignalM_ :: (a -> Event Bool) -> Signal a -> Signal () Source #
Filter only those signal values that satisfy the specified predicate, but then ignoring the values.
emptySignal :: Signal a Source #
An empty signal which is never triggered.
merge4Signals :: Signal a -> Signal a -> Signal a -> Signal a -> Signal a Source #
Merge four signals.
merge5Signals :: Signal a -> Signal a -> Signal a -> Signal a -> Signal a -> Signal a Source #
Merge five signals.
Signal Arriving
arrivalSignal :: Signal a -> Signal (Arrival a) Source #
Transform a signal so that the resulting signal returns a sequence of arrivals saving the information about the time points at which the original signal was received.
Creating Signal in Time Points
newSignalInTimes :: [Double] -> Event (Signal Double) Source #
Return a signal that is triggered in the specified time points.
newSignalInIntegTimes :: Event (Signal Double) Source #
Return a signal that is triggered in the integration time points.
It should be called with help of runEventInStartTime
.
newSignalInStartTime :: Event (Signal Double) Source #
Return a signal that is triggered in the start time.
It should be called with help of runEventInStartTime
.
newSignalInStopTime :: Event (Signal Double) Source #
Return a signal that is triggered in the final time.
newSignalInTimeGrid :: Int -> Event (Signal Int) Source #
Return a signal that is trigged in the grid by specified size.
Delaying Signal
delaySignal :: Double -> Signal a -> Signal a Source #
Delay the signal values for the specified time interval.
delaySignalM :: Event Double -> Signal a -> Signal a Source #
Delay the signal values for time intervals recalculated for each value.
Signal History
data SignalHistory a Source #
Represents the history of the signal values.
signalHistorySignal :: SignalHistory a -> Signal a Source #
The signal for which the history is created.
newSignalHistory :: Signal a -> Composite (SignalHistory a) Source #
Create a history of the signal values.
newSignalHistoryStartingWith :: Maybe a -> Signal a -> Composite (SignalHistory a) Source #
Create a history of the signal values starting with the optional initial value.
readSignalHistory :: SignalHistory a -> Event (Array Int Double, Array Int a) Source #
Read the history of signal values.
Signalable Computations
data Signalable a Source #
Describes a computation that also signals when changing its value.
Signalable | |
|
Instances
signalableChanged :: Signalable a -> Signal a Source #
Return a signal notifying that the value has changed.
emptySignalable :: Monoid a => Signalable a Source #
Return an identity.
appendSignalable :: Semigroup a => Signalable a -> Signalable a -> Signalable a Source #
An associative operation.