ghcjs-base-0.2.0.0: base library for GHCJS

Safe HaskellNone
LanguageHaskell98

JavaScript.Web.XMLHttpRequest

Documentation

xhr :: forall a. ResponseType a => Request -> IO (Response a) Source #

data Method Source #

Constructors

GET 
POST 
PUT 
DELETE 
Instances
Enum Method Source # 
Instance details

Defined in JavaScript.Web.XMLHttpRequest

Eq Method Source # 
Instance details

Defined in JavaScript.Web.XMLHttpRequest

Methods

(==) :: Method -> Method -> Bool #

(/=) :: Method -> Method -> Bool #

Ord Method Source # 
Instance details

Defined in JavaScript.Web.XMLHttpRequest

Show Method Source # 
Instance details

Defined in JavaScript.Web.XMLHttpRequest

data RequestData Source #

Constructors

NoData 
StringData JSString 
TypedArrayData (forall e. SomeTypedArray e Immutable) 
FormData [(JSString, FormDataVal)] 

data Response a Source #

Instances
Functor Response Source # 
Instance details

Defined in JavaScript.Web.XMLHttpRequest

Methods

fmap :: (a -> b) -> Response a -> Response b #

(<$) :: a -> Response b -> Response a #

data XHRError Source #

Constructors

XHRError String 
XHRAborted 
Instances
Eq XHRError Source # 
Instance details

Defined in JavaScript.Web.XMLHttpRequest

Data XHRError Source # 
Instance details

Defined in JavaScript.Web.XMLHttpRequest

Methods

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

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

toConstr :: XHRError -> Constr

dataTypeOf :: XHRError -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c XHRError)

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

gmapT :: (forall b. Data b => b -> b) -> XHRError -> XHRError

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

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

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

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

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

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

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

Show XHRError Source # 
Instance details

Defined in JavaScript.Web.XMLHttpRequest

Generic XHRError Source # 
Instance details

Defined in JavaScript.Web.XMLHttpRequest

Associated Types

type Rep XHRError :: * -> *

Methods

from :: XHRError -> Rep XHRError x

to :: Rep XHRError x -> XHRError

Exception XHRError Source # 
Instance details

Defined in JavaScript.Web.XMLHttpRequest

type Rep XHRError Source # 
Instance details

Defined in JavaScript.Web.XMLHttpRequest

type Rep XHRError = D1 (MetaData "XHRError" "JavaScript.Web.XMLHttpRequest" "ghcjs-base-0.2.0.0-inplace" False) (C1 (MetaCons "XHRError" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)) :+: C1 (MetaCons "XHRAborted" PrefixI False) (U1 :: * -> *))