language-javascript-0.6.0.13: Parser for JavaScript

Safe HaskellSafe
LanguageHaskell98

Language.JavaScript.Parser.AST

Synopsis

Documentation

data JSExpression Source #

Constructors

JSIdentifier !JSAnnot !String

Terminals

JSDecimal !JSAnnot !String 
JSLiteral !JSAnnot !String 
JSHexInteger !JSAnnot !String 
JSOctal !JSAnnot !String 
JSStringLiteral !JSAnnot !String 
JSRegEx !JSAnnot !String 
JSArrayLiteral !JSAnnot ![JSArrayElement] !JSAnnot

lb, contents, rb

JSAssignExpression !JSExpression !JSAssignOp !JSExpression

lhs, assignop, rhs

JSCallExpression !JSExpression !JSAnnot !(JSCommaList JSExpression) !JSAnnot

expr, bl, args, rb

JSCallExpressionDot !JSExpression !JSAnnot !JSExpression

expr, dot, expr

JSCallExpressionSquare !JSExpression !JSAnnot !JSExpression !JSAnnot

expr, [, expr, ]

JSCommaExpression !JSExpression !JSAnnot !JSExpression

expression components

JSExpressionBinary !JSExpression !JSBinOp !JSExpression

lhs, op, rhs

JSExpressionParen !JSAnnot !JSExpression !JSAnnot

lb,expression,rb

JSExpressionPostfix !JSExpression !JSUnaryOp

expression, operator

JSExpressionTernary !JSExpression !JSAnnot !JSExpression !JSAnnot !JSExpression

cond, ?, trueval, :, falseval

JSArrowExpression !JSArrowParameterList !JSAnnot !JSStatement

parameter list,arrow,block`

JSFunctionExpression !JSAnnot !JSIdent !JSAnnot !(JSCommaList JSIdent) !JSAnnot !JSBlock

fn,name,lb, parameter list,rb,block`

JSMemberDot !JSExpression !JSAnnot !JSExpression

firstpart, dot, name

JSMemberExpression !JSExpression !JSAnnot !(JSCommaList JSExpression) !JSAnnot 
JSMemberNew !JSAnnot !JSExpression !JSAnnot !(JSCommaList JSExpression) !JSAnnot

new, name, lb, args, rb

JSMemberSquare !JSExpression !JSAnnot !JSExpression !JSAnnot

firstpart, lb, expr, rb

JSNewExpression !JSAnnot !JSExpression

new, expr

JSObjectLiteral !JSAnnot !JSObjectPropertyList !JSAnnot

lbrace contents rbrace

JSSpreadExpression !JSAnnot !JSExpression 
JSUnaryExpression !JSUnaryOp !JSExpression 
JSVarInitExpression !JSExpression !JSVarInitializer

identifier, initializer

Instances
Eq JSExpression Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

(==) :: JSExpression -> JSExpression -> Bool

(/=) :: JSExpression -> JSExpression -> Bool

Data JSExpression Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSExpression -> Constr

dataTypeOf :: JSExpression -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSExpression Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSExpression -> ShowS

show :: JSExpression -> String

showList :: [JSExpression] -> ShowS

data JSAnnot Source #

Constructors

JSAnnot !TokenPosn ![CommentAnnotation]

Annotation: position and comment/whitespace information

JSAnnotSpace

A single space character

JSNoAnnot

No annotation

Instances
Eq JSAnnot Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

(==) :: JSAnnot -> JSAnnot -> Bool

(/=) :: JSAnnot -> JSAnnot -> Bool

Data JSAnnot Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSAnnot -> Constr

dataTypeOf :: JSAnnot -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSAnnot Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSAnnot -> ShowS

show :: JSAnnot -> String

showList :: [JSAnnot] -> ShowS

data JSBinOp Source #

Instances
Eq JSBinOp Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

(==) :: JSBinOp -> JSBinOp -> Bool

