keera-hails-reactivevalues-0.2.2.1: Haskell on Rails - Reactive Values

Safe HaskellSafe
LanguageHaskell98

Data.ReactiveValue

Contents

Description

Reactive Values (RVs) are typed mutable variables with a change notification mechanism.

They are defined by providing a way to read the value, a way to change it, and a way to install an event listener when the value has changed.

RVs are pruposely abstract, defined as a type class. GUI toolkits, for instance, can use existing event-handling installing mechanisms to enclose widget attributes as Reactive Values, without the need for an additional, manually-handled event dispatcher.

RVs are complemented with relation-building functions, which enable pairing RVs during execution so that they are kept in sync for the duration of the program.

This module only defines RVs and operations on them. For connections to existing backends (GUIs, devices, files, network, FRP), see https://github.com/keera-studios/keera-hails

Synopsis

Reactive Values

Readable Reactive Values

Readable reactive values are mutable values that can be read and, possibly, trigger notifications when they change.

RVs without event handling are considered passive. That is their default behaviour if reactiveValueOnCanRead is not specialised. BEWARE: Active and passive RVs are not differentiated at the type level.

You are responsible of installing any potential thread-safety mechanisms when you implement instances, and to ensure that operations are executed in the right thread (some GUI toolkits may require that). It is important that the way that ensured that monadic actions are executed in the right thread can be nested; otherwise, some propagation can block.

class Monad m => ReactiveValueRead a b m | a -> b, a -> m where Source #

A class for all Readable RVs. They can be read-only or read-write.

If your type is also writeable (a writable RV or simply if it is not constant), you can include a change handler installer here. By default no change handlers are installed.

Use a monad with "error" if reading or installing a handler can fail.

Minimal complete definition

reactiveValueRead

Methods

reactiveValueOnCanRead :: a -> m () -> m () Source #

Install a handler that will be executed when the reactive value changes.

reactiveValueRead :: a -> m b Source #

Provide the last known value for this reactive value.

Instances

ReactiveValueRead (IO a) a IO Source #

Monadic actions are readable, but they do not provide any change notification.

Methods

reactiveValueOnCanRead :: IO a -> IO () -> IO () Source #

reactiveValueRead :: IO a -> IO a Source #

(Functor m, Monad m) => ReactiveValueRead (m a, a -> m b) a m Source #

Pairs carrying a monadic action as their first component are Readable RVs.

Methods

reactiveValueOnCanRead :: (m a, a -> m b) -> m () -> m () Source #

reactiveValueRead :: (m a, a -> m b) -> m a Source #

Monad m => ReactiveValueRead (ReactiveFieldReadWrite m a) a m Source # 
Monad m => ReactiveValueRead (ReactiveFieldRead m a) a m Source # 

Writable Reactive Values

Writable reactive values are those that we can write to. They behave like sinks: there are no guarantees that anything happens, or result codes.

You are responsible of installing any potential thread-safety mechanisms when you implement instances, and to ensure that operations are executed in the right thread (some GUI toolkits may require that). It is important that the way that ensured that monadic actions are executed in the right thread can be nested; otherwise, some propagation can block.

class ReactiveValueWrite a b m | a -> b, a -> m where Source #

A minimal type class for all mutable values. Use a monad with error if changing the value can fail.

Minimal complete definition

reactiveValueWrite

Methods

reactiveValueWrite :: a -> b -> m () Source #

Instances

ReactiveValueWrite (IO a) () IO Source #

Monadic actions are trivially writable RVs in that monad, by ignoring the argument and executing the action. This is particularly suitable for IO code that just runs an action when a given value changes.

Methods

reactiveValueWrite :: IO a -> () -> IO () Source #

(Functor m, Monad m) => ReactiveValueWrite (a -> m b) a m Source #

Monadic actions parameterised over an input are trivially writable RVs in that monad. This is particularly suitable for IO code that just runs an action when a given value changes, using that value.

Methods

reactiveValueWrite :: (a -> m b) -> a -> m () Source #

ReactiveValueWrite (a -> m b) a m => ReactiveValueWrite (m a, a -> m b) a m Source #

To facilitate creating RW reactive values from monadic actions, pairs of a getter and a setter are also RVs.

Methods

reactiveValueWrite :: (m a, a -> m b) -> a -> m () Source #

