jsaddle-0.9.2.0: Interface for JavaScript that works with GHCJS and GHC

Safe HaskellNone
LanguageHaskell2010

GHCJS.Types

Synopsis

Documentation

data WouldBlockException Source #

If a synchronous thread tries to do something that can only be done asynchronously, and the thread is set up to not continue asynchronously, it receives this exception.

Constructors

WouldBlockException 

data JSString Source #

A wrapper around a JavaScript string

Instances

Eq JSString Source # 
Data JSString Source # 

Methods

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

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

toConstr :: JSString -> Constr #

dataTypeOf :: JSString -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord JSString Source # 
Read JSString Source # 
Show JSString Source # 
IsString JSString Source # 
Monoid JSString Source # 
ToJSON JSString Source # 
FromJSON JSString Source # 
NFData JSString Source # 

Methods

rnf :: JSString -> () #

type Item JSString # 

type JSRef a = JSVal Source #

Deprecated: Use JSVal instead, or a more specific newtype wrapper of JSVal

This is a deprecated copmatibility wrapper for the old JSRef type.

See https://github.com/ghcjs/ghcjs/issues/421