reflex-dom-core-0.8.0.0: Functional Reactive Web Apps with Reflex

Safe HaskellNone
LanguageHaskell98

Foreign.JavaScript.TH

Synopsis

Documentation

newtype JSContextSingleton x Source #

A singleton type for a given JSContext; we use this to statically guarantee that different JSContexts don't get mixed up

newtype WithJSContextSingleton x m a Source #

Instances
PerformEvent t m => PerformEvent t (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

Associated Types

type Performable (WithJSContextSingleton x m) :: Type -> Type Source #

MonadSubscribeEvent t m => MonadSubscribeEvent t (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

MonadReflexCreateTrigger t m => MonadReflexCreateTrigger t (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

MonadReflexHost t m => MonadReflexHost t (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

Associated Types

type ReadPhase (WithJSContextSingleton x m) :: Type -> Type Source #

Adjustable t m => Adjustable t (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

MonadTrans (WithJSContextSingleton x) Source # 
Instance details

Defined in Foreign.JavaScript.TH

Methods

lift :: Monad m => m a -> WithJSContextSingleton x m a Source #

MonadTransControl (WithJSContextSingleton x) Source # 
Instance details

Defined in Foreign.JavaScript.TH

Associated Types

type StT (WithJSContextSingleton x) a :: Type Source #

MonadSample t m => MonadSample (t :: Type) (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

MonadHold t m => MonadHold (t :: Type) (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

Monad m => Monad (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

Functor m => Functor (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

MonadFix m => MonadFix (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

Applicative m => Applicative (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

MonadIO m => MonadIO (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

Methods

liftIO :: IO a -> WithJSContextSingleton x m a Source #

MonadException m => MonadException (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

MonadAsyncException m => MonadAsyncException (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

MonadIO m => MonadJSM (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

PrimMonad m => PrimMonad (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

Associated Types

type PrimState (WithJSContextSingleton x m) :: Type Source #

MonadRef m => MonadRef (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

Associated Types

type Ref (WithJSContextSingleton x m) :: Type -> Type Source #

MonadAtomicRef m => MonadAtomicRef (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

type StT (WithJSContextSingleton x) a Source # 
Instance details

Defined in Foreign.JavaScript.TH

type PrimState (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

type Ref (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

type Performable (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

type ReadPhase (WithJSContextSingleton x m) Source # 
Instance details

Defined in Foreign.JavaScript.TH

withJSContextSingleton :: MonadJSM m => (forall x. JSContextSingleton x -> m r) -> m r Source #

withJSContextSingletonMono :: MonadJSM m => (JSContextSingleton () -> m r) -> m r Source #

Warning: withJSContextSingletonMono does not provide the same guarantees that withJSContextSingleton does.

data Safety Source #

Constructors

Unsafe 
Safe 
Interruptible 
Instances
Eq Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Data Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Safety -> c Safety Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Safety Source #

toConstr :: Safety -> Constr Source #

dataTypeOf :: Safety -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Safety) Source #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Safety) Source #

gmapT :: (forall b. Data b => b -> b) -> Safety -> Safety Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Safety -> r Source #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Safety -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> Safety -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Safety -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Safety -> m Safety Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Safety -> m Safety Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Safety -> m Safety Source #

Ord Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Safety :: Type -> Type Source #

type Rep Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Safety = D1 (MetaData "Safety" "Language.Haskell.TH.Syntax" "template-haskell" False) (C1 (MetaCons "Unsafe" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Safe" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Interruptible" PrefixI False) (U1 :: Type -> Type)))