antlr-haskell-0.1.0.1: A Haskell implementation of the ANTLR top-down parser generator

Copyright(c) Karl Cronburg 2018
LicenseBSD3
Maintainerkarl@cs.tufts.edu
Stabilityexperimental
PortabilityPOSIX
Safe HaskellNone
LanguageHaskell2010

Language.ANTLR4.G4

Description

Until better haddock integration is developed, you'll need to look at the source for this module to see the G4 grammar for G4.

Documentation

list :: a -> [a] Source #

cons :: a -> [a] -> [a] Source #

list2 :: a -> a -> [a] Source #

range :: Enum a => a -> a -> [a] Source #

qDir :: a -> a -> [a] Source #

data G4NTSymbol Source #

Instances
Bounded G4NTSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Enum G4NTSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Eq G4NTSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Data G4NTSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Methods

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

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

toConstr :: G4NTSymbol -> Constr #

dataTypeOf :: G4NTSymbol -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord G4NTSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Show G4NTSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Generic G4NTSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Associated Types

type Rep G4NTSymbol :: Type -> Type #

Lift G4NTSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Methods

lift :: G4NTSymbol -> Q Exp #

Hashable G4NTSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Prettify G4NTSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Ref G4NTSymbol Source # 
Instance details

Defined in Language.ANTLR4.Parser

Associated Types

type Sym G4NTSymbol :: Type Source #

type Rep G4NTSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

type Rep G4NTSymbol = D1 (MetaData "G4NTSymbol" "Language.ANTLR4.G4" "antlr-haskell-0.1.0.1-47wJxWjYxn91lXcjBVmKNu" False) ((((C1 (MetaCons "NT_decls" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NT_decl1" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "NT_prods" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NT_lexemeRHS" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "NT_prodRHS" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NT_regexes1" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "NT_directive" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NT_alphas" PrefixI False) (U1 :: Type -> Type)))) :+: (((C1 (MetaCons "NT_qDirective" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NT_qDot" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "NT_alpha" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NT_regexes" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "NT_regex" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NT_regex1" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "NT_charSet" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "NT_unionR" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NT_charSet1" PrefixI False) (U1 :: Type -> Type))))))
type Sym G4NTSymbol Source # 
Instance details

Defined in Language.ANTLR4.Parser

data G4TSymbol Source #

Instances
Bounded G4TSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Enum G4TSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Eq G4TSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Data G4TSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Methods

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

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

toConstr :: G4TSymbol -> Constr #

dataTypeOf :: G4TSymbol -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord G4TSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Show G4TSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Generic G4TSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Associated Types

type Rep G4TSymbol :: Type -> Type #

Lift G4TSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Methods

lift :: G4TSymbol -> Q Exp #

Hashable G4TSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

Prettify G4TSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

type Rep G4TSymbol Source # 
Instance details

Defined in Language.ANTLR4.G4

type Rep G4TSymbol = D1 (MetaData "G4TSymbol" "Language.ANTLR4.G4" "antlr-haskell-0.1.0.1-47wJxWjYxn91lXcjBVmKNu" False) ((((C1 (MetaCons "T_0" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "T_1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "T_2" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "T_3" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "T_4" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "T_5" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "T_6" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "T_7" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "T_8" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "T_9" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "T_10" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "T_11" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "T_12" PrefixI False) (U1 :: Type -> Type))))) :+: (((C1 (MetaCons "T_13" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "T_14" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "T_15" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "T_16" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "T_17" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "T_UpperID" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "T_LowerID" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "T_Literal" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "T_LineComment" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "T_HaskellExp" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "T_SetChar" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "T_WS" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "T_EscapedChar" PrefixI False) (U1 :: Type -> Type))))))

data TokenValue Source #

Instances
Eq TokenValue Source # 
Instance details

Defined in Language.ANTLR4.G4

Data TokenValue Source # 
Instance details

Defined in Language.ANTLR4.G4

Methods

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

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

toConstr :: TokenValue -> Constr #

dataTypeOf :: TokenValue -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord TokenValue Source # 
Instance details

Defined in Language.ANTLR4.G4

Show TokenValue Source # 
Instance details

Defined in Language.ANTLR4.G4

Generic TokenValue Source # 
Instance details

Defined in Language.ANTLR4.G4

Associated Types

type Rep TokenValue :: Type -> Type #

Hashable TokenValue Source # 
Instance details

Defined in Language.ANTLR4.G4

Prettify TokenValue Source # 
Instance details

Defined in Language.ANTLR4.G4

type Rep TokenValue Source # 
Instance details

Defined in Language.ANTLR4.G4

type Rep TokenValue = D1 (MetaData "TokenValue" "Language.ANTLR4.G4" "antlr-haskell-0.1.0.1-47wJxWjYxn91lXcjBVmKNu" False) ((((C1 (MetaCons "V_UpperID" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)) :+: (C1 (MetaCons "V_LowerID" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)) :+: C1 (MetaCons "V_Literal" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)))) :+: (C1 (MetaCons "V_LineComment" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)) :+: (C1 (MetaCons "V_HaskellExp" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)) :+: C1 (MetaCons "V_SetChar" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Char))))) :+: ((C1 (MetaCons "V_WS" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)) :+: (C1 (MetaCons "V_EscapedChar" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Char)) :+: C1 (MetaCons "V_0" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "V_1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "V_2" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "V_3" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "V_4" PrefixI False) (U1 :: Type -> Type))))) :+: (((C1 (MetaCons "V_5" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "V_6" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "V_7" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "V_8" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "V_9" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "V_10" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "V_11" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "V_12" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "V_13" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "V_14" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "V_15" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "V_16" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "V_17" PrefixI False) (U1 :: Type -> Type))))))