Monad m => ReactiveValueWrite (ReactiveFieldReadWrite m a) a m Source # 
Monad m => ReactiveValueWrite (ReactiveFieldWrite m a) a m Source # 

Methods

reactiveValueWrite :: ReactiveFieldWrite m a -> a -> m () Source #

Read-Write Reactive Values

RVs can be readable and writable, which is useful to create bi-directional rules (combinators like '(=:=)' require this instance).

class (ReactiveValueRead a b m, ReactiveValueWrite a b m) => ReactiveValueReadWrite a b m Source #

Read-write Reactive Values are trivially defined. This class only captures the constraints of both the other classes. There is no need to implement any methods.

Instances

(Functor m, Monad m) => ReactiveValueReadWrite (m a, a -> m b) a m Source #

Pairs of a monadic action and a parametric monadic action are also RVs

Monad m => ReactiveValueReadWrite (ReactiveFieldReadWrite m a) a m Source # 

Reactive Relations or Rules

Reactive Rules are data dependency (data-passing) building combinators. By executing them, you install the right event handlers on the right RVs, so that values pass to the other RV.

Reactive Relations cannot be independently removed. If the event-dispatching is handled internally by RVs, and two connected RVs are removed, then the rules should also disappear with them.

(=:>) :: Monad m => (ReactiveValueRead a b m, ReactiveValueWrite c b m) => a -> c -> m () infix 9 Source #

Left to right RV synchronisation function. If the value on the left changes, the one on the right is updated accordingly.

(=:=) :: Monad m => (ReactiveValueReadWrite a b m, ReactiveValueReadWrite c b m) => a -> c -> m () infix 9 Source #

Bidirectional synchronisation. When either value changes, the other is updated accordingly.

(<:=) :: Monad m => (ReactiveValueRead a b m, ReactiveValueWrite c b m) => c -> a -> m () infix 9 Source #

Right-to-left RV synchronisation function. If the value on the right changes, the one on the left is updated accordingly.

Activatable Reactive Values

Activatable RVs are values that never hold any data, but whose change (or activation, or some sort of internal event) we need to be aware of).

type ReactiveFieldActivatable m = ReactiveFieldRead m () Source #

A trivial type for Readable RVs that carry unit. They can be used for buttons, or events without data.

class ReactiveValueActivatable m a where Source #

A class for things with a trivial field that carries unit. Buttons (in any GUI library), for instance, could be a member of this class.

Minimal complete definition

defaultActivation

mkActivatable :: Monad m => (m () -> m ()) -> ReactiveFieldActivatable m Source #

Create an activatable RV from a handler installer.

Purely functional implementation of RVs.

This is a specific implementation of RVs that does not have a custom event queue.

It can be used to return RVs in the combinators, by relying on the underlying change detection and event notification system (underlying meaning or the RV that these were created from).

data ReactiveFieldRead m a Source #

A Read-Only RV.

Constructors

ReactiveFieldRead (FieldGetter m a) (FieldNotifier m a) 

newtype ReactiveFieldWrite m a Source #

A Write-Only RV.

Constructors

ReactiveFieldWrite (FieldSetter m a) 

Setters, getters and notifiers

These are used internally for combinators that need to return RV instances. They can also be used to write new backends and library extensions, but they are not recommended to enclose application models. For that purpose, see light models and protected models instead.

type FieldGetter m a = m a Source #

The type of a monadic value producer (a getter, a source).

type FieldSetter m a = a -> m () Source #

The type of a monadic value consumer (a setter, a sink, a slot).

type FieldNotifier m a = m () -> m () Source #

The type of an event handler installer

RV combinators

Creating, lifting on and manipulating readable values

 

constR :: Monad m => a -> ReactiveFieldRead m a Source #

A trivial RV builder tith a constant value. We need this because we cannot have overlapping instances with a default case, and because the interpretation of lifting with RVs could be very confusing unless values are lifted into RVs explicitly.

initRW :: Monad m => a -> ReactiveFieldRead m a Source #

TODO: Bad name. Should be eliminated or extended with a setter.

liftR :: (Monad m, ReactiveValueRead a b m) => (b -> c) -> a -> ReactiveFieldRead m c Source #

Lift a transformation onto a RV. Note that this creates a new RV, it does not modify the existing RV.

