jmacro-0.6.15: QuasiQuotation library for programmatic generation of Javascript code.

Safe HaskellNone
LanguageHaskell98

Language.Javascript.JMacro.Types

Documentation

data JType Source #

Instances

Eq JType Source # 

Methods

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

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

Data JType Source # 

Methods

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

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

toConstr :: JType -> Constr #

dataTypeOf :: JType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord JType Source # 

Methods

compare :: JType -> JType -> Ordering #

(<) :: JType -> JType -> Bool #

(<=) :: JType -> JType -> Bool #

(>) :: JType -> JType -> Bool #

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

max :: JType -> JType -> JType #

min :: JType -> JType -> JType #

Read JType Source # 
Show JType Source # 

Methods

showsPrec :: Int -> JType -> ShowS #

show :: JType -> String #

showList :: [JType] -> ShowS #

JsToDoc JLocalType Source # 
JsToDoc JType Source # 

Methods

jsToDoc :: JType -> Doc Source #

Compos1 JType Source # 

Methods

compos1 :: (forall a. a -> m a) -> (forall a b. m (a -> b) -> m a -> m b) -> (JType -> m JType) -> JType -> m JType Source #

data Constraint Source #

Constructors

Sub JType 
Super JType 

Instances

Eq Constraint Source # 
Data Constraint Source # 

Methods

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

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

toConstr :: Constraint -> Constr #

dataTypeOf :: Constraint -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Constraint Source # 
Read Constraint Source # 
Show Constraint Source # 
JsToDoc JLocalType Source # 

anyType :: TypeParser JType Source #