BNFC-2.9.4: A compiler front-end generator.
Safe HaskellSafe-Inferred
LanguageHaskell2010

BNFC.Abs

Description

The abstract syntax of language BNFC.

Synopsis

Documentation

data Grammar Source #

Constructors

Grammar [Def] 

Instances

Instances details
Print Grammar Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> Grammar -> Doc Source #

Read Grammar Source # 
Instance details

Defined in BNFC.Abs

Show Grammar Source # 
Instance details

Defined in BNFC.Abs

Eq Grammar Source # 
Instance details

Defined in BNFC.Abs

Methods

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

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

Ord Grammar Source # 
Instance details

Defined in BNFC.Abs

data Def Source #

Instances

Instances details
Print Def Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> Def -> Doc Source #

Read Def Source # 
Instance details

Defined in BNFC.Abs

Show Def Source # 
Instance details

Defined in BNFC.Abs

Methods

showsPrec :: Int -> Def -> ShowS #

show :: Def -> String #

showList :: [Def] -> ShowS #

Eq Def Source # 
Instance details

Defined in BNFC.Abs

Methods

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

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

Ord Def Source # 
Instance details

Defined in BNFC.Abs

Methods

compare :: Def -> Def -> Ordering #

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

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

(>) :: Def -> Def -> Bool #

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

max :: Def -> Def -> Def #

min :: Def -> Def -> Def #

Print [Def] Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> [Def] -> Doc Source #

data Item Source #

Constructors

Terminal String 
NTerminal Cat 

Instances

Instances details
Print Item Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> Item -> Doc Source #

Read Item Source # 
Instance details

Defined in BNFC.Abs

Show Item Source # 
Instance details

Defined in BNFC.Abs

Methods

showsPrec :: Int -> Item -> ShowS #

show :: Item -> String #

showList :: [Item] -> ShowS #

Eq Item Source # 
Instance details

Defined in BNFC.Abs

Methods

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

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

Ord Item Source # 
Instance details

Defined in BNFC.Abs

Methods

compare :: Item -> Item -> Ordering #

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

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

(>) :: Item -> Item -> Bool #

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

max :: Item -> Item -> Item #

min :: Item -> Item -> Item #

Print [Item] Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> [Item] -> Doc Source #

data Cat Source #

Constructors

ListCat Cat 
IdCat Identifier 

Instances

Instances details
Print Cat Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> Cat -> Doc Source #

Read Cat Source # 
Instance details

Defined in BNFC.Abs

Show Cat Source # 
Instance details

Defined in BNFC.Abs

Methods

showsPrec :: Int -> Cat -> ShowS #

show :: Cat -> String #

showList :: [Cat] -> ShowS #

Eq Cat Source # 
Instance details

Defined in BNFC.Abs

Methods

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

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

Ord Cat Source # 
Instance details

Defined in BNFC.Abs

Methods

compare :: Cat -> Cat -> Ordering #

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

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

(>) :: Cat -> Cat -> Bool #

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

max :: Cat -> Cat -> Cat #

min :: Cat -> Cat -> Cat #

Print [Cat] Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> [Cat] -> Doc Source #

data Label Source #

Instances

Instances details
Print Label Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> Label -> Doc Source #

Read Label Source # 
Instance details

Defined in BNFC.Abs

Show Label Source # 
Instance details

Defined in BNFC.Abs

Methods

showsPrec :: Int -> Label -> ShowS #

show :: Label -> String #

showList :: [Label] -> ShowS #

Eq Label Source # 
Instance details

Defined in BNFC.Abs

Methods

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

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

Ord Label Source # 
Instance details

Defined in BNFC.Abs

Methods

compare :: Label -> Label -> Ordering #

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

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

(>) :: Label -> Label -> Bool #

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

max :: Label -> Label -> Label #

min :: Label -> Label -> Label #

data Arg Source #

Constructors

Arg Identifier 

Instances

Instances details
Print Arg Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> Arg -> Doc Source #

Read Arg Source # 
Instance details

Defined in BNFC.Abs

Show Arg Source # 
Instance details

Defined in BNFC.Abs

Methods

showsPrec :: Int -> Arg -> ShowS #