(<^>) :: (Monad m, ReactiveValueRead a b m) => (b -> c) -> a -> ReactiveFieldRead m c Source #

Shorter name for liftR

liftR2 :: (Monad m, ReactiveValueRead a b m, ReactiveValueRead c d m) => (b -> d -> e) -> a -> c -> ReactiveFieldRead m e Source #

Lift a transformation onto two RVs. Note that this creates a new RV, it does not modify the existing RVs. When either RV changes, the new one triggers a change.

liftR3 :: (Monad m, ReactiveValueRead a b m, ReactiveValueRead c d m, ReactiveValueRead e f m) => (b -> d -> f -> g) -> a -> c -> e -> ReactiveFieldRead m g Source #

Lift a transformation onto three RVs. Note that this creates a new RV, it does not modify the existing RVs. When either RV changes, the new one triggers a change.

liftMR :: (Monad m, ReactiveValueRead a b m) => (b -> m c) -> a -> ReactiveFieldRead m c Source #

Lift a parameterised monadic transformation onto an RV.

Same as lifting join . f?

readOnly :: ReactiveValueRead r a m => r -> ReactiveFieldRead m a Source #

Make a RW RV read only

wrapMR :: m a -> (m () -> m ()) -> ReactiveFieldRead m a Source #

Wrap an reading operation and an notification installer in a readable reactive value.

wrapMRPassive :: Monad m => m a -> ReactiveFieldRead m a Source #

Wrap an reading operation into an RV. Because there is no way to detect changes, the resulting RV is passive (does not push updates).

eventR :: Monad m => (m () -> m ()) -> ReactiveFieldRead m () Source #

Wrap event-handler installers in RVs

Merging

lMerge :: (Monad m, ReactiveValueRead a v m, ReactiveValueRead b v m) => a -> b -> ReactiveFieldRead m v Source #

Left merge (give priority to the value on the left)

rMerge :: (Monad m, ReactiveValueRead a v m, ReactiveValueRead b v m) => a -> b -> ReactiveFieldRead m v Source #

Right merge (give priority to the value on the right)

Creating, lifting on and manipulating writeable values

 

constW :: (Monad m, ReactiveValueWrite v a m) => a -> v -> ReactiveFieldWrite m b Source #

Create a constant writable RV.

liftW :: (Monad m, ReactiveValueWrite a b m) => (c -> b) -> a -> ReactiveFieldWrite m c Source #

Lift a transformation onto an RV. This creates a new RV, it does not actually modify the old RV (when this one is written to, so will be the old one, but both will keep existing somewhat independently).

liftW2 :: (Monad m, ReactiveValueWrite a b m, ReactiveValueWrite d e m) => (c -> (b, e)) -> a -> d -> ReactiveFieldWrite m c Source #

Lift a transformation onto two RVs. This creates a new RV, it does not actually modify the old RVs (when this one is written to, so will be the old ones, but both will keep existing somewhat independently).

(&.&) :: (Monad m, ReactiveValueWrite a b m, ReactiveValueWrite c b m) => a -> c -> ReactiveFieldWrite m b Source #

Binary writable replicator.

r1 &.& r2 = liftW2 (x -> (x,x)) r1 r2

liftMW :: (Monad m, ReactiveValueWrite a b m) => (c -> m b) -> a -> ReactiveFieldWrite m c Source #

Lift a parameterised monadic transformation onto an RV.

writeOnly :: ReactiveValueWrite r a m => r -> ReactiveFieldWrite m a Source #

Make a RW RV write only

wrapMW :: (a -> m ()) -> ReactiveFieldWrite m a Source #

Wrap a monadic computation in a writable reactive value.

wrapDo :: m () -> ReactiveFieldWrite m a Source #

Wrap a monadic computation in a writable reactive value. It discards the written value and executes the operation.

Note: Because the value is discarded, the resulting RV is polymorphic in the value that may be written to it. Using wrapDo_ may save you some extra type signatures.

NOTE: this should be unnecessary since the introduction of a default ReactiveValueWrite instance for monadic actions.

wrapDo_ :: m () -> ReactiveFieldWrite m () Source #

Wrap a monadic computation in a writable reactive value of type unit. It discards the written value and executes the operation.

Lift monadic actions/sinks (setters) and sources (getters)

