reflex-dom-0.3: Functional Reactive Web Apps with Reflex

Safe HaskellNone
LanguageHaskell98

Reflex.Dom.Class

Synopsis

Documentation

(=:) :: k -> a -> Map k a Source

Alias for Data.Map.singleton

class (Reflex t, MonadHold t m, MonadIO m, MonadAsyncException m, Functor m, MonadReflexCreateTrigger t m, HasDocument m, HasWebView m, HasWebView (WidgetHost m), HasWebView (GuiAction m), MonadIO (WidgetHost m), MonadAsyncException (WidgetHost m), MonadIO (GuiAction m), MonadAsyncException (GuiAction m), Functor (WidgetHost m), MonadSample t (WidgetHost m), HasPostGui t (GuiAction m) (WidgetHost m), HasPostGui t (GuiAction m) m, HasPostGui t (GuiAction m) (GuiAction m), MonadRef m, MonadRef (WidgetHost m), Ref m ~ Ref IO, Ref (WidgetHost m) ~ Ref IO, MonadFix m) => MonadWidget t m | m -> t where Source

Associated Types

type WidgetHost m :: * -> * Source

type GuiAction m :: * -> * Source

Methods

askParent :: m Node Source

subWidget :: Node -> m a -> m a Source

subWidgetWithVoidActions :: Node -> m a -> m (a, Event t (WidgetHost m ())) Source

liftWidgetHost :: WidgetHost m a -> m a Source

schedulePostBuild :: WidgetHost m () -> m () Source

addVoidAction :: Event t (WidgetHost m ()) -> m () Source

getRunWidget :: IsNode n => m (n -> m a -> WidgetHost m (a, WidgetHost m (), Event t (WidgetHost m ()))) Source

Instances

newtype Restore m Source

Constructors

Restore 

Fields

restore :: forall a. m a -> IO a
 

class (MonadRef h, Ref h ~ Ref m, MonadRef m) => HasPostGui t h m | m -> t h where Source

Methods

askPostGui :: m (h () -> IO ()) Source

askRunWithActions :: m ([DSum (EventTrigger t) Identity] -> h ()) Source

Instances

HasPostGui t h m => HasPostGui t h (ReaderT r m) Source 
HasPostGui t h m => HasPostGui t h (Widget t m) Source 
(MonadRef h, (~) (* -> *) (Ref h) (Ref m), MonadRef m) => HasPostGui t h (Gui t h m) Source 
HasPostGui t h m => HasPostGui t (WithWebView h) (WithWebView m) Source 

runFrameWithTriggerRef :: (HasPostGui t h m, MonadRef m, MonadIO m) => Ref m (Maybe (EventTrigger t a)) -> a -> m () Source

performEvent_ :: MonadWidget t m => Event t (WidgetHost m ()) -> m () Source

performEvent :: (MonadWidget t m, Ref m ~ Ref IO) => Event t (WidgetHost m a) -> m (Event t a) Source

performEventAsync :: forall t m a. MonadWidget t m => Event t ((a -> IO ()) -> WidgetHost m ()) -> m (Event t a) Source