show :: Arg -> String #

showList :: [Arg] -> ShowS #

Eq Arg Source # 
Instance details

Defined in BNFC.Abs

Methods

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

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

Ord Arg Source # 
Instance details

Defined in BNFC.Abs

Methods

compare :: Arg -> Arg -> Ordering #

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

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

(>) :: Arg -> Arg -> Bool #

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

max :: Arg -> Arg -> Arg #

min :: Arg -> Arg -> Arg #

Print [Arg] Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> [Arg] -> Doc Source #

data Separation Source #

Instances

Instances details
Print Separation Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> Separation -> Doc Source #

Read Separation Source # 
Instance details

Defined in BNFC.Abs

Show Separation Source # 
Instance details

Defined in BNFC.Abs

Eq Separation Source # 
Instance details

Defined in BNFC.Abs

Ord Separation Source # 
Instance details

Defined in BNFC.Abs

data Exp Source #

Instances

Instances details
Print Exp Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> Exp -> Doc Source #

Read Exp Source # 
Instance details

Defined in BNFC.Abs

Show Exp Source # 
Instance details

Defined in BNFC.Abs

Methods

showsPrec :: Int -> Exp -> ShowS #

show :: Exp -> String #

showList :: [Exp] -> ShowS #

Eq Exp Source # 
Instance details

Defined in BNFC.Abs

Methods

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

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

Ord Exp Source # 
Instance details

Defined in BNFC.Abs

Methods

compare :: Exp -> Exp -> Ordering #

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

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

(>) :: Exp -> Exp -> Bool #

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

max :: Exp -> Exp -> Exp #

min :: Exp -> Exp -> Exp #

Print [Exp] Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> [Exp] -> Doc Source #

data RHS Source #

Constructors

RHS [Item] 

Instances

Instances details
Print RHS Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> RHS -> Doc Source #

Read RHS Source # 
Instance details

Defined in BNFC.Abs

Show RHS Source # 
Instance details

Defined in BNFC.Abs

Methods

showsPrec :: Int -> RHS -> ShowS #

show :: RHS -> String #

showList :: [RHS] -> ShowS #

Eq RHS Source # 
Instance details

Defined in BNFC.Abs

Methods

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

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

Ord RHS Source # 
Instance details

Defined in BNFC.Abs

Methods

compare :: RHS -> RHS -> Ordering #

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

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

(>) :: RHS -> RHS -> Bool #

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

max :: RHS -> RHS -> RHS #

min :: RHS -> RHS -> RHS #

Print [RHS] Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> [RHS] -> Doc Source #

data Reg Source #

Instances

Instances details
Print Reg Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> Reg -> Doc Source #

Read Reg Source # 
Instance details

Defined in BNFC.Abs

Show Reg Source # 
Instance details

Defined in BNFC.Abs

Methods

showsPrec :: Int -> Reg -> ShowS #

show :: Reg -> String #

showList :: [Reg] -> ShowS #

Eq Reg Source # 
Instance details

Defined in BNFC.Abs

Methods

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

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

Ord Reg Source # 
Instance details

Defined in BNFC.Abs

Methods

compare :: Reg -> Reg -> Ordering #

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

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

(>) :: Reg -> Reg -> Bool #

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

max :: Reg -> Reg -> Reg #

min :: Reg -> Reg -> Reg #

newtype Identifier Source #

Constructors

Identifier ((Int, Int), String) 

Instances

Instances details
HasPosition Identifier Source # 
Instance details

Defined in BNFC.Abs

Print Identifier Source # 
Instance details

Defined in BNFC.Print

Methods

prt :: Int -> Identifier -> Doc Source #

Read Identifier Source # 
Instance details

Defined in BNFC.Abs

Show Identifier Source # 
Instance details

Defined in BNFC.Abs

Eq Identifier Source # 
Instance details

Defined in BNFC.Abs

Ord Identifier Source # 
Instance details

Defined in BNFC.Abs

type BNFC'Position = Maybe (Int, Int) Source #

Start position (line, column) of something.

class HasPosition a where Source #

Get the start position of something.

Instances

Instances details
HasPosition Identifier Source # 
Instance details

Defined in BNFC.Abs