Lifting (sink) computations into writable RVs.

 

Bijective functions

bijection :: (a -> b, b -> a) -> BijectiveFunc a b Source #

Create a bijection (BijectiveFunc) from a couple of functions

direct :: BijectiveFunc a b -> a -> b Source #

Obtain the direct function from a bijection

inverse :: BijectiveFunc a b -> b -> a Source #

Obtain the inverse function from a bijection

type Involution a = BijectiveFunc a a Source #

Involutions (functions that are the same as their inverse)

involution :: (a -> a) -> Involution a Source #

Create an involution from a function

Combinators

liftRW :: (Monad m, ReactiveValueReadWrite a b m) => BijectiveFunc b c -> a -> ReactiveFieldReadWrite m c Source #

Lift a bijection onto a read-write RV

liftRW2 :: (Monad m, ReactiveValueReadWrite a b m, ReactiveValueReadWrite c d m) => BijectiveFunc e (b, d) -> a -> c -> ReactiveFieldReadWrite m e Source #

Lift a bijection onto two read-write RVs

pairRW :: (Monad m, ReactiveValueReadWrite a b m, ReactiveValueReadWrite c d m) => a -> c -> ReactiveFieldReadWrite m (b, d) Source #

Pair two read-write RVs

modRW :: (Monad m, ReactiveValueReadWrite a b m) => (b -> c -> b) -> a -> ReactiveFieldWrite m c Source #

Lift a function that takes an old value and a new input and creates a new value. It is similar to how fold works: the RV represents the accumulator, and the values are provided in succession by writing to the resulting RV.

reactiveValueModify :: (Monad m, ReactiveValueReadWrite a b m) => a -> (b -> b) -> m () Source #

Apply a modification to an RV. This modification is not attached to the RV, and there are no guarantees that it will be atomic (if you need atomicity, check out STM.

Stopping change

Sometimes you need to create complex liftings between RVs in which only changes to one of them should provoke change propagation. These combinators allow you to stop propagation (making RVs passive), make one RV control the change propagation of another (governance), filter propagation based on some condition (guards) and have a boolean-carrying RV guard another.

Stopping unnecesary change propagation

eqCheck :: (Eq v, Monad m) => ReactiveFieldReadWrite m v -> ReactiveFieldReadWrite m v Source #

Add an equality check to the setter of a Read-Write RV, effectively stopping all unnecessary change (the RV is not modified if it has not changed).

Stopping all change propagation

passivelyR :: (Monad m, ReactiveValueRead a b m) => a -> ReactiveFieldRead m b Source #

Create a passive RO RV backed by another Readable RV by disabling change propagation.

passivelyRW :: (Monad m, ReactiveValueReadWrite a b m) => a -> ReactiveFieldReadWrite m b Source #

Create a passive RW RV backed by another RW RV by disabling change propagation.

Changing control over change propagation

governingR :: (ReactiveValueRead a b m, ReactiveValueRead c d m) => a -> c -> ReactiveFieldRead m d Source #

A form of binary readable lifting that passifies the second RV but reads exclusively from it.

governingR r1 r2 = rMerge r1 (passively r2)

governingRW :: (ReactiveValueRead a b m, ReactiveValueReadWrite c d m) => a -> c -> ReactiveFieldReadWrite m d Source #

A form of binary read-writable lifting that passifies the second RV but reads exclusively from it.

Conditional change propagation

ifRW :: (Monad m, ReactiveValueRead c Bool m, ReactiveValueReadWrite v a m) => c -> v -> ReactiveFieldReadWrite m a Source #

Check condition, and write or notify only when it holds.

ifRW_ :: (Monad m, ReactiveValueRead c Bool m, ReactiveValueReadWrite v a m) => c -> v -> ReactiveFieldReadWrite m a Source #

Check condition and notify only when holds (but writing occurs regardless).

guardRO :: (Monad m, ReactiveValueRead c Bool m) => c -> ReactiveFieldRead m Bool Source #

Check RV carrying a Bool, and notify only when it changes and it is True.

guardRO' :: (Monad m, ReactiveValueRead c a m) => c -> (a -> Bool) -> ReactiveFieldRead m a Source #

Check RV and notify only when condition on the value holds.

(stops propagation by filtering on the new value).