(/=) :: JSBinOp -> JSBinOp -> Bool

Data JSBinOp Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSBinOp -> Constr

dataTypeOf :: JSBinOp -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSBinOp Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSBinOp -> ShowS

show :: JSBinOp -> String

showList :: [JSBinOp] -> ShowS

data JSUnaryOp Source #

Instances
Eq JSUnaryOp Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

(==) :: JSUnaryOp -> JSUnaryOp -> Bool

(/=) :: JSUnaryOp -> JSUnaryOp -> Bool

Data JSUnaryOp Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSUnaryOp -> Constr

dataTypeOf :: JSUnaryOp -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSUnaryOp Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSUnaryOp -> ShowS

show :: JSUnaryOp -> String

showList :: [JSUnaryOp] -> ShowS

data JSSemi Source #

Constructors

JSSemi !JSAnnot 
JSSemiAuto 
Instances
Eq JSSemi Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

(==) :: JSSemi -> JSSemi -> Bool

(/=) :: JSSemi -> JSSemi -> Bool

Data JSSemi Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSSemi -> Constr

dataTypeOf :: JSSemi -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSSemi Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSSemi -> ShowS

show :: JSSemi -> String

showList :: [JSSemi] -> ShowS

data JSAssignOp Source #

Instances
Eq JSAssignOp Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

(==) :: JSAssignOp -> JSAssignOp -> Bool

(/=) :: JSAssignOp -> JSAssignOp -> Bool

Data JSAssignOp Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSAssignOp -> Constr

dataTypeOf :: JSAssignOp -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSAssignOp Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSAssignOp -> ShowS

show :: JSAssignOp -> String

showList :: [JSAssignOp] -> ShowS

data JSTryCatch Source #

Constructors

JSCatch !JSAnnot !JSAnnot !JSExpression !JSAnnot !JSBlock

catch,lb,ident,rb,block

JSCatchIf !JSAnnot !JSAnnot !JSExpression !JSAnnot !JSExpression !JSAnnot !JSBlock

catch,lb,ident,if,expr,rb,block

Instances
Eq JSTryCatch Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

(==) :: JSTryCatch -> JSTryCatch -> Bool

(/=) :: JSTryCatch -> JSTryCatch -> Bool

Data JSTryCatch Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSTryCatch -> Constr

dataTypeOf :: JSTryCatch -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSTryCatch Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSTryCatch -> ShowS

show :: JSTryCatch -> String

showList :: [JSTryCatch] -> ShowS

data JSTryFinally Source #

Constructors

JSFinally !JSAnnot !JSBlock

finally,block

JSNoFinally 
Instances
Eq JSTryFinally Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

(==) :: JSTryFinally -> JSTryFinally -> Bool

(/=) :: JSTryFinally -> JSTryFinally -> Bool

Data JSTryFinally Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSTryFinally -> Constr

dataTypeOf :: JSTryFinally -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSTryFinally Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSTryFinally -> ShowS

show :: JSTryFinally -> String

showList :: [JSTryFinally] -> ShowS

data JSStatement Source #

Constructors

JSStatementBlock !JSAnnot ![JSStatement] !JSAnnot !JSSemi

lbrace, stmts, rbrace, autosemi

JSBreak !JSAnnot !JSIdent !JSSemi

break,optional identifier, autosemi

JSLet !JSAnnot !(JSCommaList JSExpression) !JSSemi

const, decl, autosemi

JSConstant !JSAnnot !(JSCommaList JSExpression) !JSSemi

const, decl, autosemi

JSContinue !JSAnnot !JSIdent !JSSemi

continue, optional identifier,autosemi

JSDoWhile !JSAnnot !JSStatement !JSAnnot !JSAnnot !JSExpression !JSAnnot !JSSemi

do,stmt,while,lb,expr,rb,autosemi

