nettle-frp-0.1: FRP for controlling networks of OpenFlow switches.

Nettle.FRPControl.AFRP

Synopsis

Documentation

class Floating a => VectorSpace v a | v -> a whereSource

Methods

zeroVector :: vSource

(*^) :: a -> v -> vSource

(^/) :: v -> a -> vSource

negateVector :: v -> vSource

(^+^) :: v -> v -> vSource

(^-^) :: v -> v -> vSource

dot :: v -> v -> aSource

norm :: v -> aSource

normalize :: v -> vSource

Instances

VectorSpace Double Double 
VectorSpace Float Float 
RealFloat a => VectorSpace (Vector2 a) a 
RealFloat a => VectorSpace (Vector3 a) a 
Floating a => VectorSpace (a, a) a 
Floating a => VectorSpace (a, a, a) a 
Floating a => VectorSpace (a, a, a, a) a 
Floating a => VectorSpace (a, a, a, a, a) a 

class RandomGen g where

The class RandomGen provides a common interface to random number generators.

Minimal complete definition: next and split.

Methods

next :: g -> (Int, g)

The next operation returns an Int that is uniformly distributed in the range returned by genRange (including both end points), and a new generator.

split :: g -> (g, g)

The split operation allows one to obtain two distinct random number generators. This is very useful in functional programs (for example, when passing a random number generator down to recursive calls), but very little work has been done on statistically robust implementations of split ([System.Random, System.Random] are the only examples we know of).

genRange :: g -> (Int, Int)

The genRange operation yields the range of values returned by the generator.

It is required that:

The second condition ensures that genRange cannot examine its argument, and hence the value it returns can be determined only by the instance of RandomGen. That in turn allows an implementation to make a single call to genRange to establish a generator's range, without being concerned that the generator returned by (say) next might have a different range to the generator passed to next.

The default definition spans the full range of Int.

Instances

class Random a where

With a source of random number supply in hand, the Random class allows the programmer to extract random values of a variety of types.

Minimal complete definition: randomR and random.

Methods

randomR :: RandomGen g => (a, a) -> g -> (a, g)

Takes a range (lo,hi) and a random number generator g, and returns a random value uniformly distributed in the closed interval [lo,hi], together with a new generator. It is unspecified what happens if lo>hi. For continuous types there is no requirement that the values lo and hi are ever produced, but they may be, depending on the implementation and the interval.

random :: RandomGen g => g -> (a, g)

The same as randomR, but using a default range determined by the type:

  • For bounded types (instances of Bounded, such as Char), the range is normally the whole type.
  • For fractional types, the range is normally the semi-closed interval [0,1).
  • For Integer, the range is (arbitrarily) the range of Int.

randomRs :: RandomGen g => (a, a) -> g -> [a]

Plural variant of randomR, producing an infinite list of random values instead of returning a new generator.

randoms :: RandomGen g => g -> [a]

Plural variant of random, producing an infinite list of random values instead of returning a new generator.

randomRIO :: (a, a) -> IO a

A variant of randomR that uses the global random number generator (see System.Random).

randomIO :: IO a

A variant of random that uses the global random number generator (see System.Random).

