Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
data Pure (t :: Type) Source #
A completely pure-functional Reflex
timeline, identifying moments in time
with the type t
.
Instances
data family Behavior t :: Type -> Type Source #
A container for a value that can change over time. Behavior
s can be
sampled at will, but it is not possible to be notified when they change
Instances
data family Event t :: Type -> Type Source #
A stream of occurrences. During any given frame, an Event
is either
occurring or not occurring; if it is occurring, it will contain a value of
the given type (its "occurrence type")
Instances
Reflex t => Accumulator (t :: k) (Event t) Source # | |
Defined in Reflex.Class accum :: (MonadHold t m, MonadFix m) => (a -> b -> a) -> a -> Event t b -> m (Event t a) Source # accumM :: (MonadHold t m, MonadFix m) => (a -> b -> PushM t a) -> a -> Event t b -> m (Event t a) Source # accumMaybe :: (MonadHold t m, MonadFix m) => (a -> b -> Maybe a) -> a -> Event t b -> m (Event t a) Source # accumMaybeM :: (MonadHold t m, MonadFix m) => (a -> b -> PushM t (Maybe a)) -> a -> Event t b -> m (Event t a) Source # mapAccum :: (MonadHold t m, MonadFix m) => (a -> b -> (a, c)) -> a -> Event t b -> m (Event t a, Event t c) Source # mapAccumM :: (MonadHold t m, MonadFix m) => (a -> b -> PushM t (a, c)) -> a -> Event t b -> m (Event t a, Event t c) Source # mapAccumMaybe :: (MonadHold t m, MonadFix m) => (a -> b -> (Maybe a, Maybe c)) -> a -> Event t b -> m (Event t a, Event t c) Source # mapAccumMaybeM :: (MonadHold t m, MonadFix m) => (a -> b -> PushM t (Maybe a, Maybe c)) -> a -> Event t b -> m (Event t a, Event t c) Source # | |
Reflex t => Functor (Event t) Source # | |
Reflex t => Apply (Event t) Source # |
|
Reflex t => Semialign (Event t) Source # | |
Reflex t => Align (Event t) Source # | |
Defined in Reflex.Class | |
Reflex t => Zip (Event t) Source # | |
Reflex t => Unzip (Event t) Source # | |
Reflex t => Plus (Event t) Source # | |
Defined in Reflex.Class | |
Reflex t => Alt (Event t) Source # | Left-biased event union (prefers left event on simultaneous occurrence). |
Reflex t => Bind (Event t) Source # |
|
Reflex t => Filterable (Event t) Source # | |
Reflex t => FunctorMaybe (Event t) Source # | |
(Semigroup a, Reflex t) => Semigroup (Event t a) Source # | |
(Semigroup a, Reflex t) => Monoid (Event t a) Source # | |
newtype Event (Pure t :: Type) a Source # | |
newtype Event (SpiderTimeline x :: Type) a Source # | |
Defined in Reflex.Spider.Internal | |
newtype Event (ProfiledTimeline t :: Type) a Source # | |
Defined in Reflex.Profiled |
data family Dynamic t :: Type -> Type Source #
A container for a value that can change over time and allows
notifications on changes. Basically a combination of a Behavior
and an
Event
, with a rule that the Behavior
will change if and only if the
Event
fires.
Instances
data family Incremental t :: Type -> Type Source #
An Incremental
is a more general form of a Dynamic
.
Instead of always fully replacing the value, only parts of it can be patched.
This is only needed for performance critical code via mergeIncremental
to make small
changes to large values.
Instances
newtype Incremental (Pure t :: Type) p Source # | |
Defined in Reflex.Pure newtype Incremental (Pure t :: Type) p = Incremental {
| |
newtype Incremental (SpiderTimeline x :: Type) p Source # | |
Defined in Reflex.Spider.Internal newtype Incremental (SpiderTimeline x :: Type) p = SpiderIncremental {
| |
newtype Incremental (ProfiledTimeline t :: Type) p Source # | |
Defined in Reflex.Profiled |