JSFor !JSAnnot !JSAnnot !(JSCommaList JSExpression) !JSAnnot !(JSCommaList JSExpression) !JSAnnot !(JSCommaList JSExpression) !JSAnnot !JSStatement

for,lb,expr,semi,expr,semi,expr,rb.stmt

JSForIn !JSAnnot !JSAnnot !JSExpression !JSBinOp !JSExpression !JSAnnot !JSStatement

for,lb,expr,in,expr,rb,stmt

JSForVar !JSAnnot !JSAnnot !JSAnnot !(JSCommaList JSExpression) !JSAnnot !(JSCommaList JSExpression) !JSAnnot !(JSCommaList JSExpression) !JSAnnot !JSStatement

for,lb,var,vardecl,semi,expr,semi,expr,rb,stmt

JSForVarIn !JSAnnot !JSAnnot !JSAnnot !JSExpression !JSBinOp !JSExpression !JSAnnot !JSStatement

for,lb,var,vardecl,in,expr,rb,stmt

JSForLet !JSAnnot !JSAnnot !JSAnnot !(JSCommaList JSExpression) !JSAnnot !(JSCommaList JSExpression) !JSAnnot !(JSCommaList JSExpression) !JSAnnot !JSStatement

for,lb,var,vardecl,semi,expr,semi,expr,rb,stmt

JSForLetIn !JSAnnot !JSAnnot !JSAnnot !JSExpression !JSBinOp !JSExpression !JSAnnot !JSStatement

for,lb,var,vardecl,in,expr,rb,stmt

JSForLetOf !JSAnnot !JSAnnot !JSAnnot !JSExpression !JSBinOp !JSExpression !JSAnnot !JSStatement

for,lb,var,vardecl,in,expr,rb,stmt

JSForOf !JSAnnot !JSAnnot !JSExpression !JSBinOp !JSExpression !JSAnnot !JSStatement

for,lb,expr,in,expr,rb,stmt

JSForVarOf !JSAnnot !JSAnnot !JSAnnot !JSExpression !JSBinOp !JSExpression !JSAnnot !JSStatement

for,lb,var,vardecl,in,expr,rb,stmt

JSFunction !JSAnnot !JSIdent !JSAnnot !(JSCommaList JSIdent) !JSAnnot !JSBlock !JSSemi

fn,name, lb,parameter list,rb,block,autosemi

JSIf !JSAnnot !JSAnnot !JSExpression !JSAnnot !JSStatement

if,(,expr,),stmt

JSIfElse !JSAnnot !JSAnnot !JSExpression !JSAnnot !JSStatement !JSAnnot !JSStatement

if,(,expr,),stmt,else,rest

JSLabelled !JSIdent !JSAnnot !JSStatement

identifier,colon,stmt

JSEmptyStatement !JSAnnot 
JSExpressionStatement !JSExpression !JSSemi 
JSAssignStatement !JSExpression !JSAssignOp !JSExpression !JSSemi

lhs, assignop, rhs, autosemi

JSMethodCall !JSExpression !JSAnnot !(JSCommaList JSExpression) !JSAnnot !JSSemi 
JSReturn !JSAnnot !(Maybe JSExpression) !JSSemi

optional expression,autosemi

JSSwitch !JSAnnot !JSAnnot !JSExpression !JSAnnot !JSAnnot ![JSSwitchParts] !JSAnnot !JSSemi

switch,lb,expr,rb,caseblock,autosemi

JSThrow !JSAnnot !JSExpression !JSSemi

throw val autosemi

JSTry !JSAnnot !JSBlock ![JSTryCatch] !JSTryFinally

try,block,catches,finally

JSVariable !JSAnnot !(JSCommaList JSExpression) !JSSemi

var, decl, autosemi

JSWhile !JSAnnot !JSAnnot !JSExpression !JSAnnot !JSStatement

while,lb,expr,rb,stmt

JSWith !JSAnnot !JSAnnot !JSExpression !JSAnnot !JSStatement !JSSemi