(#) :: (a -> b) -> (b -> c) -> a -> cSource

dup :: a -> (a, a)Source

swap :: (a, b) -> (b, a)Source

data SF a b Source

data Event a Source

Constructors

NoEvent 
Event a 

Instances

Functor Event 
Eq a => Eq (Event a) 
Ord a => Ord (Event a) 
Read a => Read (Event a) 
Show a => Show (Event a) 
Monoid a => Monoid (Event a)

Monoid instance for a Monoid embedded inside an Event.

Forceable a => Forceable (Event a) 

constant :: b -> SF a bSource

(-->) :: b -> SF a b -> SF a bSource

(>--) :: a -> SF a b -> SF a bSource

(-=>) :: (b -> b) -> SF a b -> SF a bSource

(>=-) :: (a -> a) -> SF a b -> SF a bSource

initially :: a -> SF a aSource

now :: b -> SF a (Event b)Source

after :: Time -> b -> SF a (Event b)Source

repeatedly :: Time -> b -> SF a (Event b)Source

afterEach :: [(Time, b)] -> SF a (Event b)Source

edgeBy :: (a -> a -> Maybe b) -> a -> SF a (Event b)Source

switch :: SF a (b, Event c) -> (c -> SF a b) -> SF a bSource

dSwitch :: SF a (b, Event c) -> (c -> SF a b) -> SF a bSource

rSwitch :: SF a b -> SF (a, Event (SF a b)) bSource

drSwitch :: SF a b -> SF (a, Event (SF a b)) bSource

kSwitch :: SF a b -> SF (a, b) (Event c) -> (SF a b -> c -> SF a b) -> SF a bSource

dkSwitch :: SF a b -> SF (a, b) (Event c) -> (SF a b -> c -> SF a b) -> SF a bSource

parB :: Functor col => col (SF a b) -> SF a (col b)Source

pSwitchB :: Functor col => col (SF a b) -> SF (a, col b) (Event c) -> (col (SF a b) -> c -> SF a (col b)) -> SF a (col b)Source

dpSwitchB :: Functor col => col (SF a b) -> SF (a, col b) (Event c) -> (col (SF a b) -> c -> SF a (col b)) -> SF a (col b)Source

rpSwitchB :: Functor col => col (SF a b) -> SF (a, Event (col (SF a b) -> col (SF a b))) (col b)Source

drpSwitchB :: Functor col => col (SF a b) -> SF (a, Event (col (SF a b) -> col (SF a b))) (col b)Source

par :: Functor col => (forall sf. a -> col sf -> col (b, sf)) -> col (SF b c) -> SF a (col c)Source

pSwitch :: Functor col => (forall sf. a -> col sf -> col (b, sf)) -> col (SF b c) -> SF (a, col c) (Event d) -> (col (SF b c) -> d -> SF a (col c)) -> SF a (col c)Source

dpSwitch :: Functor col => (forall sf. a -> col sf -> col (b, sf)) -> col (SF b c) -> SF (a, col c) (Event d) -> (col (SF b c) -> d -> SF a (col c)) -> SF a (col c)Source

rpSwitch :: Functor col => (forall sf. a -> col sf -> col (b, sf)) -> col (SF b c) -> SF (a, Event (col (SF b c) -> col (SF b c))) (col c)Source

drpSwitch :: Functor col => (forall sf. a -> col sf -> col (b, sf)) -> col (SF b c) -> SF (a, Event (col (SF b c) -> col (SF b c))) (col c)Source

hold :: a -> SF (Event a) aSource

accum :: a -> SF (Event (a -> a)) (Event a)Source

accumBy :: (b -> a -> b) -> b -> SF (Event a) (Event b)Source

accumFilter :: (c -> a -> (c, Maybe b)) -> c -> SF (Event a) (Event b)Source

pre :: SF a aSource

iPre :: a -> SF a aSource

imIntegral :: VectorSpace a s => a -> SF a aSource

loopPre :: c -> SF (a, c) (b, c) -> SF a bSource

loopIntegral :: VectorSpace c s => SF (a, c) (b, c) -> SF a bSource

noEventFst :: (Event a, b) -> (Event c, b)Source

noEventSnd :: (a, Event b) -> (a, Event c)Source

liftE :: (a -> b) -> Event a -> Event bSource

event :: a -> (b -> a) -> Event b -> aSource

fromEvent :: Monoid a => Event a -> aSource

Useful function for projecting a monoidal value out of an Event value.

tag :: Event a -> b -> Event bSource

attach :: Event a -> b -> Event (a, b)Source

lMerge :: Event a -> Event a -> Event aSource

rMerge :: Event a -> Event a -> Event aSource

merge :: Event a -> Event a -> Event aSource

mergeBy :: (a -> a -> a) -> Event a -> Event a -> Event aSource

mapMerge :: (a -> c) -> (b -> c) -> (a -> b -> c) -> Event a -> Event b -> Event cSource

mergeEventsBy :: (a -> a -> a) -> [Event a] -> Event aSource

joinE :: Event a -> Event b -> Event (a, b)Source

splitE :: Event (a, b) -> (Event a, Event b)Source

filterE :: (a -> Bool) -> Event a -> Event aSource

mapFilterE :: (a -> Maybe b) -> Event a -> Event bSource

gate :: Event a -> Bool -> Event aSource

noise :: (RandomGen g, Random b) => g -> SF a bSource

noiseR :: (RandomGen g, Random b) => (b, b) -> g -> SF a bSource

occasionally :: RandomGen g => g -> Time -> b -> SF a (Event b)Source

reactimate :: IO a -> (Bool -> IO (DTime, Maybe a)) -> (Bool -> b -> IO Bool) -> SF a b -> IO ()Source

type ReactHandle a b = IORef (ReactState a b)Source

reactInit :: IO a -> (ReactHandle a b -> Bool -> b -> IO Bool) -> SF a b -> IO (ReactHandle a b)Source

embed :: SF a b -> (a, [(DTime, Maybe a)]) -> [b]Source

embedSynch :: SF a b -> (a, [(DTime, Maybe a)]) -> SF Double bSource

deltaEncode :: Eq a => DTime -> [a] -> (a, [(DTime, Maybe a)])Source

deltaEncodeBy :: (a -> a -> Bool) -> DTime -> [a] -> (a, [(DTime, Maybe a)])Source

evalSFSource

Arguments

:: SF a b

Signal function to evaluate

-> (a, [(DTime, a)])

Initial value and sample times, with inputs

-> [(DTime, b)] 

Evaluate the signal function.

initDelay :: [a] -> SF a aSource

Delay the input by the number of samples in the given list. The first samples will be from the list, while the next samples will be from the input. Warning: this operation only makes sense in the case when the sampling interval is constant, in which case it implements a delay of length xs * dt time units, where dt is the sampling interval and xs is the input list.