h&RWh       !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJ K L M N O P QRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~                                                                                                                    !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!"""""""""""""############################################################################################################################################################################################################################# # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ % % % & & ' ( ( ( ( ( ( (- Safe-Inferred>reflexAn approximate clone of RIO from the rio package, but not based on ReaderT. The trouble with ReaderT( is that its third type argument has a nominal role, so we can't coerce through it when it's wrapped in some other data type. Ugh.(Instances and convenience functions for )*. We use monoidal-containers to take advantage of its better monoid instance. +, has mappend = union, which is left-biased.   has mappend = unionWith mappend instead.None>?!reflexAppendMap is a synonym for  reflexPattern synonym for  reflexA synonym for  reflexDeletes a key, returning   if the result is empty.reflexLike  7 but indicates whether the resulting container is emptyreflex Displays a   as a tree. See -. for details.reflex Displays a   as a tree, using the supplied function to convert nodes to string. A mutable version of  None& reflexA  holds a map of values of type a> and allows low-overhead modifications via IO. Operations on  run in IO. reflex Create a new  out of an  !reflexCreate a new empty "reflexInsert an element into a  at the given key#reflex)Attempt to lookup an element by key in a $reflex4Runs the provided action over the intersection of a  and an  %reflex.Runs the provided action over the values of a &reflexChecks whether a  is empty'reflexRetrieves the size of a (reflex on the values, thus can't tell if a value has changed or not.5reflex Produce a   k (Maybe v) by comparing two   k vs, old and new respectively. Just& represents an association present in new and either not present in old! or where the value has changed. Nothing+ represents an association only present in old but no longer present in new@. See also 49 for a similar but weaker version which does not require   on the values but thus can't indicated a value not changing between old and new with Nothing.6reflexGiven a   k (Maybe v)% representing keys to insert/update (Just ) or delete (Nothing*), produce a new map from the given input   k v. See also /, and /1.7reflexSplit a   k (Either a b) into Map k a and Map k b, equivalent to   id8reflexGiven a   k (Maybe v)% representing keys to insert/update (Just ) or delete (Nothing), produce a new   k from the given input set.Equivalent to:  applyMapKeysSet patch (  m) ==   (6 patch m) but avoids the intervening Map and needs no values.4567845678 Safe-Inferred89reflexWhen inserting an item into a :, a 9 is returned. If the caller retains the ticket, the item is guranteed to stay in memory (and thus in the :=). The ticket can also be used to remove the item from the :3 prematurely (i.e. while it is still alive), using A.:reflexA : holds a set of values of type a, but does not retain them - that is, they can still be garbage-collected. As long as the a values remain alive, the : will continue to refer to them.;reflex#The items referenced by the WeakBag<reflexInsert an item into a :.=reflexCreate an empty :.>reflex Create a :+ with one item; equivalent to creating the : with = , then using <.?reflexVisit every node in the given list. If new nodes are appended during the traversal, they will not be visited. Every live node that was in the list when the traversal began will be visited exactly once; however, no guarantee is made about the order of the traversal.AreflexRemove an item from the :6; does nothing if invoked multiple times on the same 9.<reflexThe itemreflexThe : to insert intoreflex8An arbitrary value to be used in the following callbackreflexA callback to be invoked when the item is removed (whether automatically by the item being garbage collected or manually via A)reflex Returns a 9 that ensures the item is retained and allows the item to be removed. 9:;<=>?@A :9=><@?A;B& is a weak pointer to some value, and C' ensures the value referred to by a B stays live while the ticket is held (live). On GHC or GHCJS when not built with the  fast-weak cabal flag, B. is a wrapper around the simple version of   where the key and value are the same. On GHCJS when built with the  fast-weak cabal flag, B( is implemented directly in JS using  h$FastWeak and h$FastWeakTicket/ which are a nonstandard part of the GHCJS RTS.NoneABreflexA reference to some value which can be garbage collected if there are only weak references to the value left.E? can be used to try and obtain a strong reference to the value.The value in a FastWeak' can also be kept alive by obtaining a C using F) if the value hasn't been collected yet.Synonymous with  .CreflexA B0 which has been promoted to a strong reference. D; can be used to get the referred to value without fear of Nothing, and H% can be used to get the weak version.Dreflex Return the a kept alive by the given C.This needs to be in IO so we know that we've relinquished the ticket.EreflexGet the value referred to by a B& if it hasn't yet been collected, or Nothing if it has been collected.FreflexTry to create a C for the given B> which will ensure the value referred remains alive. Returns Just if the value hasn't been collected and a ticket can therefore be obtained, Nothing if it's been collected.Greflex Create a C# directly from a value, creating a B, in the process which can be obtained with D.This function is marked NOINLINE so it is opaque to GHC. If we do not do this, then GHC will sometimes fuse the constructor away so any weak references that are attached to the ticket will have their finalizer run. Using the opaque constructor, GHC does not see the constructor application, so it behaves like an IORef and cannot be fused away.The result is also evaluated to WHNF, since forcing a thunk invalidates the weak pointer to it in some cases.Hreflex Demote a C); which ensures the value is alive, to a B: which doesn't. Note that unless the ticket for the same B is held in some other way the value might be collected immediately.Ireflex%A weak reference that is always emptyBCDEFGHICBGDHEFI This module defines the FunctorMaybe class, which extends Functors with the ability to delete values.None2C/Jreflex=A class for values that combines filtering and mapping using   . Morally, J ~ KleisliFunctor  .Kreflex(Combined mapping and filtering function.JKJKThis module contains the Reflex interface, as well as a variety of convenience functions for working with ns, ms, and other signals. Trustworthy'(-.9>?QreflexAn Q6 type can be built by accumulating occurrences of an n.ZreflexEfficiently select an n keyed on  9. This is more efficient than manually filtering by key._reflex Retrieve the n% for the given key. The type of the n is determined by the type of the key, so this can be used to fan-out n s whose sub-ns have different types.Using ` s and the  primitive is far more efficient than (but equivalent to) using  0 to select only the relevant occurrences of an n.`reflexAn ` allows you to efficiently b an n based on a key. This is much more efficient than filtering for each key with  .breflex Retrieve the n% for the given key. The type of the n is determined by the type of the key, so this can be used to fan-out n s whose sub-ns have different types.Using ` s and the  primitive is far more efficient than (but equivalent to) using  0 to select only the relevant occurrences of an n.creflexc' designates monads that can create new m s based on ns; usually this will be q or a monad based on it. c> is required to create any stateful computations with Reflex.dreflex Create a new m whose value will initially be equal to the given value and will be updated whenever the given n9 occurs. The update takes effect immediately after the n* occurs; if the occurrence that sets the m> (or one that is simultaneous with it) is used to sample the m, it will see the old value of the m, not the new one.ereflex Create a o value using the given initial value that changes every time the n occurs.freflex Create an p value using the given initial value that changes every time the n occurs.hreflex Create a new n that only occurs only once, on the first occurrence of the supplied n.ireflexAn event which only occurs at the current moment in time, such that: 5coincidence (pushAlways (\a -> (a <$) <$> now) e) = ejreflexj9 designates monads that can read the current value of a m. This includes both r and q.kreflexGet the current value in the mlreflexThe l class contains all the primitive functionality needed for Functional Reactive Programming (FRP). The t type parameter indicates which "timeline" is in use. Timelines are fully-independent FRP contexts, and the type of the timeline determines the FRP engine to be used. For most purposes, the 23 implementation is recommended.mreflex4A container for a value that can change over time. ms can be sampled at will, but it is not possible to be notified when they changenreflex5A stream of occurrences. During any given frame, an n is either occurring or not occurring; if it is occurring, it will contain a value of the given type (its "occurrence type")oreflexA container for a value that can change over time and allows notifications on changes. Basically a combination of a m and an n, with a rule that the m! will change if and only if the n fires.preflexAn p is a more general form of a o. Instead of always fully replacing the value, only parts of it can be patched. This is only needed for performance critical code via ( to make small changes to large values.qreflex=A monad for doing complex push-based calculations efficientlyrreflex=A monad for doing complex pull-based calculations efficientlysreflexAn n with no occurrencestreflex Create a m that always has the given valueureflex Create an n from another n$; the provided function can sample m s and hold ns, and use the results to produce a occurring (Just) or non-occurring (Nothing) resultvreflexLike u but intended for functions that the implementation can consider cheap to compute for performance considerations. WARNING: The function passed to v/ may be run multiple times without any caching.wreflex Create a m by reading from other m;s; the result will be recomputed whenever any of the read m s changesxreflex,Merge a collection of events; the resulting n will only occur if at least one input event is occurring, and will contain all of the input keys that are occurring simultaneouslyyreflexEfficiently fan-out an event to many destinations. You should save the result in a let-binding, and then repeatedly _& on the result to create child eventszreflex Create an n8 that will occur whenever the currently-selected input n occurs{reflex Create an n that will occur whenever the input event is occurring -- and its occurrence value, another n/, is also occurring. You maybe looking for ' switchHold never ' instead.|reflex Extract the m of a o.}reflex Extract the n of the o.~reflex Create a new o . The given r9 must always return the most recent firing of the given n , if any.reflex Create a new p . The given PullM's value must always change in the same way that the accumulated application of patches would change that value.reflex1Create a merge whose parents can change over timereflexExperimental: Create a merge whose parents can change over time; changing the key of an Event is more efficient than with mergeIncrementalreflex Extract the m component of an preflex Extract the n component of an preflex Convert an p to a oreflex Construct a   for a m given an   for its occurrence typereflex Construct a   for an n given an   for its occurrence typereflex Construct a   for a o given an   for its occurrence typereflex Construct a   for an p given  (s for its patch target and patch types.reflexEfficiently fan-out an event to many destinations. You should save the result in a let-binding, and then repeatedly b& on the result to create child eventsreflexConstructs a single n out of a map of events. The output event may fire with multiple keys simultaneously.reflex Coerce a m2 between representationally-equivalent value typesreflex Coerce an n7 between representationally-equivalent occurrence typesreflex Coerce a o2 between representationally-equivalent value typesreflex Coerce an p2 between representationally-equivalent value typesreflex Construct a o from a m and an n. The m must change when and only when the n fires, such that the  Behavior'9s value is always equal to the most recent firing of the n*; if this is not the case, the resulting o# will behave nondeterministically.reflex Construct a o value that never changesreflexAccumulate an p with the supplied initial value and the firings of the provided n3, using the combining function to produce a patch.reflex Similar to $ but the combining function runs in qreflex Similar to  but allows filtering of updates (by dropping updates when the combining function produces Nothing)reflex Similar to $ but the combining function runs in qreflexAccumulate an p by folding occurrences of an n with a function that both accumulates and produces a value to fire as an n:. Returns both the accumulated value and the constructed n.reflexLike $ but the combining function runs in qreflexAccumulate an p by folding occurrences of an n with a function that both optionally accumulates and optionally produces a value to fire as a separate output n. Note that because  +s are discarded in both cases, the output n! may fire even though the output p" has not changed, and the output p! may update even when the output n is not firing.reflexLike ! but the combining function is a q actionreflex"A somewhat slow implementation of hreflex Create an n from another n%. The provided function can sample m s and hold ns.reflexFlipped version of  .reflexRotated version of  .reflexRotated version of  .reflex Alias for  reflexFlipped version of  .reflex*Filter 'f a' using the provided predicate.reflexFilter  s from 'f (Either a b)' into a.reflexFilter  s from 'f (Either a b)' into b.reflex%Replace each occurrence value of the n with the value of the m at the time of that occurrence.reflex%Replace each occurrence value of the n with the value of the m at that time; if it is  +, fire with the contained value; if it is  , drop the occurrence.reflex Create a new n' that combines occurrences of supplied n with the current value of the m.reflex Create a new n that occurs when the supplied n7 occurs by combining it with the current value of the m.reflex Create a new n= by combining each occurrence with the current value of the m. The occurrence is discarded if the combining function returns Nothingreflex Create a new n> that occurs on all but the first occurrence of the supplied n.reflexCreate a tuple of two ns with the first one occurring only the first time the supplied n occurs and the second occurring on all but the first occurrence.reflexTake the streak of occurrences starting at the current time for which the event returns  .>Starting at the current time, fire all the occurrences of the n( for which the given predicate returns  . When first   is returned, do not fire, and permanently stop firing, even if  + values would have been encountered later.reflexTake the streak of occurrences starting at the current time for which the event returns 'Just b'.>Starting at the current time, fire all the occurrences of the n> for which the given predicate returns 'Just b'. When first   is returned, do not fire, and permanently stop firing, even if 'Just b' values would have been encountered later.reflexDrop the streak of occurrences starting at the current time for which the event returns  .Starting at the current time, do not fire all the occurrences of the n( for which the given predicate returns  . When   is first returned, do fire, and permanently continue firing, even if  + values would have been encountered later.reflexBoth take and drop the streak of occurrences starting at the current time for which the event returns 'Just b'.For the left event, starting at the current time, fire all the occurrences of the n7 for which the given function returns 'Just b'. When   is returned, do not fire, and permanently stop firing, even if 'Just b' values would have been encountered later.For the right event, do not fire until the first occurrence where the given function returns  , and fire that one and all subsequent occurrences. Even if the function would have again returned 'Just b', keep on firing.reflexSplit the supplied n into two individual ns occurring at the same time with the respective values from the tuple.reflexPrint the supplied   and the value of the n" on each occurrence. This should only be used for debugging.Note: As with Debug.Trace.trace, the message will only be printed if the n is actually used.reflexPrint the output of the supplied function on each occurrence of the n. This should only be used for debugging.Note: As with Debug.Trace.trace, the message will only be printed if the n is actually used.reflex Create a new n$ that occurs if at least one of the ns in the list occurs. If multiple occur at the same time they are folded from the left with the given function.reflex Create a new n$ that occurs if at least one of the ns in the list occurs. If multiple occur at the same time the value is the value of the leftmost event.reflex Create a new n$ that occurs if at least one of the n:s in the list occurs and has a list of the values of all ns occurring at that time.reflex Create a new n combining the map of n s into an n that occurs if at least one of them occurs and has a map of values of all ns occurring at that time.reflexLike  but for  .reflex1Create a merge whose parents can change over timereflex1Create a merge whose parents can change over timereflexExperimental: Create a merge whose parents can change over time; changing the key of an Event is more efficient than with mergeIncrementalreflex)Split the event into separate events for   and   values.reflex)Split the event into separate events for   and   values, allowing them to fire simultaneously when the input value is  .reflexSplit the event into an `4 that allows efficient selection of the individual ns.reflexSwitches to the new event whenever it receives one. Only the old event is considered the moment a new one is switched in; the output event will fire at that moment only if the old event does.Because the simultaneous firing case is irrelevant, this function imposes laxer "timing requirements" on the overall circuit, avoiding many potential cyclic dependency / metastability failures. It's also more performant. Use this rather than  and  unless you are absolutely sure you need to act on the new event in the coincidental case.reflexSwitches to the new event whenever it receives one. Whenever a new event is provided, if it is firing, its value will be the resulting event's value; if it is not firing, but the old one is, the old one's value will be used., by always forwarding the old event the moment it is switched out, avoids many potential cyclic dependency problems / metastability problems. It's also more performant. Use it instead unless you are sure you cannot.reflexswitches to a new event whenever it receives one. At the moment of switching, the old event will be ignored if it fires, and the new one will be used if it fires; this is the opposite of z%, which will use only the old value., by always forwarding the old event the moment it is switched out, avoids many potential cyclic dependency problems / metastability problems. It's also more performant. Use it instead unless you are sure you cannot.reflexWhen the given outer event fires, condense the inner events into the contained patch. Non-firing inner events will be replaced with deletions.reflexSee reflexSee reflexGiven a   of events (e.g., a   with n values) and an event of   es (e.g., a   with n values), produce an n of the  ) type that fires with the patched value.reflex Create a new n" that only occurs if the supplied n occurs and the m# is true at the time of occurrence.reflexCreate a new behavior given a starting behavior and switch to the behavior carried by the event when it fires.reflex Combine two o b -> c -> d b1 :: Behavior t a b2 :: Behavior t b e :: Event t cthen we can do: "f <$> b1 <*> b2 <@> e :: Event t din order to apply the function f to the relevant values.(The alternative would be something like: attachWith (\(x1, x2) y -> f x1 x2 y) ((,) <$> b1 <*> b2) e :: Event t dor a variation involing a custom data type to hold the combination of m8s even when that combination might only ever be used by f.#A more suggestive example might be: handleMouse <$> bPlayerState <*> bMousePosition <@> eMouseClick :: Event t (GameState -> GameState)reflexAn version of $ that does not use the value of the n.Alternatively, it is  in operator form.>This is useful when we want to combine the values of several m(s at particular points in time using an   style syntax. If we have: g :: a -> b -> d b1 :: Behavior t a b2 :: Behavior t b e :: Event t cwhere e- is firing at the points in time of interest.Then we can use : "g <$> b1 <*> b2 <@ e :: Event t dto combine the values of b1 and b25 at each of those points of time, with the function g" being used to combine the values.This is the same as  except that the n) is being used only to act as a trigger.reflexA "cheap" version of . See the performance note on v.reflexA "cheap" version of  . See the performance note on v.reflex An alias for reflexA "cheap" version of . See the performance note on v.reflexA "cheap" version of . See the performance note on v.reflexA "cheap" version of  . See the performance note on v.reflexA "cheap" version of . See the performance note on v.reflex,Merge a collection of events; the resulting n will only occur if at least one input event is occurring, and will contain all of the input keys that are occurring simultaneouslyreflex1Create a merge whose parents can change over timereflexExperimental: Create a merge whose parents can change over time; changing the key of an Event is more efficient than with mergeIncrementalreflexA "cheap" version of . See the performance note on v.reflexA "cheap" version of . See the performance note on v.reflexSee reflexSee reflexNever:   = s.reflexn' intersection (convenient interface to {).reflexn< intersection. Only occurs when both events are co-incident.reflexLeft-biased event union (prefers left event on simultaneous occurrence).    JQRVTSUXWYZ[\]^_`abcedfghijklnompqrs|}tuvwxyz{~lnompqrs|}tuvwxyz{~jkcedfghi`ab]^_Z[\ QRVTSUXWYJ 44  Safe-Inferred>\reflex efficiently collects n values using  and combines them via   to provide an n result.  Safe-Inferred->;reflex efficiently collects o values using , and combines them monoidally to provide a o result.reflexType synonym for  None>{reflexA o whose } n- will never fire with the same value as the |  Behavior's contents. In order to maintain this constraint, the value inside a  is always evaluated to  .https://wiki.haskell.org/Weak_head_normal_formweak head normal form. Internally,  uses pointer equality as a heuristic to avoid unnecessary update propagation; this is much more efficient than performing full comparisons. However, when the # is converted back into a regular o!, a full comparison is performed.reflex Construct a ) by eliminating redundant updates from a o.reflexRetrieve a normal o from a <. This will perform a final check using the output type's  , instance to ensure deterministic behavior.#WARNING: If used with a type whose   instance is not law-abiding - specifically, if there are cases where x /= x,  may eliminate more }: occurrences than it should. For example, NaN values of   and  - are considered unequal to themselves by the   instance, but can be equal by pointer equality. This may cause " to lose changes from NaN to NaN.reflexCreate a UniqDynamic without uniqing it on creation. This will be slightly faster than uniqDynamic when used with a Dynamic whose values are always (or nearly always) different from its previous values; if used with a Dynamic whose values do not change frequently, it may be much slower than uniqDynamic 8This module contains various functions for working with o values. o+ and its primitives have been moved to the l class.None'(./2>?Ι)reflex Poor man's Generics for product types only.reflexIndicates that all elements in a type-level list are applications of the same functor.reflexThis class allows s and FHlists to be built from regular lists; they must be contiguous and sorted.reflex.A typed index into a typed heterogeneous list.reflexLike +, but with a functor wrapping each element.reflexA heterogeneous list whose type and length are fixed statically. This is reproduced from the  package due to integration issues, and because very little other functionality from that library is needed.reflex2Represents a time changing value together with an `2 that can efficiently detect when the underlying o has a particular value. This is useful for representing data like the current selection of a long list. Semantically, %demuxed (demux d) k === fmap (== k) dHowever, when 1 is used multiple times, the complexity is only  O(log(n)), rather than O(n) for fmap.reflexMap a sampling function over a o.reflexFlipped version of reflex Create a new o; that only signals changes if the values actually changed.reflex Create a new o' that changes only when the underlying o) changes and the given function returns  - when given both the old and the new values.reflex Dynamic Maybe that can only update from Nothing to Just or Just to Just (i.e., cannot revert to Nothing)reflex Create a o& that accumulates values from another o+. This function does not force its input o until the output o is forced.reflexLike , but the the accumulator function may decline to update the result Dynamic's value.reflex Create a o6 using the initial value and change it each time the n occurs using a folding function on the previous value and the value of the n.reflexLike ", but the combining function is a q action, so it can k existing  Behaviors and d new ones.reflex Create a o using the provided initial value and change it each time the provided n= occurs, using a function to combine the old value with the Event'"s value. If the function returns  =, the value is not changed; this is distinct from returning   the old value, since the Dynamic's } n will fire in the  ! case, and will not fire in the   case.reflexLike ", but the combining function is a q action, so it can k existing  Behaviors and d new ones.reflex Create a new o$ that counts the occurrences of the n.reflex Create a new o> using the initial value that flips its value every time the n occurs.reflexSwitches to the new n whenever it receives one. Only the old event is considered the moment a new one is switched in; the output event will fire at that moment if only if the old event does.Prefer this to  where possible. The lack of doing double work when the outer and (new) inner fires means this imposes fewer "timing requirements" and thus is far more easy to use without introducing fresh failure cases.  is also more performant.reflexSwitches to the new n. whenever it receives one. Switching occurs before the inner n fires - so if the o changes and both the old and new inner Events fire simultaneously, the output will fire with the value of the new n.Prefer  to this where possible. The timing requirements that switching before imposes are likely to bring down your app unless you are very careful.  is also more performant.reflexSplit a o pair into a pair of osreflex Convert a   with o elements into a o of a   with non-o elements.reflex Convert an   with o elements into a o of an   with non-o elements.reflexConvert a list with o elements into a o of a list with non-o0 elements, preserving the order of the elements.reflex Combine a o of a   of o s into a o! with the current values of the o s in a map.reflex Combine a o of an   of o s into a o! with the current values of the o s in a map.reflexPrint the value of the o when it is first read and on each subsequent change that is observed (as  3), prefixed with the provided string. This should only be used for debugging.Note: Just like Debug.Trace.trace, the value will only be shown if something else in the system is depending on it.reflexPrint the result of applying the provided function to the value of the o when it is first read and on each subsequent change that is observed (as  ). This should only be used for debugging.Note: Just like Debug.Trace.trace, the value will only be shown if something else in the system is depending on it.reflexReplace the value of the n with the current value of the o each time the n occurs.Note: tagPromptlyDyn d e differs from tag (current d) e in the case that e" is firing at the same time that d is changing. With tagPromptlyDyn d e, the new value of d will replace the value of e, whereas with tag (current d) e, the old value will be used, since the m won't be updated until the end of the frame. Additionally, this means that the output n/ may not be used to directly change the input o8, because that would mean its value depends on itself.  When creating cyclic data flows, generally tag (current d) e is preferred.reflex Attach the current value of the o to the value of the n each time it occurs.Note: attachPromptlyDyn d is not the same as attach (current d). See  for details.reflex!Combine the current value of the o with the value of the n each time it occurs.Note: attachPromptlyDynWith f d is not the same as attachWith f (current d). See  for details.reflex Create a new n by combining the value at each occurrence with the current value of the o value and possibly filtering if the combining function returns  .Note: attachPromptlyDynWithMaybe f d is not the same as attachWithMaybe f (current d). See  for details.reflex Factor a Dynamic t (Maybe a) into a Dynamic t (Maybe (Dynamic t a)), such that the outer o is updated only when the Maybe's constructor chages from   to  3 or vice-versa. Whenever the constructor becomes   , an inner o/ will be provided, whose value will track the a inside the  ; when the constructor becomes  , the existing inner o will become constant, and will not change when the outer constructor changes back to  .reflexTurns a 'Dynamic t (Either a b)' into a 'Dynamic t (Either (Dynamic t a) (Dynamic t b))' such that the outer o is updated only when the  ! constructor changes (e.g., from   to  ).reflex!Factor a 'Dynamic t DSum' into a o   containing nested o values. The outer o" updates only when the key of the  ) changes, while the update of the inner o+ represents updates within the current key.reflex Demultiplex an input value to a  with many outputs. At any given time, whichever output is indicated by the given o will be  .reflex"Select a particular output of the ; this is equivalent to (but much faster than) mapping over the original o4 and checking whether it is equal to the given key.reflex5Collect a hetereogeneous list whose elements are all os into a single o whose value represents the current values of all of the input os.reflex8Convert a datastructure whose constituent parts are all os into a single o whose value represents all the current values of the input's constituent os.>e}o|>o|}e2None '(reflexQuote a o9 expression. Within the quoted expression, you can use $(unqDyn [| x |]) to refer to any expression x of type  Dynamic t a'; the unquoted result will be of type areflex Antiquote a o expression. This can only be used inside of a qDyn quotation.reflex Create a o value using other os as inputs. The result is sometimes more concise and readable than the equivalent  !-based expression. For example: +[mkDyn| $x + $v * $t + 1/2 * $a * $t ^ 2 |]would have a very cumbersome   encoding.This module defines the  class Safe-Inferred->&reflex efficiently collects m values using , and combines them monoidally to provide a m result.reflexType synonym for A class for actions that can be "adjusted" over time based on some n: such that, when observed after the firing of any such n, the result is as though the action was originally run with the ns value.None->/reflex Synonym for reflexA   that supports adjustment over time. After an action has been run, if the given events fire, it will adjust itself so that its net effect is as though it had originally been run with the new value. Note that there is some issue here with persistent side-effects: obviously, IO (and some other side-effects) cannot be undone, so it is up to the instance implementer to determine what the best meaning for this class is in such cases.reflex Traverse a   of - actions, running each of them. The provided n of patches to the  # can add, remove, or update values.reflex Traverses a   of - actions, running each of them. The provided n of patches to the  / can add, remove, update, move, or swap values.reflex Traverses a  , running the provided  action. The provided n of patches to the  0 can add, remove, update, move, or swap values.   Safe-Inferred'(>?0reflex. designates monads that can run reflex frames.reflexPropagate some events firings and read the values of events afterwards.This function will create a new frame to fire the given events. It will then update all dependent events and behaviors. After that is done, the given callback is executed which allows to read the final values of events and check whether they have fired in this frame or not.5All events that are given are fired at the same time.This function is typically used in the main loop of a reflex framework implementation. The main loop waits for external events to happen (such as keyboard input or a mouse click) and then fires the corresponding events using this function. The read callback can be used to read output events and perform a corresponding response action to the external event.reflex&Run a frame without any events firing.2This function should be used when you want to use k and d when no events are currently firing. Using this function in that case can improve performance, since the implementation can assume that no events are firing when k or d are called.This function is commonly used to set up the basic event network when the application starts up.reflexA monad where new events feed from external sources can be created.reflexCreates a root n, (one that is not based on any other event).When a subscriber first subscribes to an event (building another event that depends on the subscription) the given callback function is run and passed a trigger. The callback function can then set up the event source in IO. After this is done, the callback function must return an accompanying teardown action.Any time between setup and teardown the trigger can be used to fire the event, by passing it to .Note: An event may be set up multiple times. So after the teardown action is executed, the event may still be set up again in the future.reflex)Monad that allows to read events' values.reflexRead the value of an n from an  (created by calling ).After event propagation is done, all events can be in two states: either they are firing with some value or they are not firing. In the former case, this function returns Just act, where act in an action to read the current value of the event. In the latter case, the function returns Nothing.4This function is normally used in the calllback for .reflexMonad in which Events can be  subscribed. This forces all underlying event sources to be initialized, so that the event will fire whenever it ought to. Events must be subscribed before they are read using readEventreflex.Subscribe to an event and set it up if needed. This function will create a new  from an n$. This handle may then be used via  in the read callback of .If the event wasn't subscribed to before (either manually or through a dependent event or behavior) then this function will cause the event and all dependencies of this event to be set up. For example, if the event was created by &, then it's callback will be executed./It's safe to call this function multiple times.reflexFramework implementation support class for the reflex implementation represented by t.reflexLike !, but without reading any events.reflex/Create a new event and store its trigger in an IORef while it's active.An event is only active between the set up (when it's first subscribed to) and the teardown phases (when noboby is subscribing the event anymore). This function returns an Event and an IORef'. As long as the event is active, the IORef will contain   the event trigger to trigger this event. When the event is not active, the IORef will contain  . This allows event sources to be more efficient, since they don't need to produce events when nobody is listening.reflex$Fire the given trigger if it is not  .reflex$Fire the given trigger if it is not  , and read from the given . Safe-Inferred/>reflex. represents an action that is notified via an n when it has finished executing. Note that the specific definition of "finished" is determined by the instance of , but the intent is to allow ms and os to be safely sampled, regardless of where they were created, when the post-build n fires. The post-build n- will fire exactly once for an given action.reflexRetrieve the post-build n for this action.None>nreflex.Create a set of widgets based on the provided  . When the input n/ fires, remove widgets for keys with the value  ( and add/replace widgets for keys with   values.reflexDisplay the given map of items (in key order) using the builder function provided, and update it with the given event.  = update entries will delete the corresponding children, and   entries will create them if they do not exist or send an update event to them if they do.reflexCreate a dynamically-changing set of Event-valued widgets. This is like $, specialized for widgets returning  Event t a.  would return Dynamic t (Map k (Event t a)) in this scenario, but  flattens this to Event t (Map k a) via z.reflexCreate a dynamically-changing set of widgets, one of which is selected at any time.reflexLike : but discards the value of the list item widget's output n.reflexCreate a dynamically-changing set of widgets from a Dynamic key/value map. Unlike the withKey variants, the child widgets are insensitive to which key they're associated with.reflexCreate a dynamically-changing set of widgets from a Dynamic list.reflexCurrent selection keyreflexDynamic key/value mapreflexFunction to create a widget for a given key from Dynamic value and Dynamic Bool indicating if this widget is currently selectedreflexEvent that fires when any child's return Event fires. Contains key of an arbitrary firing widget.reflexCurrent selection keyreflexDynamic key/value mapreflexFunction to create a widget for a given key from Dynamic value and Dynamic Bool indicating if this widget is currently selectedreflexEvent that fires when any child's return Event fires. Contains key of an arbitrary firing widget.This module provides a pure implementation of Reflex, which is intended to serve as a reference for the semantics of the Reflex class. All implementations of Reflex should produce the same results as this implementation, although performance and laziness/strictness may differ.None.0>qreflexA completely pure-functional l6 timeline, identifying moments in time with the type t.reflexThe   instance of t must be dense: for all x :: t, there must not exist any y :: t such that   x < y < x. The  < instance will be used exclusively to memoize functions of t(, not for any of its other capabilities. mnop mnopA class that ties together queries to some data source and their results, providing methods for requesting data from the source and accumulating streamed results.None3>?zreflexA class that allows sending of s and retrieval of s. See  for a commonly used interface.reflexThis type can be used to track of the frequency of interest in a given . See note on reflexQueryMorphism's must be group homomorphisms when acting on the query type and compatible with the query relationship when acting on the query result.reflexA  can be thought of as a declaration of interest in some set of data. A < is the set of data associated with that interest set. The crop; function provides a way to determine what part of a given  is relevant to a given .reflexApply a  to a reflexMap a  to a reflexkreflexA % action can trigger requests of type  Request m a based on n!s, and receive responses of type  Response m a in return. Note that the a type can vary within the  action, but will be linked for a given request. For example, if  Request m is   and  Response m is  , then  has the same type as 4.reflexThe type of requests that this  can emitreflex The type of responses that this  can receivereflex"Emit a request whenever the given n/ fires, and return responses in the resulting n.reflex"Emit a request whenever the given n! fires, and ignore all responses.reflex"Emit a request whenever the given n: fires, and unwrap the responses before returning them.  Response m must be  . Safe-Inferred>>reflex$ represents actions that can create ns that can be triggered by   actions.reflexCreate a triggerable n=. Whenever the resulting function is called, the resulting n will fire at some point in the future. Note that this may not be synchronous.reflexLike , but the callback itself takes another callback, to be invoked once the requested n occurrence has finished firing. This allows synchronous operation.reflexLike , but with setup and teardown. This relatively complex type signature allows any external listeners to be subscribed lazily and then removed whenever the returned n is no longer being listened to. Note that the setup/teardown may happen multiple times, and there is no guarantee that the teardown will be executed promptly, or even at all, in the case of program termination. Safe-Inferred>? reflex= represents actions that can trigger other actions based on ns.reflexThe type of action to be triggered; this is often not the same type as the triggering action.reflex*Perform the action contained in the given n whenever the n' fires. Return the result in another n. Note that the output n, will generally occur later than the input n , since most % actions cannot be performed during n propagation.reflexLike , but do not return the result. May have slightly better performance.reflexLike , but the resulting n! occurs only when the callback ( a -> IO ()3) is called, not when the included action finishes.NOTE: Despite the name,  does not run its action in a separate thread - although the action is free to invoke forkIO and then call the callback whenever it is ready. This will work properly, even in GHCJS (which fully implements concurrency even though JavaScript does not have built in concurrency).None 5>8reflexA basic implementation of .reflexA reference to an  suitable for firing with .reflexA value with which to fire an n, as well as a callback to invoke after its propagation has completed.reflexRun a # action. The argument should be a   into which s can be passed; it is expected that some other thread will be responsible for popping values out of the   and firing their s.reflexRetrieve the current  :; event trigger invocations pushed into it will be fired.  1Clocks, timers, and other time-related functions.None35678?"reflex'Metadata associated with a timer "tick"reflex)UTC time immediately after the last tick.reflexNB: The provided lag function must *actually* delay the event.reflexThe length of a tick intervalreflexThe basis time from which intervals count and with which the initial calculation of elapsed time will be made.reflexEvent that starts a tick generation thread. Usually you want this to be something like the result of getPostBuild that only fires once. But there could be uses for starting multiple timer threads.reflexEvent that starts a tick generation thread. Usually you want this to be something like the result of  that only fires once. But there could be uses for starting multiple timer threads.reflexPoisson event rate (Hz)reflexBaseline time for eventsreflexEvent that starts a tick generation thread. Usually you want this to be something like the result of getPostBuild that only fires once. But there could be uses for starting multiple timer threads. Start sending events in response to the event parameter.reflexPoisson event rate (Hz)reflexBaseline time for eventsNone'(12>*reflexA basic implementation of .reflexWe use a hack here to pretend we have x ~ request a; we don't want to use a GADT, because GADTs (even with zero-size existential contexts) can't be newtypes WARNING: This type should never be exposed. In particular, this is extremely unsound if a MyTag from one run of runRequesterT is ever compared against a MyTag from anotherreflexRuns in reverse to accommodate for the fact that we accumulate it in reversereflex with its arguments flippedreflexRun a  action. The resulting n will fire whenever requests are made, and responses should be provided in the input n. The   keys will be used to return the responses to the same place the requests were issued.reflex2Map a function over the request and response of a reflexMatches incoming responses with previously-sent requests and uses the provided request "decoder" function to process incoming responses.reflex$The function to map over the requestreflex%The function to map over the responsereflex The internal + whose input and output will be transformedreflexThe resulting reflexGiven a request (from ), produces the wire format of the request and a function used to process the associated responsereflexThe outgoing requestsreflex4The incoming responses, tagged by an identifying keyreflexA map of outgoing wire-format requests and an event of responses keyed by the ' key of the associated outgoing requestreflexGiven a request (from ), produces the wire format of the request and a function used to process the associated responsereflexThe outgoing requestsreflex9A map of incoming responses, tagged by an identifying keyreflexA map of outgoing wire-format requests and an event of responses keyed by the ' key of the associated outgoing request5None+None/>-3reflex#Provides a basic implementation of .reflexRun a  action. An n should be provided that fires immediately after the action is finished running; no other ns should fire first.reflex DeprecatedNone'(.2>?/reflex#Provides a basic implementation of !. Note that, despite the name,  is not an instance of  .reflex+A function that fires events for the given 3s and then runs any followup actions provided via  . The given  action will be run once for the initial trigger execution as well as once for each followup.reflexRun a  action, returning a $ that allows the caller to trigger ns while ensuring that * actions are run at the appropriate time.None>1reflexA basic implementation of .reflexRun a  action.reflexGiven a function like & for the underlying monad, implement  for ?. This is necessary when the underlying monad doesn't have a & instance or to override the default  behavior.reflexLike  , but for .reflex$Map a function over the output of a .reflex+Change the monad underlying an EventWriterTNone02>3|reflexwithQueryT's QueryMorphism argument needs to be a group homomorphism in order to behave correctlyreflexMaps a function over a % that can change the underlying monadreflexdynWithQueryT's (Dynamic t QueryMorphism) argument needs to be a group homomorphism at all times in order to behave correctly  6None3  None'(2>5reflexA basic implementation of .reflexRun a  action. The dynamic writer output will be provided along with the result of the action.reflex$Map a function over the output of a .reflexWhen the execution of a  action is adjusted using , the o6 output of that action will also be updated to match.7None5! Implementation of BehaviorWriterNone'(2>6reflexA basic implementation of .reflexRun a  action. The behavior writer output will be provided along with the result of the action.reflex$Map a function over the output of a ."None 9>?7C#None'(-.025>?=reflexThe monad for actions that manipulate a Spider timeline identified by xreflex is the old name for reflex&The default, global Spider environmentreflex.Designates the default, global Spider timelinereflex&Retrieve the current SpiderTimelineEnvreflexStores all global data relevant to a particular Spider timeline; only one value should exist for each type xreflexA statically allocated  reflex Construct an  # equivalent to that constructed by  , but with no caching; if the computation function is very cheap, this is (much) more efficient than  reflex'A subscriber that never triggers other  s reflex=Subscribe to an Event only for the duration of one occurrence reflex Construct an  ; whose value is guaranteed not to be recomputed repeatedlyTODO: Try a caching strategy where we subscribe directly to the parent when there's only one subscriber, and then build our own FastWeakBag only when a second subscriber joins reflex*Propagate everything at the current height reflex*Propagate everything at the current height reflex&Run an event action outside of a frame reflexCreate a new SpiderTimelineEnv reflex*Pass a new timeline to the given function. reflexRun an action affecting the global Spider timeline; this will be guarded by a mutex for that timeline reflexRun an action affecting a given Spider timeline; this will be guarded by a mutex for that timeline    8This module exports all of the user-facing functionality of the  Reflex engineNoneD   $(This module contains an instance of the l: class that provides profiling/cost-center information.None.02>?Em n o p  %This module provides combinators for building FRP graphs/networks and modifying them dynamically.NoneI reflexA o "network": Takes a o of network-creating actions and replaces the network whenever the o updates. The returned Event of network results fires at post-build time and when the o" updates. Note: Often, the type a is an Event, in which case the return value is an Event-of-Events, where the outer n) fires when switching networks. Such an n# would typically be flattened (via ). reflex"Given an initial "network" and an n of network-creating actions, create a network that is recreated whenever the Event fires. The returned Dynamic of network results occurs when the Event does. Note: Often, the type a is an Event, in which case the return value is a Dynamic-of-Events that would typically be flattened. reflexRender a placeholder network to be shown while another network is not yet done building  2NoneJ    JQYWXUSTRVZ[\]^_`abcihgfedjkl~{zyxwvut}|srqpmnom n o p qr &None -?O reflexRun a headless FRP network. Inside the action, you will most probably use the capabilities provided by the  and  type classes to interface the FRP network with the outside world. Useful for testing. Each headless network runs on its own spider timeline. reflexThe action to be run in the headless FRP network. The FRP network is closed at the first occurrence of the resulting n.  'NoneS< reflexBuild sortable content in such a way that re-sorting it can cause minimal disruption to an existing context.Naively re-sorting a list of images would destroy every image and add them back in the new order. This framework is able to avoid that by preserving the identity of each image and simply moving it to the new location.Example: let sortByFst = buttonA $> comparing fst sortBySnd = buttonB $> comparing snd sortEvent = leftmost [sortByFst, sortBySnd] sortableList (\k v -> text $ "\n" ++ show k ++ " " ++ v) -- show each element on a new line (Map.fromList $ zip [0..] [(3, "a"), (2, "b"), (1, "c")]) sortEvent reflex6Function to render the content for each key/value pairreflex=The sortable list with an initial ordering determined by the Map keys in ascending orderreflex.An event carrying a sort function for the list  (Provides a convenient way to describe a series of interrelated widgets that can send data to, invoke, and replace one another. Useful for modeling user interface "workflows."NoneWH reflexA widget in a workflow When the n returned by a   fires, the current  * is replaced by the one inside the firing n. A series of  "s must share the same return type. reflexRuns a   and returns the o result of the   (i.e., a o& of the value produced by the current   node, and whose update n fires whenever one   is replaced by another). reflex Similar to  , but outputs an n8 that fires at post-build time and whenever the current   is replaced by the next  . reflexMap a function over a  $, possibly changing the return type. reflexMap a "cheap" function over a  !. Refer to the documentation for v5 for more information and performance considerations.  9:;9:<9:=9:>9:?9:@9:@9AB9AC9AD9AE9AF9AGHIJKKLMNOPQRSSTUV.WXYZ[\]^_`abcdefg\h`ijklmnopqrg\hsijktuvwxyz{ | } ~    2}                                                                                   4                                 !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!"""""""""""""######################3######################################################################################################################################################################################################################################################### # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # ## # # # # # # # # # # # ######## # # # # # # # # # # # # # # # # # # # # # # # # # # # ## # # # # # # # # # ## # # # # # # # # # # ## ## # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # ## # # # ###### # # # # # # # # # # #### # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $$$% % % & & ' ( ( ( ( ( ( (   J d   \ h ] a s  0 ,                9  9  9     9/ 9/ 9/ 9/ 9/ 9/ 9 9 9 9 9 9 9 9  9 9 9 9  9 9 9 9 9 9 9 9 9  9  9 9 9 9  9 9: 9 9 9               $ $ $ $ $ $ $ $ reflex-0.9.3.0-inplaceData.FastMutableIntMap Reflex.ClassControl.Monad.ReaderIOData.AppendMapData.FastWeakBag Data.Map.Misc Data.WeakBagReflex.FastWeakReflex.FunctorMaybeReflex.EventWriter.ClassReflex.DynamicWriter.ClassReflex.Dynamic.UniqReflex.DynamicReflex.Dynamic.THReflex.BehaviorWriter.ClassReflex.Adjustable.ClassReflex.Host.ClassReflex.PostBuild.ClassReflex.Collection Reflex.PureReflex.Query.ClassReflex.Requester.ClassReflex.TriggerEvent.ClassReflex.PerformEvent.ClassReflex.TriggerEvent.Base Reflex.TimeReflex.Requester.Base.InternalReflex.PostBuild.BaseReflex.PerformEvent.BaseReflex.EventWriter.BaseReflex.Query.BaseReflex.DynamicWriter.BaseReflex.BehaviorWriter.BaseReflex.NotReady.ClassReflex.Spider.InternalReflex.ProfiledReflex.NetworkReflex.Host.HeadlessReflex.Widget.BasicReflex.WorkflowData.MapMonoidalDataMap Data.Map.LazyshowTree Data.PatchIntMap MapWithMoveReflexSpider performEventReflex.Requester.BaseReflex.EventWriterReflex.DynamicWriter Reflex.Spider$patch-0.0.8.1-HvXBHkInlvbIQnxUfWAfN0Data.Patch.IntMap getDeletionspatchIntMapNewElementsMappatchIntMapNewElementstraverseIntMapPatchWithKey unPatchIntMap PatchIntMapData.Functor.Misc dsumToEither eitherToDSum dmapToTheseRightTagLeftTag EitherTag'witherable-0.4.2-Hk7txXxhwjFH8GASmNGUT5 WitherablemapMaybeReaderIO runReaderIO$fMonadReadereReaderIO$fMonadIOReaderIO$fMonadFixReaderIO$fMonadReaderIO$fApplicativeReaderIO$fFunctorReaderIO AppendMap _unAppendMapnonEmptyDeletemapMaybeNoNull showTreeWith$fDefaultMonoidalMapFastMutableIntMapnewnewEmptyinsertlookupforIntersectionWithImmutable_for_isEmptysizegetFrozenAndClear applyPatchtoListFastWeakBagTicket FastWeakBag_weakBag_childrenempty traverse_traverseremove diffMapNoEqdiffMapapplyMapmapPartitionEithersapplyMapKeysSet WeakBagTicketWeakBag singletonFastWeakFastWeakTicketgetFastWeakTicketValuegetFastWeakValuegetFastWeakTicketmkFastWeakTicketgetFastWeakTicketWeak emptyFastWeak FunctorMaybe fmapMaybe$fFunctorMaybeIntMap$fFunctorMaybeMap$fFunctorMaybe[]$fFunctorMaybeMaybe$fFunctorMaybeOption AccumulatoraccumaccumM accumMaybe accumMaybeMmapAccum mapAccumM mapAccumMaybemapAccumMaybeMEventSelectorInt selectIntEventSelectorGselectG EventSelectorselect MonadHoldholdholdDynholdIncremental buildDynamicheadEnow MonadSamplesampleBehaviorEventDynamic IncrementalPushMPullMneverconstantpush pushCheappullmergeGfanGswitch coincidencecurrentupdatedunsafeBuildDynamicunsafeBuildIncrementalmergeIncrementalGmergeIncrementalWithMoveGcurrentIncrementalupdatedIncrementalincrementalToDynamicbehaviorCoercion eventCoerciondynamicCoercionincrementalCoercionmergeIntIncrementalfanIntfanmergeIntcoerceBehavior coerceEvent coerceDynamiccoerceIncremental unsafeDynamicconstDynaccumIncrementalaccumMIncrementalaccumMaybeIncrementalaccumMaybeMIncrementalmapAccumIncrementalmapAccumMIncrementalmapAccumMaybeIncrementalmapAccumMaybeMIncremental slowHeadE pushAlwaysfforffor2ffor3 fforMaybeffilter filterLeft filterRighttagtagMaybeattach attachWithattachWithMaybetailE headTailE takeWhileEtakeWhileJustE dropWhileEtakeDropWhileJustEsplitE traceEventtraceEventWith mergeWithleftmost mergeListunsafeMapIncrementalmergeMap mergeIntMapmergeMapIncrementalmergeIntMapIncrementalmergeMapIncrementalWithMove fanEitherfanThesefanMap switchHoldswitchHoldPromptlyswitchHoldPromptOnlycoincidencePatchMapcoincidencePatchIntMapcoincidencePatchMapWithMoveswitchHoldPromptOnlyIncrementalgateswitcherzipDyn zipDynWithdistributeDMapOverDynPuredistributeDMapOverDynPureGdistributeListOverDyndistributeListOverDynWith differencealignEventWithMaybefilterEventKey factorEventaccumDyn accumMDyn accumMaybeDynaccumMaybeMDyn mapAccumDyn mapAccumMDynmapAccumMaybeDynmapAccumMaybeMDynaccumBaccumMB accumMaybeB accumMaybeMB mapAccumB mapAccumMBmapAccumMaybeBmapAccumMaybeMB mapAccum_mapAccumMaybe_ mapAccumM_mapAccumMaybeM_zipListWithEventnumberOccurrencesnumberOccurrencesFromnumberOccurrencesFrom_<@><@pushAlwaysCheap mapMaybeCheapfmapMaybeCheapfforMaybeCheap fforCheap fmapCheaptagCheapmergemergeIncrementalmergeIncrementalWithMovemergeWithCheapmergeWithCheap'switchPromptlyswitchPromptOnly$fMonoidDynamic$fSemigroupDynamic$fIsStringDynamic $fUnzipEvent $fZipEvent$fSemialignEvent $fAlignEvent $fMonoidEvent$fSemigroupEvent $fPlusEvent$fFilterableEvent$fFunctorMaybeEvent$fFunctorEvent $fBindEvent $fApplyEvent $fAltEvent$fSemigroupBehavior $fNumDynamic $fNumBehavior$fMonoidBehavior$fMonadBehavior$fIsStringBehavior$fFunctorBehavior$fFractionalBehavior$fBindBehavior$fApplyBehavior$fApplicativeBehavior$fMonadHoldktContT$fMonadSamplektContT$fMonadHoldktRWST$fMonadSamplektRWST$fMonadHoldktExceptT$fMonadSamplektExceptT$fMonadHoldktStateT$fMonadSamplektStateT$fMonadHoldktWriterT$fMonadSamplektWriterT$fMonadHoldktReaderT$fMonadSamplektReaderT$fDefaultDynamic$fAccumulatorktEvent$fAccumulatorktBehavior$fAccumulatorktDynamic EventWriter tellEvent$fEventWritertwReaderT DynamicWritertellDynMonadDynamicWriter$fDynamicWritertwReaderT UniqDynamic uniqDynamicfromUniqDynamicalreadyUniqDynamic$fMonadUniqDynamic$fApplicativeUniqDynamic$fFunctorUniqDynamic$fAccumulatorTYPEtUniqDynamicIsHList HListElemstoHList fromHListAllAreFunctors FunctorListtoFHList fromFHListRebuildSortedHListrebuildSortedFHListrebuildSortedHListHListPtrHHeadPtrHTailPtrFHListFHNilFHConsHListHNilHConsDemuxmapDynMforDynM holdUniqDyn holdUniqDynByimprovingMaybescanDyn scanDynMaybefoldDynfoldDynM foldDynMaybe foldDynMaybeMcounttoggle switchDynswitchPromptlyDyn splitDynPuredistributeMapOverDynPuredistributeIntMapOverDynPuredistributeListOverDynPurejoinDynThroughMapjoinDynThroughIntMaptraceDyn traceDynWithtagPromptlyDynattachPromptlyDynattachPromptlyDynWithattachPromptlyDynWithMaybemaybeDyn eitherDyn factorDyndemuxdemuxeddistributeFHListOverDynPurecollectDynPure $fHBuild'l->$fHBuild'lHList$fGComparekHListPtr$fGEqkHListPtr$fRebuildSortedHList:$fRebuildSortedHList[]$fAllAreFunctorsaf:$fAllAreFunctorsaf[]$fIsHList(,,,,,)$fIsHList(,,,) $fIsHList(,) $fOrdHListPtr $fEqHListPtrqDynPureunqDyn mkDynPureBehaviorWriter tellBehaviorMonadBehaviorWriter$fBehaviorWritertwReaderT MonadAdjust AdjustablerunWithReplacetraverseIntMapWithKeyWithAdjusttraverseDMapWithKeyWithAdjust%traverseDMapWithKeyWithAdjustWithMovesequenceDMapWithAdjustsequenceDMapWithAdjustWithMovemapMapWithAdjustWithMove$fAdjustabletReaderTMonadReflexHost ReadPhasefireEventsAndRead runHostFrameMonadReflexCreateTriggernewEventWithTriggernewFanEventWithTriggerMonadReadEvent readEventMonadSubscribeEventsubscribeEvent ReflexHost EventTrigger EventHandle HostFrame fireEventsnewEventWithTriggerRef fireEventReffireEventRefAndRead$fMonadSubscribeEventtRWST$fMonadReflexCreateTriggertRWST$fMonadSubscribeEventtExceptT"$fMonadReflexCreateTriggertExceptT$fMonadSubscribeEventtContT $fMonadReflexCreateTriggertContT$fMonadSubscribeEventtStateT!$fMonadReflexCreateTriggertStateT$fMonadSubscribeEventtStateT0"$fMonadReflexCreateTriggertStateT0$fMonadSubscribeEventtWriterT"$fMonadReflexCreateTriggertWriterT$fMonadSubscribeEventtReaderT"$fMonadReflexCreateTriggertReaderT$fMonadReflexHosttRWST$fMonadReflexHosttExceptT$fMonadReflexHosttContT$fMonadReflexHosttStateT$fMonadReflexHosttStateT0$fMonadReflexHosttWriterT$fMonadReflexHosttReaderT PostBuild getPostBuild$fPostBuildtStateT$fPostBuildtStateT0$fPostBuildtReaderTlistHoldWithKey listWithKeylistWithKeyShallowDifflistViewWithKeyselectViewListWithKeyselectViewListWithKey_list simpleListPure unBehaviorunEvent unDynamic unIncremental$fMonadHoldTYPEPure->$fMonadSampleTYPEPure->$fMonadDynamic$fApplicativeDynamic$fFunctorDynamic$fReflexTYPEPure MonadQuerytellQueryIncrementalaskQueryResultqueryIncremental SelectedCountunSelectedCount QueryMorphism_queryMorphism_mapQuery_queryMorphism_mapQueryResultQuery QueryResultcropmapQuerymapQueryResultcombineSelectedCounts tellQueryDynqueryDynsubQuery $fQueryAp $fQueryVoid $fQuery() $fQuery(,)$fQueryMonoidalMap$fCategoryTYPEQueryMorphism$fCommutativeSelectedCount$fGroupSelectedCount$fMonoidSelectedCount$fSemigroupSelectedCount$fMonadQuerytqReaderT$fEqSelectedCount$fOrdSelectedCount$fShowSelectedCount$fReadSelectedCount$fIntegralSelectedCount$fNumSelectedCount$fBoundedSelectedCount$fEnumSelectedCount$fRealSelectedCount$fIxSelectedCount$fBitsSelectedCount$fFiniteBitsSelectedCount$fStorableSelectedCount$fDataSelectedCount RequesterRequestResponse requesting requesting_requestingIdentitywithRequesting$fRequestertStateT$fRequestertStateT0$fRequestertReaderT TriggerEventnewTriggerEventnewTriggerEventWithOnComplete%newEventWithLazyTriggerWithOnComplete$fTriggerEventtMaybeT$fTriggerEventtStateT$fTriggerEventtStateT0$fTriggerEventtReaderT PerformEvent Performable performEvent_performEventAsync$fPerformEventtMaybeT$fPerformEventtReaderT TriggerEventTunTriggerEventTEventTriggerRefunEventTriggerRefTriggerInvocationrunTriggerEventT askEvents$fSemigroupTriggerEventT$fMonoidTriggerEventT$fAdjustabletTriggerEventT$fMonadHoldTYPEtTriggerEventT$fMonadSampleTYPEtTriggerEventT$fMonadAtomicRefTriggerEventT$fMonadRefTriggerEventT$fTriggerEventtTriggerEventT($fMonadReflexCreateTriggertTriggerEventT$fPostBuildtTriggerEventT$fPerformEventtTriggerEventT$fPrimMonadTriggerEventT$fMonadTransTriggerEventT$fFunctorTriggerEventT$fApplicativeTriggerEventT$fMonadTriggerEventT$fMonadFixTriggerEventT$fMonadIOTriggerEventT$fMonadExceptionTriggerEventT"$fMonadAsyncExceptionTriggerEventT$fMonadCatchTriggerEventT$fMonadThrowTriggerEventT$fMonadMaskTriggerEventTThrottleBufferThrottleBuffer_EmptyThrottleBuffer_Full ThrottleStateThrottleState_ImmediateThrottleState_BufferedTickInfo_tickInfo_lastUTC _tickInfo_n_tickInfo_alreadyElapsed tickLossytickLossyFromPostBuildTime tickLossyFromtickLossyFrom' clockLossygetCurrentTickdelaypoissonLossyFrom poissonLossyinhomogeneousPoissonFrominhomogeneousPoissondebouncebatchOccurrencesthrottlethrottleBatchWithLag$fMonoidThrottleBuffer$fSemigroupThrottleBuffer$fEqThrottleState$fOrdThrottleState$fShowThrottleState$fFunctorThrottleState$fFoldableThrottleState$fTraversableThrottleState$fGenericThrottleState$fDataThrottleState$fEqThrottleBuffer$fOrdThrottleBuffer$fShowThrottleBuffer$fFunctorThrottleBuffer$fFoldableThrottleBuffer$fTraversableThrottleBuffer$fGenericThrottleBuffer$fDataThrottleBuffer $fEqTickInfo $fOrdTickInfo$fShowTickInfotickInfo_alreadyElapsedtickInfo_lastUTC tickInfo_nDecoder RequesterT unRequesterTRequesterState_requesterState_nextMyTag_requesterState_requests MyTagWrapMyTagEntryunEntryMulti2Contents_multi2Contents_dict_multi2Contents_values EntryContentsMyTagTypeOffsetmyTagTypeOffsetMulti3Multi2MultiSingle MyTagTypeMyTagType_SingleMyTagType_MultiMyTagType_Multi2MyTagType_Multi3RequesterDataKeyRequesterDataKey_SingleRequesterDataKey_MultiRequesterDataKey_Multi2RequesterDataKey_Multi3 RequesterDataTagMapemptyRequesterDatasingletonRequesterDatamergeRequesterData mergeTagMaprequesterDataToListsingletonTagMap tagMapToListtraverseTagMapWithKeytraverseRequesterDataforRequesterData myKeyType singleEntry multiEntry unMultiEntry castMyTagWrap runRequesterTwithRequesterT tagRequestresponseFromTag requesting'runWithReplaceRequesterTWith-traverseIntMapWithKeyWithAdjustRequesterTWith+traverseDMapWithKeyWithAdjustRequesterTWithmatchResponsesWithRequestsmatchResponseMapWithRequests$fMyTagTypeOffsetMulti3$fMyTagTypeOffsetMulti2$fMyTagTypeOffsetMulti$fMyTagTypeOffsetSingle$fGCompareTYPEMyTag$fGEqTYPEMyTag$fGCompareTYPEMyTagWrap$fGEqTYPEMyTagWrap$fAdjustabletRequesterT$fMonadReaderrRequesterT%$fMonadReflexCreateTriggertRequesterT$fMonadRefRequesterT$fPerformEventtRequesterT$fMFunctorTYPERequesterT$fMonadTransRequesterT$fRequestertRequesterT$fSemigroupRequesterT$fMonoidRequesterT$fPrimMonadRequesterT$fEventWritertwRequesterT$fFunctorRequesterT$fApplicativeRequesterT$fMonadRequesterT$fMonadFixRequesterT$fMonadIORequesterT$fMonadExceptionRequesterT$fMonadAsyncExceptionRequesterT$fMonadCatchRequesterT$fMonadThrowRequesterT$fMonadMaskRequesterT$fShowMyTagWrap $fEqMyTagWrap$fOrdMyTagWrap$fEnumMyTagWrap $fShowMyTag $fEqMyTag $fOrdMyTag $fEnumMyTag$fTriggerEventtRequesterT$fPostBuildtRequesterT$fMonadHoldTYPEtRequesterT$fMonadSampleTYPEtRequesterT PostBuildT unPostBuildT runPostBuildTmapIntMapWithAdjustImplmapDMapWithAdjustImpl$fMonadTransControlPostBuildT$fAdjustabletPostBuildT$fMonadAtomicRefPostBuildT$fMonadRefPostBuildT$fTriggerEventtPostBuildT%$fMonadReflexCreateTriggertPostBuildT$fPerformEventtPostBuildT$fMonadHoldTYPEtPostBuildT$fMonadSampleTYPEtPostBuildT$fPostBuildtPostBuildT$fPrimMonadPostBuildT$fSemigroupPostBuildT$fMonoidPostBuildT$fFunctorPostBuildT$fApplicativePostBuildT$fMonadPostBuildT$fMonadFixPostBuildT$fMonadIOPostBuildT$fMonadTransPostBuildT$fMonadExceptionPostBuildT$fMonadAsyncExceptionPostBuildT$fMonadMaskPostBuildT$fMonadThrowPostBuildT$fMonadCatchPostBuildT PerformEventTunPerformEventT FireCommandrunFireCommandhostPerformEventT$fMonadAtomicRefPerformEventT$fMonadRefPerformEventT$fMonadHoldTYPEtPerformEventT$fMonadSampleTYPEtPerformEventT($fMonadReflexCreateTriggertPerformEventT$fAdjustabletPerformEventT$fPerformEventtPerformEventT$fPrimMonadPerformEventT$fMonadMaskPerformEventT$fMonadThrowPerformEventT$fMonadCatchPerformEventT$fSemigroupPerformEventT$fMonoidPerformEventT$fMonadExceptionPerformEventT$fMonadIOPerformEventT$fMonadFixPerformEventT$fMonadPerformEventT$fApplicativePerformEventT$fFunctorPerformEventT EventWriterTunEventWriterTrunEventWriterTrunWithReplaceEventWriterTWith&sequenceDMapWithAdjustEventWriterTWithwithEventWriterTmapEventWriterT$fGCompareTYPETellId$fGEqTYPETellId$fPrimMonadEventWriterT$fDynamicWritertwEventWriterT$fMonadQuerytqEventWriterT'$fMonadReflexCreateTriggertEventWriterT$fMonadAtomicRefEventWriterT$fMonadRefEventWriterT$fMonadReaderrEventWriterT$fTriggerEventtEventWriterT$fPostBuildtEventWriterT$fPerformEventtEventWriterT$fRequestertEventWriterT$fAdjustabletEventWriterT$fMonadHoldTYPEtEventWriterT$fMonadSampleTYPEtEventWriterT$fEventWritertwEventWriterT$fFunctorEventWriterT$fApplicativeEventWriterT$fMonadEventWriterT$fMonadTransEventWriterT$fMFunctorTYPEEventWriterT$fMonadFixEventWriterT$fMonadIOEventWriterT$fMonadExceptionEventWriterT!$fMonadAsyncExceptionEventWriterT$fMonadMaskEventWriterT$fMonadCatchEventWriterT$fMonadThrowEventWriterT $fShowTellId $fEqTellId $fOrdTellId $fEnumTellIdQueryTunQueryT runQueryT withQueryT mapQueryT dynWithQueryT$fDynamicWritertwQueryT$fEventWritertwQueryT$fRequestertQueryT$fMonadQuerytqQueryT$fSemigroupQueryT$fMonoidQueryT!$fMonadReflexCreateTriggertQueryT$fMonadRefQueryT$fPerformEventtQueryT$fTriggerEventtQueryT$fMonadAsyncExceptionQueryT$fPostBuildtQueryT$fPrimMonadQueryT$fMFunctorTYPEQueryT$fMonadTransQueryT$fAdjustabletQueryT$fFunctorQueryT$fApplicativeQueryT $fMonadQueryT$fMonadExceptionQueryT$fMonadFixQueryT$fMonadIOQueryT$fMonadAtomicRefQueryT$fMonadCatchQueryT$fMonadThrowQueryT$fMonadMaskQueryT$fMonadSampleTYPEtQueryT$fMonadHoldTYPEtQueryTDynamicWriterTunDynamicWriterTrunDynamicWriterTwithDynamicWriterT$fEventWritertwDynamicWriterT$fMonadQuerytqDynamicWriterT$fRequestertDynamicWriterT$fAdjustabletDynamicWriterT$fPrimMonadDynamicWriterT$fMonadStatesDynamicWriterT$fPostBuildtDynamicWriterT$fTriggerEventtDynamicWriterT$fPerformEventtDynamicWriterT$fMonadReaderrDynamicWriterT$fDynamicWritertwDynamicWriterT)$fMonadReflexCreateTriggertDynamicWriterT$fMonadAtomicRefDynamicWriterT$fMonadRefDynamicWriterT$fFunctorDynamicWriterT$fApplicativeDynamicWriterT$fMonadDynamicWriterT$fMonadTransDynamicWriterT$fMFunctorTYPEDynamicWriterT$fMonadIODynamicWriterT$fMonadFixDynamicWriterT#$fMonadAsyncExceptionDynamicWriterT$fMonadExceptionDynamicWriterT$fMonadCatchDynamicWriterT$fMonadThrowDynamicWriterT$fMonadMaskDynamicWriterT $fMonadSampleTYPEtDynamicWriterT$fMonadHoldTYPEtDynamicWriterTBehaviorWriterTunBehaviorWriterTrunBehaviorWriterTwithBehaviorWriterT$fAdjustabletBehaviorWriterT$fMonadQuerytqBehaviorWriterT$fRequestertBehaviorWriterT$fMonadStatesBehaviorWriterT$fPostBuildtBehaviorWriterT$fTriggerEventtBehaviorWriterT$fPerformEventtBehaviorWriterT$fMonadReaderrBehaviorWriterT!$fBehaviorWritertwBehaviorWriterT*$fMonadReflexCreateTriggertBehaviorWriterT$fMonadAtomicRefBehaviorWriterT$fMonadRefBehaviorWriterT$fFunctorBehaviorWriterT$fApplicativeBehaviorWriterT$fMonadBehaviorWriterT$fMonadTransBehaviorWriterT$fMFunctorTYPEBehaviorWriterT$fMonadIOBehaviorWriterT$fMonadFixBehaviorWriterT$$fMonadAsyncExceptionBehaviorWriterT$fMonadExceptionBehaviorWriterT$fMonadCatchBehaviorWriterT$fMonadThrowBehaviorWriterT$fMonadMaskBehaviorWriterT!$fMonadSampleTYPEtBehaviorWriterT$fMonadHoldTYPEtBehaviorWriterTNotReady notReadyUntilnotReady$fNotReadytTriggerEventT$fNotReadytRequesterT$fNotReadytPerformEventT$fNotReadytQueryT$fNotReadytBehaviorWriterT$fNotReadytDynamicWriterT$fNotReadytEventWriterT$fNotReadytPostBuildT$fNotReadytWriterT$fNotReadytReaderTSpiderHostFramerunSpiderHostFrame SpiderHost unSpiderHostSpiderEventHandlespiderEventHandleSubscriptionspiderEventHandleValue RootTrigger SpiderPushMComputeM SpiderPullMLocalSpiderTimeline SpiderEnvSpiderTimelineSomeSwitchSubscribedHeightunHeightMerge_merge_parentsRef_merge_heightBagRef_merge_heightRef _merge_sub_merge_accumRefMergeDestroyFunc MergeInitFuncMergeGetSubscriptionMergeUpdateFuncFanInt_fanInt_subscribers_fanInt_subscriptionRef_fanInt_occRefSomeResetCoincidenceEventLoopExceptionCanTraceWeakListSomeAssignment RootClearIntClearClearResultMDynunDynDynType UnsafeDynBuildDynHoldDyn CoincidencecoincidenceParentcoincidenceSubscribedCoincidenceSubscribed%coincidenceSubscribedCachedSubscribedcoincidenceSubscribedOccurrence coincidenceSubscribedSubscriberscoincidenceSubscribedHeightcoincidenceSubscribedOuter coincidenceSubscribedOuterParent coincidenceSubscribedInnerParentcoincidenceSubscribedWeakSelfSwitch switchParentswitchSubscribedSwitchSubscribed switchSubscribedCachedSubscribedswitchSubscribedOccurrenceswitchSubscribedHeightswitchSubscribedSubscribersswitchSubscribedOwnInvalidator"switchSubscribedOwnWeakInvalidatorswitchSubscribedBehaviorParentsswitchSubscribedParentswitchSubscribedCurrentParentswitchSubscribedWeakSelfFan fanParent fanSubscribed FanSubscribedfanSubscribedCachedSubscribedfanSubscribedOccurrencefanSubscribedSubscribersfanSubscribedParentFanSubscribedChildren_fanSubscribedChildren_list_fanSubscribedChildren_self_fanSubscribedChildren_weakSelf HeightBag_heightBag_size_heightBag_contentsMergeSubscribedParentWithMove+_mergeSubscribedParentWithMove_subscription"_mergeSubscribedParentWithMove_keyMergeSubscribedParentunMergeSubscribedParentEventMunEventM SomeMergeInitunSomeMergeInitSomeMergeUpdate_someMergeUpdate_update!_someMergeUpdate_invalidateHeight"_someMergeUpdate_recalculateHeight SomeDynInit SomeHoldInitRootrootOccurrencerootSubscribedrootInitRootSubscribedrootSubscribedKeyrootSubscribedCachedSubscribedrootSubscribedSubscribersrootSubscribedOccurrencerootSubscribedUninitrootSubscribedWeakSelf InvalidatorInvalidatorPullInvalidatorSwitchPull pullValue pullComputePullSubscribedpullSubscribedValuepullSubscribedInvalidatorspullSubscribedOwnInvalidatorpullSubscribedParentsSomeBehaviorSubscribedBehaviorSubscribedBehaviorSubscribedHoldBehaviorSubscribedPull BehaviorM unBehaviorM BehaviorEnvHasSpiderTimelinespiderTimelineHasCurrentHeightgetCurrentHeight scheduleMergeDefergetDeferralQueueEventEnveventEnvAssignmentseventEnvHoldInitseventEnvDynInitseventEnvMergeUpdateseventEnvMergeInitseventEnvClearseventEnvIntClearseventEnvRootClearseventEnvCurrentHeighteventEnvResetCoincidenceseventEnvDelayedMergesSpiderTimelineEnv'SpiderTimelineEnv_spiderTimeline_lock_spiderTimeline_eventEnvSTEunSTEGlobalHold holdValueholdInvalidators holdEvent holdParentdynamicCurrentdynamicUpdatedDynamicSreadBehaviorTrackedEventSubscribedeventSubscribedHeightRefeventSubscribedRetained SubscribersubscriberPropagatesubscriberInvalidateHeightsubscriberRecalculateHeightCacheSubscribed_cacheSubscribed_subscribers_cacheSubscribed_parent_cacheSubscribed_occurrenceEventSubscription_eventSubscription_unsubscribe_eventSubscription_subscribedSpiderBehaviorunSpiderBehavior SpiderEvent unSpiderEvent SpiderDynamicunSpiderDynamicSpiderIncrementalunSpiderIncremental debugStrLndebugPropagatedebugInvalidateHeightdebugInvalidate showNodeId showNodeId' unsubscribesubscribeAndReadterminalSubscribersubscribeAndReadHeadnowSpiderEventM cacheEventcacheSubscription subscribewrap eventRootsubscribeAndReadNever eventNevereventFan eventSwitcheventCoincidence eventHoldeventDynsubscribeCoincidenceInnernewSubscriberHoldnewSubscriberFannewSubscriberSwitchnewSubscriberCoincidenceOuternewSubscriberCoincidenceInnerinvalidateSubscriberHeightrecalculateSubscriberHeight propagate propagateFasttoAnyeventSubscribedRooteventSubscribedNevereventSubscribedNoweventSubscribedFaneventSubscribedSwitcheventSubscribedCoincidencegetEventSubscribedHeightsubscribeHoldEvent behaviorHoldbehaviorHoldIdentity behaviorConst behaviorPull behaviorDynreadHoldTrackedreadBehaviorUntracked dynamicHolddynamicHoldIdentity dynamicConst dynamicDyndynamicDynIdentityglobalSpiderTimelineEnv runEventM asksEventEnvdeferputCurrentHeight scheduleClearscheduleIntClearscheduleRootCleargetHoldEventSubscriptionheightBagEmpty heightBagSizeheightBagFromList heightBagAddheightBagRemoveheightBagRemoveMaybe heightBagMaxheightBagVerifynewInvalidatorSwitchnewInvalidatorPull newMapDynrunscheduleMerge' debugFinalizemkWeakPtrWithDebugwithIncreasedDepthtracePropagatetraceInvalidatetraceInvalidateHeightdebugSubscriberdebugSubscriber'tracetraceMwhoCreatedIORef groupByHead listsToForest showStacks filterStackpropagateSubscriberHold runBehaviorMaskInvalidator askParentsRefaskBehaviorHoldInits getDynHoldzeroRefgetRootSubscribedcleanupRootSubscribedsubscribeRootSubscribed newFanIntfanIntSubscribedgetFanSubscribedcleanupFanSubscribedsubscribeFanSubscribedgetSwitchSubscribedcleanupSwitchSubscribedsubscribeSwitchSubscribedgetCoincidenceSubscribedcleanupCoincidenceSubscribedsubscribeCoincidenceSubscribed mergeWithMove mergeCheapmergeCheapWithMoveinvalidateMergeHeightinvalidateMergeHeight'revalidateMergeHeightscheduleMergeSelf checkCyclemergeSubscriber updateMerge mergeGCheap' mergeIntCheap runHoldInitsinitHoldinitDyn newEventEnv clearEventEnvrunFrame zeroHeight invalidHeight succHeightinvalidateCoincidenceHeightupdateSwitchHeightrecalculateCoincidenceHeightcalculateSwitchHeightcalculateCoincidenceHeight invalidate newJoinDynmapDynamicSpiderholdSpiderEventMholdDynSpiderEventMholdIncrementalSpiderEventMbuildDynamicSpiderEventMunsafeNewSpiderTimelineEnvnewSpiderTimelinelocalSpiderTimelinewithSpiderTimeline runSpiderHostrunSpiderHostForTimelinenewEventWithTriggerIOnewFanEventWithTriggerIO$fMonadAtomicRefEventM$fMonadRefEventM$fShowEventLoopException$fExceptionEventLoopException$fMonadBehaviorM$fDeferSomeHoldInitBehaviorM$fGEqTYPESpiderTimelineEnv$fEqSpiderTimelineEnv!$fDeferSomeResetCoincidenceEventM$fDeferSomeEventM$fDeferSomeEventM0$fDeferSomeEventM1$fHasSpiderTimelineGlobal$fDeferSomeMergeInitEventM$fDeferSomeMergeUpdateEventM$fDeferSomeDynInitEventM$fDeferSomeHoldInitEventM$fDeferSomeAssignmentEventM$fHasCurrentHeightxEventM#$fMonadHoldTYPESpiderTimelineEventM%$fMonadSampleTYPESpiderTimelineEventM&$fHasSpiderTimelineLocalSpiderTimeline*$fMonadSampleTYPESpiderTimelineSpiderPullM$fReflexTYPESpiderTimeline($fMonadHoldTYPESpiderTimelineSpiderPushM*$fMonadSampleTYPESpiderTimelineSpiderPushM%$fNotReadySpiderTimelinePerformEventT"$fNotReadySpiderTimelineSpiderHost$fMonadAtomicRefSpiderHost$fMonadRefSpiderHost$fMonadFailSpiderHost$fMonadSpiderHost2$fMonadReflexCreateTriggerSpiderTimelineSpiderHost)$fMonadSampleTYPESpiderTimelineSpiderHost$fPrimMonadSpiderHostFrame$fMonadAtomicRefSpiderHostFrame$fMonadRefSpiderHostFrame'$fNotReadySpiderTimelineSpiderHostFrame$fMonadSpiderHostFrame-$fMonadSubscribeEventSpiderTimelineSpiderHost7$fMonadReflexCreateTriggerSpiderTimelineSpiderHostFrame$fReflexHostSpiderTimeline2$fMonadSubscribeEventSpiderTimelineSpiderHostFrame,$fMonadHoldTYPESpiderTimelineSpiderHostFrame.$fMonadSampleTYPESpiderTimelineSpiderHostFrame'$fMonadHoldTYPESpiderTimelineSpiderHost)$fMonadReflexHostSpiderTimelineSpiderHost'$fMonadReadEventSpiderTimelineReadPhase&$fMonadHoldTYPESpiderTimelineReadPhase($fMonadSampleTYPESpiderTimelineReadPhase$fFunctorReadPhase$fApplicativeReadPhase$fMonadReadPhase$fMonadFixReadPhase$fFunctorSpiderHostFrame$fApplicativeSpiderHostFrame$fMonadFixSpiderHostFrame$fMonadIOSpiderHostFrame$fMonadExceptionSpiderHostFrame$$fMonadAsyncExceptionSpiderHostFrame$fMonadMaskSpiderHostFrame$fMonadThrowSpiderHostFrame$fMonadCatchSpiderHostFrame$fFunctorSpiderHost$fApplicativeSpiderHost$fMonadFixSpiderHost$fMonadIOSpiderHost$fMonadExceptionSpiderHost$fMonadAsyncExceptionSpiderHost$fFunctorSpiderPushM$fApplicativeSpiderPushM$fMonadSpiderPushM$fMonadIOSpiderPushM$fMonadFixSpiderPushM$fFunctorSpiderPullM$fApplicativeSpiderPullM$fMonadSpiderPullM$fMonadIOSpiderPullM$fMonadFixSpiderPullM$fFunctorBehaviorM$fApplicativeBehaviorM$fMonadIOBehaviorM$fMonadFixBehaviorM$fMonadReader(,)BehaviorM $fShowHeight $fReadHeight $fEqHeight $fOrdHeight$fBoundedHeight$fShowHeightBag$fReadHeightBag $fEqHeightBag$fOrdHeightBag$fFunctorEventM$fApplicativeEventM $fMonadEventM$fMonadIOEventM$fMonadFixEventM$fMonadExceptionEventM$fMonadAsyncExceptionEventM$fMonadCatchEventM$fMonadThrowEventM$fMonadMaskEventM$fFunctorDynamic0 ProfiledM runProfiledMCostCentreTree_costCentreTree_ownEntries!_costCentreTree_cumulativeEntries_costCentreTree_childrenProfiledTimeline profilingDatagetCostCentreStacktoCostCentreTreegetCostCentreTreeformatCostCentreTreeshowProfilingDatawriteProfilingData profileEvent$fMonoidCostCentreTree$fSemigroupCostCentreTree)$fMonadReadEventProfiledTimelineProfiledM*$fMonadReflexHostProfiledTimelineProfiledM$fPrimMonadProfiledM.$fMonadSubscribeEventProfiledTimelineProfiledM$fReflexHostProfiledTimeline$fMonadReaderrProfiledM3$fMonadReflexCreateTriggerProfiledTimelineProfiledM$fMonadRefProfiledM$$fRequesterProfiledTimelineProfiledM&$fMonadQueryProfiledTimelineqProfiledM'$fEventWriterProfiledTimelinewProfiledM)$fDynamicWriterProfiledTimelinewProfiledM*$fBehaviorWriterProfiledTimelinewProfiledM#$fNotReadyProfiledTimelineProfiledM$$fPostBuildProfiledTimelineProfiledM'$fTriggerEventProfiledTimelineProfiledM'$fPerformEventProfiledTimelineProfiledM$fMonadIOProfiledM$fMonadTransProfiledM%$fAdjustableProfiledTimelineProfiledM*$fMonadSampleTYPEProfiledTimelineProfiledM($fMonadHoldTYPEProfiledTimelineProfiledM$fReflexTYPEProfiledTimeline$fFunctorProfiledM$fApplicativeProfiledM$fMonadProfiledM$fMonadFixProfiledM$fMonadExceptionProfiledM$fMonadAsyncExceptionProfiledM$fShowCostCentreTree$fEqCostCentreTree$fOrdCostCentreTree networkView networkHold untilReadyMonadHeadlessApprunHeadlessApp sortableListWorkflow unWorkflowworkflow workflowView mapWorkflowmapWorkflowCheap2monoidal-containers-0.6.2.0-JBECrGg5CYb3RHBFqjdrQ6Data.Map.Monoidal MonoidalMapgetMonoidalMapbase GHC.MaybeNothingvalidmaxViewWithKeyminViewWithKeymaxViewminViewupdateMaxWithKeyupdateMinWithKey updateMax updateMin deleteFindMax deleteFindMin deleteMax deleteMinfindMaxfindMin lookupMax lookupMinsplitAtdroptakedeleteAtupdateAtelemAt findIndex lookupIndexisProperSubmapOfByisProperSubmapOf isSubmapOfBy isSubmapOf splitRoot splitLookupsplitmapEitherWithKey mapEithermapMaybeWithKey spanAntitonedropWhileAntitonetakeWhileAntitonepartitionWithKey partition withoutKeys restrictKeys filterWithKeyfilterfromDistinctDescListfromDescListWithKeyfromDescListWith fromDescListfromDistinctListfromDistinctAscListfromAscListWithKeyfromAscListWith fromAscList toDescList toAscListfromListWithKey fromListWithfromListfromSetkeysSet foldlWithKey' foldrWithKey'foldl'foldr'foldMapWithKey foldlWithKey foldrWithKeyfoldlfoldrmapKeysMonotonic mapKeysWithmapKeysmapAccumRWithKeymapAccumWithKeytraverseMaybeWithKeytraverseWithKey mapWithKeymap mergeWithKeyintersectionWithKeyintersectionWithdifferenceWithKeydifferenceWith unionsWith unionWithKey unionWithalterupdateLookupWithKey updateWithKeyupdate adjustWithKeyadjustinsertLookupWithKey insertWithKey insertWithlookupGElookupLElookupGTlookupLTnull\\!!?keyselemsassocsdeletefindWithDefault notMembermembercontainers-0.6.5.1Data.IntMap.InternalData.Map.Internalghc-prim GHC.ClassesEqData.Set.InternalSetGHC.WeakWeakMaybe GHC.TypesIntData.Type.CoercionCoercionGHC.BasefmapliftA2liftA3 Data.EitherLeftRightJustTrueFalseString$these-1.1.1.1-2vmwfmQjSJuBIbE7OfEJrF Data.TheseThisThatTheseData.Patch.Class PatchTargetPatchData.Patch.MapPatchMap,dependent-map-0.4.0.0-EN6A1AQOdPe4MJ763hNm1AData.Dependent.Map.InternalDMap Applicative,dependent-sum-0.7.1.0-Au9YRzdidtd2VNyhI7K4VXData.Dependent.SumDSum)semigroupoids-5.3.5-GWhf5jAf5ELc2RZmHE0ZSData.Functor.PluszeroGroup~~negateG AdditivePatchunAdditivePatchData.Patch.DMapWithMoveconst2PatchDMapWithMoveWith'patchDMapWithMoveToPatchMapWithMoveWithweakenPatchDMapWithMoveWith traversePatchDMapWithMoveWithKeymapPatchDMapWithMoveunsafePatchDMapWithMoveunPatchDMapWithMovePatchDMapWithMoveData.Patch.MapWithMovepatchMapWithMoveNewElementsMappatchMapWithMoveNewElementsunsafePatchMapWithMovePatchMapWithMoveunPatchMapWithMoveData.Patch.DMapconst2IntPatchDMapWithconst2PatchDMapWithpatchDMapToPatchMapWithweakenPatchDMapWithtraversePatchDMapWithKeytraversePatchDMap mapPatchDMap PatchDMap unPatchDMappatchMapNewElementsMappatchMapNewElements unPatchMapmapIntMapPatchWithKeycomposePatchFunctions applyAlwaysapply SemigroupDoubleFloat Debug.TraceEitherMonadGHC.EnumEnumpred&MemoTrie-0.6.10-9QCP6ZrhAZHAsTIeDTyym5 Data.MemoTrieHasTrieIOData.Functor.IdentityIdentityControl.Concurrent.ChanChan time-1.9.3 Data.Time.Clock.Internal.UTCTimeUTCTime$prim-uniq-0.2-5PJg3v1nIrgEUL39cn7P9TUnsafe.Unique.TagTagtransformers-0.5.6.2Control.Monad.Trans.Class MonadTransBehavior_ProfiledunBehavior_ProfiledEvent_ProfiledunEvent_ProfiledDynamic_ProfiledunDynamic_ProfiledIncremental_ProfiledunIncremental_Profiled