with,lb,expr,rb,stmt list

Instances
Eq JSStatement Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

(==) :: JSStatement -> JSStatement -> Bool

(/=) :: JSStatement -> JSStatement -> Bool

Data JSStatement Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSStatement -> Constr

dataTypeOf :: JSStatement -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSStatement Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSStatement -> ShowS

show :: JSStatement -> String

showList :: [JSStatement] -> ShowS

data JSBlock Source #

Constructors

JSBlock !JSAnnot ![JSStatement] !JSAnnot

lbrace, stmts, rbrace

Instances
Eq JSBlock Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

(==) :: JSBlock -> JSBlock -> Bool

(/=) :: JSBlock -> JSBlock -> Bool

Data JSBlock Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSBlock -> Constr

dataTypeOf :: JSBlock -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSBlock Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSBlock -> ShowS

show :: JSBlock -> String

showList :: [JSBlock] -> ShowS

data JSSwitchParts Source #

Constructors

JSCase !JSAnnot !JSExpression !JSAnnot ![JSStatement]

expr,colon,stmtlist

JSDefault !JSAnnot !JSAnnot ![JSStatement]

colon,stmtlist

Instances
Eq JSSwitchParts Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Data JSSwitchParts Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSSwitchParts -> Constr

dataTypeOf :: JSSwitchParts -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSSwitchParts Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSSwitchParts -> ShowS

show :: JSSwitchParts -> String

showList :: [JSSwitchParts] -> ShowS

data JSAST Source #

Instances
Eq JSAST Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

(==) :: JSAST -> JSAST -> Bool

(/=) :: JSAST -> JSAST -> Bool

Data JSAST Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSAST -> Constr

dataTypeOf :: JSAST -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSAST Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSAST -> ShowS

show :: JSAST -> String

showList :: [JSAST] -> ShowS

data JSObjectProperty Source #

Constructors

JSPropertyAccessor !JSAccessor !JSPropertyName !JSAnnot ![JSExpression] !JSAnnot !JSBlock

(get|set), name, lb, params, rb, block

JSPropertyNameandValue !JSPropertyName !JSAnnot ![JSExpression]

name, colon, value

Instances
Eq JSObjectProperty Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Data JSObjectProperty Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSObjectProperty -> Constr

dataTypeOf :: JSObjectProperty -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSObjectProperty Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSObjectProperty -> ShowS

show :: JSObjectProperty -> String

showList :: [JSObjectProperty] -> ShowS

data JSPropertyName Source #

Constructors

JSPropertyIdent !JSAnnot !String 
JSPropertyString !JSAnnot !String 
JSPropertyNumber !JSAnnot !String 
Instances
Eq JSPropertyName Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Data JSPropertyName Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSPropertyName -> Constr

dataTypeOf :: JSPropertyName -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSPropertyName Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSPropertyName -> ShowS

show :: JSPropertyName -> String

showList :: [JSPropertyName] -> ShowS

data JSAccessor Source #

Accessors for JSObjectProperty is either get or set.

Instances
Eq JSAccessor Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

(==) :: JSAccessor -> JSAccessor -> Bool

(/=) :: JSAccessor -> JSAccessor -> Bool

Data JSAccessor Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSAccessor -> Constr

dataTypeOf :: JSAccessor -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSAccessor Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSAccessor -> ShowS

show :: JSAccessor -> String

showList :: [JSAccessor] -> ShowS

data JSIdent Source #

Constructors

JSIdentName !JSAnnot !String 
JSIdentNone 
Instances
Eq JSIdent Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

(==) :: JSIdent -> JSIdent -> Bool

(/=) :: JSIdent -> JSIdent -> Bool

Data JSIdent Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSIdent -> Constr

dataTypeOf :: JSIdent -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSIdent Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSIdent -> ShowS

show :: JSIdent -> String

showList :: [JSIdent] -> ShowS

data JSVarInitializer Source #

Constructors

JSVarInit !JSAnnot !JSExpression

assignop, initializer

JSVarInitNone 
Instances
Eq JSVarInitializer Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Data JSVarInitializer Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSVarInitializer -> Constr

dataTypeOf :: JSVarInitializer -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSVarInitializer Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSVarInitializer -> ShowS

show :: JSVarInitializer -> String

showList :: [JSVarInitializer] -> ShowS

data JSArrayElement Source #

Instances
Eq JSArrayElement Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Data JSArrayElement Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSArrayElement -> Constr

dataTypeOf :: JSArrayElement -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSArrayElement Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSArrayElement -> ShowS

show :: JSArrayElement -> String

showList :: [JSArrayElement] -> ShowS

data JSCommaList a Source #

Constructors

JSLCons !(JSCommaList a) !JSAnnot !a

head, comma, a

JSLOne !a

single element (no comma)

JSLNil 
Instances
Eq a => Eq (JSCommaList a) Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

(==) :: JSCommaList a -> JSCommaList a -> Bool

(/=) :: JSCommaList a -> JSCommaList a -> Bool

Data a => Data (JSCommaList a) Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSCommaList a -> Constr

dataTypeOf :: JSCommaList a -> DataType

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

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

gmapT :: (forall b. Data b => b -> b) -> JSCommaList a -> JSCommaList a

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

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

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

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

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

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

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

Show a => Show (JSCommaList a) Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSCommaList a -> ShowS

show :: JSCommaList a -> String

showList :: [JSCommaList a] -> ShowS

data JSCommaTrailingList a Source #

Constructors

JSCTLComma !(JSCommaList a) !JSAnnot

list, trailing comma

JSCTLNone !(JSCommaList a)

list

Instances
Eq a => Eq (JSCommaTrailingList a) Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Data a => Data (JSCommaTrailingList a) Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSCommaTrailingList a -> Constr

dataTypeOf :: JSCommaTrailingList a -> DataType

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

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

gmapT :: (forall b. Data b => b -> b) -> JSCommaTrailingList a -> JSCommaTrailingList a

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

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

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

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

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

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

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

Show a => Show (JSCommaTrailingList a) Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSCommaTrailingList a -> ShowS

show :: JSCommaTrailingList a -> String

showList :: [JSCommaTrailingList a] -> ShowS

data JSArrowParameterList Source #

Instances
Eq JSArrowParameterList Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Data JSArrowParameterList Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSArrowParameterList -> Constr

dataTypeOf :: JSArrowParameterList -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSArrowParameterList Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSArrowParameterList -> ShowS

show :: JSArrowParameterList -> String

showList :: [JSArrowParameterList] -> ShowS

data JSModuleItem Source #

Instances
Eq JSModuleItem Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

(==) :: JSModuleItem -> JSModuleItem -> Bool

(/=) :: JSModuleItem -> JSModuleItem -> Bool

Data JSModuleItem Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSModuleItem -> Constr

dataTypeOf :: JSModuleItem -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSModuleItem Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSModuleItem -> ShowS

show :: JSModuleItem -> String

showList :: [JSModuleItem] -> ShowS

data JSImportDeclaration Source #

Constructors

JSImportDeclaration !JSImportClause !JSFromClause !JSSemi

imports, module, semi | JSImportDeclarationBare -- ^ module, semi

Instances
Eq JSImportDeclaration Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Data JSImportDeclaration Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSImportDeclaration -> Constr

dataTypeOf :: JSImportDeclaration -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSImportDeclaration Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSImportDeclaration -> ShowS

show :: JSImportDeclaration -> String

showList :: [JSImportDeclaration] -> ShowS

data JSImportClause Source #

Instances
Eq JSImportClause Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Data JSImportClause Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSImportClause -> Constr

dataTypeOf :: JSImportClause -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSImportClause Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSImportClause -> ShowS

show :: JSImportClause -> String

showList :: [JSImportClause] -> ShowS

data JSFromClause Source #

Constructors

JSFromClause !JSAnnot !JSAnnot !String

from, string literal, string literal contents

Instances
Eq JSFromClause Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

(==) :: JSFromClause -> JSFromClause -> Bool

(/=) :: JSFromClause -> JSFromClause -> Bool

Data JSFromClause Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSFromClause -> Constr

dataTypeOf :: JSFromClause -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSFromClause Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSFromClause -> ShowS

show :: JSFromClause -> String

showList :: [JSFromClause] -> ShowS

data JSImportNameSpace Source #

Import namespace, e.g. '* as whatever'

Constructors

JSImportNameSpace !JSBinOp !JSAnnot !JSIdent
  • , as, ident
Instances
Eq JSImportNameSpace Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Data JSImportNameSpace Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSImportNameSpace -> Constr

dataTypeOf :: JSImportNameSpace -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSImportNameSpace Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSImportNameSpace -> ShowS

show :: JSImportNameSpace -> String

showList :: [JSImportNameSpace] -> ShowS

data JSImportsNamed Source #

Named imports, e.g. '{ foo, bar, baz as quux }'

Constructors

JSImportsNamed !JSAnnot !(JSCommaList JSImportSpecifier) !JSAnnot

lb, specifiers, rb

Instances
Eq JSImportsNamed Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Data JSImportsNamed Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSImportsNamed -> Constr

dataTypeOf :: JSImportsNamed -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSImportsNamed Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSImportsNamed -> ShowS

show :: JSImportsNamed -> String

showList :: [JSImportsNamed] -> ShowS

data JSImportSpecifier Source #

Note that this data type is separate from ExportSpecifier because the grammar is slightly different (e.g. in handling of reserved words).

Instances
Eq JSImportSpecifier Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Data JSImportSpecifier Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSImportSpecifier -> Constr

dataTypeOf :: JSImportSpecifier -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSImportSpecifier Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSImportSpecifier -> ShowS

show :: JSImportSpecifier -> String

showList :: [JSImportSpecifier] -> ShowS

data JSExportDeclaration Source #

Constructors

JSExportFrom JSExportClause JSFromClause !JSSemi

exports, module, semi

JSExportLocals JSExportClause !JSSemi

exports, autosemi

JSExport !JSStatement !JSSemi

body, autosemi | JSExportDefault

Instances
Eq JSExportDeclaration Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Data JSExportDeclaration Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSExportDeclaration -> Constr

dataTypeOf :: JSExportDeclaration -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSExportDeclaration Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSExportDeclaration -> ShowS

show :: JSExportDeclaration -> String

showList :: [JSExportDeclaration] -> ShowS

data JSExportClause Source #

Constructors

JSExportClause !JSAnnot !(JSCommaList JSExportSpecifier) !JSAnnot

lb, specifiers, rb

Instances
Eq JSExportClause Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Data JSExportClause Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSExportClause -> Constr

dataTypeOf :: JSExportClause -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSExportClause Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSExportClause -> ShowS

show :: JSExportClause -> String

showList :: [JSExportClause] -> ShowS

data JSExportSpecifier Source #

Constructors

JSExportSpecifier !JSIdent

ident

JSExportSpecifierAs !JSIdent !JSAnnot !JSIdent

ident1, as, ident2

Instances
Eq JSExportSpecifier Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Data JSExportSpecifier Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

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

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

toConstr :: JSExportSpecifier -> Constr

dataTypeOf :: JSExportSpecifier -> DataType

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

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

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

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

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

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

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

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

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

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

Show JSExportSpecifier Source # 
Instance details

Defined in Language.JavaScript.Parser.AST

Methods

showsPrec :: Int -> JSExportSpecifier -> ShowS

show :: JSExportSpecifier -> String

showList :: [JSExportSpecifier] -> ShowS

showStripped :: JSAST -> String Source #

Show the AST elements stripped of their JSAnnot data.