haskell-src-exts-1.14.0: Manipulating Haskell source: abstract syntax, lexer, parser, and pretty-printer

Portabilityportable
Stabilitystable
MaintainerNiklas Broberg, d00nibro@chalmers.se
Safe HaskellSafe-Inferred

Language.Haskell.Exts.Annotated.Syntax

Contents

Description

A suite of datatypes describing the (semi-concrete) abstract syntax of Haskell 98 http://www.haskell.org/onlinereport/ plus registered extensions, including:

  • multi-parameter type classes with functional dependencies (MultiParamTypeClasses, FunctionalDependencies)
  • parameters of type class assertions are unrestricted (FlexibleContexts)
  • forall types as universal and existential quantification (RankNTypes, ExistentialQuantification, etc)
  • pattern guards (PatternGuards)
  • implicit parameters (ImplicitParameters)
  • generalised algebraic data types (GADTs)
  • template haskell (TemplateHaskell)
  • empty data type declarations (EmptyDataDecls)
  • unboxed tuples (UnboxedTuples)
  • regular patterns (RegularPatterns)
  • HSP-style XML expressions and patterns (XmlSyntax)

All nodes in the syntax tree are annotated with something of a user-definable data type. When parsing, this annotation will contain information about the source location that the particular node comes from.

Synopsis

Modules

data Module l

A complete Haskell source module.

Constructors

Module l (Maybe (ModuleHead l)) [ModulePragma l] [ImportDecl l] [Decl l]

an ordinary Haskell module

XmlPage l (ModuleName l) [ModulePragma l] (XName l) [XAttr l] (Maybe (Exp l)) [Exp l]

a module consisting of a single XML document. The ModuleName never appears in the source but is needed for semantic purposes, it will be the same as the file name.

XmlHybrid l (Maybe (ModuleHead l)) [ModulePragma l] [ImportDecl l] [Decl l] (XName l) [XAttr l] (Maybe (Exp l)) [Exp l]

a hybrid module combining an XML document with an ordinary module

Instances

Functor Module 
Typeable1 Module 
Foldable Module 
Traversable Module 
Annotated Module 
ExactP Module 
AppFixity Module 
Eq l => Eq (Module l) 
Data l => Data (Module l) 
Ord l => Ord (Module l) 
Show l => Show (Module l) 
SrcInfo pos => Pretty (Module pos) 
SrcInfo loc => Parseable (Module loc) 

data ModuleHead l

The head of a module, including the name and export specification.

Constructors

ModuleHead l (ModuleName l) (Maybe (WarningText l)) (Maybe (ExportSpecList l)) 

Instances

Functor ModuleHead 
Typeable1 ModuleHead 
Foldable ModuleHead 
Traversable ModuleHead 
Annotated ModuleHead 
ExactP ModuleHead 
Eq l => Eq (ModuleHead l) 
Data l => Data (ModuleHead l) 
Ord l => Ord (ModuleHead l) 
Show l => Show (ModuleHead l) 
Pretty (ModuleHead l) 

data WarningText l

Warning text to optionally use in the module header of e.g. a deprecated module.

Constructors

DeprText l String 
WarnText l String 

Instances

Functor WarningText 
Typeable1 WarningText 
Foldable WarningText 
Traversable WarningText 
Annotated WarningText 
ExactP WarningText 
Eq l => Eq (WarningText l) 
Data l => Data (WarningText l) 
Ord l => Ord (WarningText l) 
Show l => Show (WarningText l) 
Pretty (WarningText l) 

data ExportSpecList l

An explicit export specification.

Constructors

ExportSpecList l [ExportSpec l] 

Instances

Functor ExportSpecList 
Typeable1 ExportSpecList 
Foldable ExportSpecList 
Traversable ExportSpecList 
Annotated ExportSpecList 
ExactP ExportSpecList 
Eq l => Eq (ExportSpecList l) 
Data l => Data (ExportSpecList l) 
Ord l => Ord (ExportSpecList l) 
Show l => Show (ExportSpecList l) 
Pretty (ExportSpecList l) 

data ExportSpec l

An item in a module's export specification.

Constructors

EVar l (QName l)

variable

EAbs l (QName l)

T: a class or datatype exported abstractly, or a type synonym.

EThingAll l (QName l)

T(..): a class exported with all of its methods, or a datatype exported with all of its constructors.

EThingWith l (QName l) [CName l]

T(C_1,...,C_n): a class exported with some of its methods, or a datatype exported with some of its constructors.

EModuleContents l (ModuleName l)

module M: re-export a module.

Instances

Functor ExportSpec 
Typeable1 ExportSpec 
Foldable ExportSpec 
Traversable ExportSpec 
Annotated ExportSpec 
ExactP ExportSpec 
Eq l => Eq (ExportSpec l) 
Data l => Data (ExportSpec l) 
Ord l => Ord (ExportSpec l) 
Show l => Show (ExportSpec l) 
Pretty (ExportSpec l) 

data ImportDecl l

An import declaration.

Constructors

ImportDecl 

Fields

importAnn :: l

annotation, used by parser for position of the import keyword.

importModule :: ModuleName l

name of the module imported.

importQualified :: Bool

imported qualified?

importSrc :: Bool

imported with {-# SOURCE #-}?

importPkg :: Maybe String

imported with explicit package name

importAs :: Maybe (ModuleName l)

optional alias name in an as clause.

importSpecs :: Maybe (ImportSpecList l)

optional list of import specifications.

Instances

Functor ImportDecl 
Typeable1 ImportDecl 
Foldable ImportDecl 
Traversable ImportDecl 
Annotated ImportDecl 
ExactP ImportDecl 
Eq l => Eq (ImportDecl l) 
Data l => Data (ImportDecl l) 
Ord l => Ord (ImportDecl l) 
Show l => Show (ImportDecl l) 
SrcInfo pos => Pretty (ImportDecl pos) 

data ImportSpecList l

An explicit import specification list.

Constructors

ImportSpecList l Bool [ImportSpec l] 

Instances

Functor ImportSpecList 
Typeable1 ImportSpecList 
Foldable ImportSpecList 
Traversable ImportSpecList 
Annotated ImportSpecList 
ExactP ImportSpecList 
Eq l => Eq (ImportSpecList l) 
Data l => Data (ImportSpecList l) 
Ord l => Ord (ImportSpecList l) 
Show l => Show (ImportSpecList l) 
Pretty (ImportSpecList l) 

data ImportSpec l

An import specification, representing a single explicit item imported (or hidden) from a module.

Constructors

IVar l (Name l)

variable

IAbs l (Name l)

T: the name of a class, datatype or type synonym.

IThingAll l (Name l)

T(..): a class imported with all of its methods, or a datatype imported with all of its constructors.

IThingWith l (Name l) [CName l]

T(C_1,...,C_n): a class imported with some of its methods, or a datatype imported with some of its constructors.

Instances

Functor ImportSpec 
Typeable1 ImportSpec 
Foldable ImportSpec 
Traversable ImportSpec 
Annotated ImportSpec 
ExactP ImportSpec 
Eq l => Eq (ImportSpec l) 
Data l => Data (ImportSpec l) 
Ord l => Ord (ImportSpec l) 
Show l => Show (ImportSpec l) 
Pretty (ImportSpec l) 

data Assoc l

Associativity of an operator.

Constructors

AssocNone l

non-associative operator (declared with infix)

AssocLeft l

left-associative operator (declared with infixl).

AssocRight l

right-associative operator (declared with infixr)

Instances

Functor Assoc 
Typeable1 Assoc 
Foldable Assoc 
Traversable Assoc 
Annotated Assoc 
ExactP Assoc 
Eq l => Eq (Assoc l) 
Data l => Data (Assoc l) 
Ord l => Ord (Assoc l) 
Show l => Show (Assoc l) 
Pretty (Assoc l) 

Declarations

data Decl l

A top-level declaration.

Constructors

TypeDecl l (DeclHead l) (Type l)

A type declaration

TypeFamDecl l (DeclHead l) (Maybe (Kind l))

A type family declaration

DataDecl l (DataOrNew l) (Maybe (Context l)) (DeclHead l) [QualConDecl l] (Maybe (Deriving l))

A data OR newtype declaration

GDataDecl l (DataOrNew l) (Maybe (Context l)) (DeclHead l) (Maybe (Kind l)) [GadtDecl l] (Maybe (Deriving l))

A data OR newtype declaration, GADT style

DataFamDecl l (Maybe (Context l)) (DeclHead l) (Maybe (Kind l))

A data family declaration

TypeInsDecl l (Type l) (Type l)

A type family instance declaration

DataInsDecl l (DataOrNew l) (Type l) [QualConDecl l] (Maybe (Deriving l))

A data family instance declaration

GDataInsDecl l (DataOrNew l) (Type l) (Maybe (Kind l)) [GadtDecl l] (Maybe (Deriving l))

A data family instance declaration, GADT style

ClassDecl l (Maybe (Context l)) (DeclHead l) [FunDep l] (Maybe [ClassDecl l])

A declaration of a type class

InstDecl l (Maybe (Context l)) (InstHead l) (Maybe [InstDecl l])

An declaration of a type class instance

DerivDecl l (Maybe (Context l)) (InstHead l)

A standalone deriving declaration

InfixDecl l (Assoc l) (Maybe Int) [Op l]

A declaration of operator fixity

DefaultDecl l [Type l]

A declaration of default types

SpliceDecl l (Exp l)

A Template Haskell splicing declaration

TypeSig l [Name l] (Type l)

A type signature declaration

FunBind l [Match l]

A set of function binding clauses

PatBind l (Pat l) (Maybe (Type l)) (Rhs l) (Maybe (Binds l))

A pattern binding

ForImp l (CallConv l) (Maybe (Safety l)) (Maybe String) (Name l) (Type l)

A foreign import declaration

ForExp l (CallConv l) (Maybe String) (Name l) (Type l)

A foreign export declaration

RulePragmaDecl l [Rule l]

A RULES pragma

DeprPragmaDecl l [([Name l], String)]

A DEPRECATED pragma

WarnPragmaDecl l [([Name l], String)]

A WARNING pragma

InlineSig l Bool (Maybe (Activation l)) (QName l)

An INLINE pragma

InlineConlikeSig l (Maybe (Activation l)) (QName l)

An INLINE CONLIKE pragma

SpecSig l (Maybe (Activation l)) (QName l) [Type l]

A SPECIALISE pragma

SpecInlineSig l Bool (Maybe (Activation l)) (QName l) [Type l]

A SPECIALISE INLINE pragma

InstSig l (Maybe (Context l)) (InstHead l)

A SPECIALISE instance pragma

AnnPragma l (Annotation l)

An ANN pragma

Instances

Functor Decl 
Typeable1 Decl 
Foldable Decl 
Traversable Decl 
Annotated Decl 
ExactP Decl 
AppFixity Decl 
Eq l => Eq (Decl l) 
Data l => Data (Decl l) 
Ord l => Ord (Decl l) 
Show l => Show (Decl l) 
SrcInfo pos => Pretty (Decl pos) 
SrcInfo loc => Parseable (Decl loc) 

data DeclHead l

The head of a type or class declaration.

Constructors

DHead l (Name l) [TyVarBind l] 
DHInfix l (TyVarBind l) (Name l) (TyVarBind l) 
DHParen l (DeclHead l) 

Instances

Functor DeclHead 
Typeable1 DeclHead 
Foldable DeclHead 
Traversable DeclHead 
Annotated DeclHead 
ExactP DeclHead 
Eq l => Eq (DeclHead l) 
Data l => Data (DeclHead l) 
Ord l => Ord (DeclHead l) 
Show l => Show (DeclHead l) 
Pretty (DeclHead l) 

data InstHead l

The head of an instance declaration.

Constructors

IHead l (QName l) [Type l] 
IHInfix l (Type l) (QName l) (Type l) 
IHParen l (InstHead l) 

Instances

Functor InstHead 
Typeable1 InstHead 
Foldable InstHead 
Traversable InstHead 
Annotated InstHead 
ExactP InstHead 
Eq l => Eq (InstHead l) 
Data l => Data (InstHead l) 
Ord l => Ord (InstHead l) 
Show l => Show (InstHead l) 
Pretty (InstHead l) 

data Binds l

A binding group inside a let or where clause.

Constructors

BDecls l [Decl l]

An ordinary binding group

IPBinds l [IPBind l]

A binding group for implicit parameters

Instances

Functor Binds 
Typeable1 Binds 
Foldable Binds 
Traversable Binds 
Annotated Binds 
ExactP Binds 
AppFixity Binds 
Eq l => Eq (Binds l) 
Data l => Data (Binds l) 
Ord l => Ord (Binds l) 
Show l => Show (Binds l) 

data IPBind l

A binding of an implicit parameter.

Constructors

IPBind l (IPName l) (Exp l) 

Instances

Functor IPBind 
Typeable1 IPBind 
Foldable IPBind 
Traversable IPBind 
Annotated IPBind 
ExactP IPBind 
AppFixity IPBind 
Eq l => Eq (IPBind l) 
Data l => Data (IPBind l) 
Ord l => Ord (IPBind l) 
Show l => Show (IPBind l) 
SrcInfo loc => Pretty (IPBind loc) 

Type classes and instances

data ClassDecl l

Declarations inside a class declaration.

Constructors

ClsDecl l (Decl l)

ordinary declaration

ClsDataFam l (Maybe (Context l)) (DeclHead l) (Maybe (Kind l))

declaration of an associated data type

ClsTyFam l (DeclHead l) (Maybe (Kind l))

declaration of an associated type synonym

ClsTyDef l (Type l) (Type l)

default choice for an associated type synonym

Instances

Functor ClassDecl 
Typeable1 ClassDecl 
Foldable ClassDecl 
Traversable ClassDecl 
Annotated ClassDecl 
ExactP ClassDecl 
AppFixity ClassDecl 
Eq l => Eq (ClassDecl l) 
Data l => Data (ClassDecl l) 
Ord l => Ord (ClassDecl l) 
Show l => Show (ClassDecl l) 
SrcInfo loc => Pretty (ClassDecl loc) 

data InstDecl l

Declarations inside an instance declaration.

Constructors

InsDecl l (Decl l)

ordinary declaration

InsType l (Type l) (Type l)

an associated type definition

InsData l (DataOrNew l) (Type l) [QualConDecl l] (Maybe (Deriving l))

an associated data type implementation

InsGData l (DataOrNew l) (Type l) (Maybe (Kind l)) [GadtDecl l] (Maybe (Deriving l))

an associated data type implemented using GADT style

Instances

Functor InstDecl 
Typeable1 InstDecl 
Foldable InstDecl 
Traversable InstDecl 
Annotated InstDecl 
ExactP InstDecl 
AppFixity InstDecl 
Eq l => Eq (InstDecl l) 
Data l => Data (InstDecl l) 
Ord l => Ord (InstDecl l) 
Show l => Show (InstDecl l) 
SrcInfo loc => Pretty (InstDecl loc) 

data Deriving l

A deriving clause following a data type declaration.

Constructors

Deriving l [InstHead l] 

Instances

Functor Deriving 
Typeable1 Deriving 
Foldable Deriving 
Traversable Deriving 
Annotated Deriving 
ExactP Deriving 
Eq l => Eq (Deriving l) 
Data l => Data (Deriving l) 
Ord l => Ord (Deriving l) 
Show l => Show (Deriving l) 
Pretty (Deriving l) 

Data type declarations

data DataOrNew l

A flag stating whether a declaration is a data or newtype declaration.

Constructors

DataType l 
NewType l 

Instances

Functor DataOrNew 
Typeable1 DataOrNew 
Foldable DataOrNew 
Traversable DataOrNew 
Annotated DataOrNew 
ExactP DataOrNew 
Eq l => Eq (DataOrNew l) 
Data l => Data (DataOrNew l) 
Ord l => Ord (DataOrNew l) 
Show l => Show (DataOrNew l) 
Pretty (DataOrNew l) 

data ConDecl l

Declaration of an ordinary data constructor.

Constructors

ConDecl l (Name l) [BangType l]

ordinary data constructor

InfixConDecl l (BangType l) (Name l) (BangType l)

infix data constructor

RecDecl l (Name l) [FieldDecl l]

record constructor

Instances

Functor ConDecl 
Typeable1 ConDecl 
Foldable ConDecl 
Traversable ConDecl 
Annotated ConDecl 
ExactP ConDecl 
Eq l => Eq (ConDecl l) 
Data l => Data (ConDecl l) 
Ord l => Ord (ConDecl l) 
Show l => Show (ConDecl l) 
Pretty (ConDecl l) 

data FieldDecl l

Declaration of a (list of) named field(s).

Constructors

FieldDecl l [Name l] (BangType l) 

Instances

Functor FieldDecl 
Typeable1 FieldDecl 
Foldable FieldDecl 
Traversable FieldDecl 
Annotated FieldDecl 
ExactP FieldDecl 
Eq l => Eq (FieldDecl l) 
Data l => Data (FieldDecl l) 
Ord l => Ord (FieldDecl l) 
Show l => Show (FieldDecl l) 
Pretty (FieldDecl l) 

data QualConDecl l

A single constructor declaration within a data type declaration, which may have an existential quantification binding.

Constructors

QualConDecl l (Maybe [TyVarBind l]) (Maybe (Context l)) (ConDecl l) 

Instances

Functor QualConDecl 
Typeable1 QualConDecl 
Foldable QualConDecl 
Traversable QualConDecl 
Annotated QualConDecl 
ExactP QualConDecl 
Eq l => Eq (QualConDecl l) 
Data l => Data (QualConDecl l) 
Ord l => Ord (QualConDecl l) 
Show l => Show (QualConDecl l) 
Pretty (QualConDecl l) 

data GadtDecl l

A single constructor declaration in a GADT data type declaration.

Constructors

GadtDecl l (Name l) (Type l) 

Instances

Functor GadtDecl 
Typeable1 GadtDecl 
Foldable GadtDecl 
Traversable GadtDecl 
Annotated GadtDecl 
ExactP GadtDecl 
Eq l => Eq (GadtDecl l) 
Data l => Data (GadtDecl l) 
Ord l => Ord (GadtDecl l) 
Show l => Show (GadtDecl l) 
Pretty (GadtDecl l) 

data BangType l

The type of a constructor argument or field, optionally including a strictness annotation.

Constructors

BangedTy l (Type l)

strict component, marked with "!"

UnBangedTy l (Type l)

non-strict component

UnpackedTy l (Type l)

unboxed component, marked with an UNPACK pragma

Instances

Functor BangType 
Typeable1 BangType 
Foldable BangType 
Traversable BangType 
Annotated BangType 
ExactP BangType 
Eq l => Eq (BangType l) 
Data l => Data (BangType l) 
Ord l => Ord (BangType l) 
Show l => Show (BangType l) 
Pretty (BangType l) 

Function bindings

data Match l

Clauses of a function binding.

Constructors

Match l (Name l) [Pat l] (Rhs l) (Maybe (Binds l))

A clause defined with prefix notation, i.e. the function name followed by its argument patterns, the right-hand side and an optional where clause.

InfixMatch l (Pat l) (Name l) [Pat l] (Rhs l) (Maybe (Binds l))

A clause defined with infix notation, i.e. first its first argument pattern, then the function name, then its following argument(s), the right-hand side and an optional where clause. Note that there can be more than two arguments to a function declared infix, hence the list of pattern arguments.

Instances

Functor Match 
Typeable1 Match 
Foldable Match 
Traversable Match 
Annotated Match 
ExactP Match 
AppFixity Match 
Eq l => Eq (Match l) 
Data l => Data (Match l) 
Ord l => Ord (Match l) 
Show l => Show (Match l) 
SrcInfo pos => Pretty (Match pos) 

data Rhs l

The right hand side of a function or pattern binding.

Constructors

UnGuardedRhs l (Exp l)

unguarded right hand side (exp)

GuardedRhss l [GuardedRhs l]

guarded right hand side (gdrhs)

Instances

Functor Rhs 
Typeable1 Rhs 
Foldable Rhs 
Traversable Rhs 
Annotated Rhs 
ExactP Rhs 
AppFixity Rhs 
Eq l => Eq (Rhs l) 
Data l => Data (Rhs l) 
Ord l => Ord (Rhs l) 
Show l => Show (Rhs l) 
SrcInfo loc => Pretty (Rhs loc) 

data GuardedRhs l

A guarded right hand side | stmts = exp. The guard is a series of statements when using pattern guards, otherwise it will be a single qualifier expression.

Constructors

GuardedRhs l [Stmt l] (Exp l) 

Instances

Functor GuardedRhs 
Typeable1 GuardedRhs 
Foldable GuardedRhs 
Traversable GuardedRhs 
Annotated GuardedRhs 
ExactP GuardedRhs 
AppFixity GuardedRhs 
Eq l => Eq (GuardedRhs l) 
Data l => Data (GuardedRhs l) 
Ord l => Ord (GuardedRhs l) 
Show l => Show (GuardedRhs l) 
SrcInfo loc => Pretty (GuardedRhs loc) 

Class Assertions and Contexts

data Context l

A context is a set of assertions

Constructors

CxSingle l (Asst l) 
CxTuple l [Asst l] 
CxParen l (Context l) 
CxEmpty l 

Instances

Functor Context 
Typeable1 Context 
Foldable Context 
Traversable Context 
Annotated Context 
ExactP Context 
Eq l => Eq (Context l) 
Data l => Data (Context l) 
Ord l => Ord (Context l) 
Show l => Show (Context l) 
Pretty (Context l) 

data FunDep l

A functional dependency, given on the form l1 l2 ... ln -> r2 r3 .. rn

Constructors

FunDep l [Name l] [Name l] 

Instances

Functor FunDep 
Typeable1 FunDep 
Foldable FunDep 
Traversable FunDep 
Annotated FunDep 
ExactP FunDep 
Eq l => Eq (FunDep l) 
Data l => Data (FunDep l) 
Ord l => Ord (FunDep l) 
Show l => Show (FunDep l) 
Pretty (FunDep l) 

data Asst l

Class assertions. In Haskell 98, the argument would be a tyvar, but this definition allows multiple parameters, and allows them to be types. Also extended with support for implicit parameters and equality constraints.

Constructors

ClassA l (QName l) [Type l]

ordinary class assertion

InfixA l (Type l) (QName l) (Type l)

class assertion where the class name is given infix

IParam l (IPName l) (Type l)

implicit parameter assertion

EqualP l (Type l) (Type l)

type equality constraint

Instances

Functor Asst 
Typeable1 Asst 
Foldable Asst 
Traversable Asst 
Annotated Asst 
ExactP Asst 
Eq l => Eq (Asst l) 
Data l => Data (Asst l) 
Ord l => Ord (Asst l) 
Show l => Show (Asst l) 
Pretty (Asst l) 

Types

data Type l

A type qualified with a context. An unqualified type has an empty context.

Constructors

TyForall l (Maybe [TyVarBind l]) (Maybe (Context l)) (Type l)

qualified type

TyFun l (Type l) (Type l)

function type

TyTuple l Boxed [Type l]

tuple type, possibly boxed

TyList l (Type l)

list syntax, e.g. [a], as opposed to [] a

TyApp l (Type l) (Type l)

application of a type constructor

TyVar l (Name l)

type variable

TyCon l (QName l)

named type or type constructor

TyParen l (Type l)

type surrounded by parentheses

TyInfix l (Type l) (QName l) (Type l)

infix type constructor

TyKind l (Type l) (Kind l)

type with explicit kind signature

Instances

Functor Type 
Typeable1 Type 
Foldable Type 
Traversable Type 
Annotated Type 
ExactP Type 
Eq l => Eq (Type l) 
Data l => Data (Type l) 
Ord l => Ord (Type l) 
Show l => Show (Type l) 
Pretty (Type l) 
SrcInfo loc => Parseable (Type loc) 

data Boxed

Flag denoting whether a tuple is boxed or unboxed.

Constructors

Boxed 
Unboxed 

Instances

Eq Boxed 
Data Boxed 
Ord Boxed 
Show Boxed 
Typeable Boxed 

data Kind l

An explicit kind annotation.

Constructors

KindStar l

*, the kind of types

KindBang l

!, the kind of unboxed types

KindFn l (Kind l) (Kind l)

->, the kind of a type constructor

KindParen l (Kind l)

a parenthesised kind

KindVar l (Name l)

a kind variable (as-of-yet unsupported by compilers)

Instances

Functor Kind 
Typeable1 Kind 
Foldable Kind 
Traversable Kind 
Annotated Kind 
ExactP Kind 
Eq l => Eq (Kind l) 
Data l => Data (Kind l) 
Ord l => Ord (Kind l) 
Show l => Show (Kind l) 
Pretty (Kind l) 

data TyVarBind l

A type variable declaration, optionally with an explicit kind annotation.

Constructors

KindedVar l (Name l) (Kind l)

variable binding with kind annotation

UnkindedVar l (Name l)

ordinary variable binding

Instances

Functor TyVarBind 
Typeable1 TyVarBind 
Foldable TyVarBind 
Traversable TyVarBind 
Annotated TyVarBind 
ExactP TyVarBind 
Eq l => Eq (TyVarBind l) 
Data l => Data (TyVarBind l) 
Ord l => Ord (TyVarBind l) 
Show l => Show (TyVarBind l) 
Pretty (TyVarBind l) 

Expressions

data Exp l

Haskell expressions.

Constructors

Var l (QName l)

variable

IPVar l (IPName l)

implicit parameter variable

Con l (QName l)

data constructor

Lit l (Literal l)

literal constant

InfixApp l (Exp l) (QOp l) (Exp l)

infix application

App l (Exp l) (Exp l)

ordinary application

NegApp l (Exp l)

negation expression -exp (unary minus)

Lambda l [Pat l] (Exp l)

lambda expression

Let l (Binds l) (Exp l)

local declarations with let ... in ...

If l (Exp l) (Exp l) (Exp l)

if exp then exp else exp

Case l (Exp l) [Alt l]

case exp of alts

Do l [Stmt l]

do-expression: the last statement in the list should be an expression.

MDo l [Stmt l]

mdo-expression

Tuple l Boxed [Exp l]

tuple expression

TupleSection l Boxed [Maybe (Exp l)]

tuple section expression, e.g. (,,3)

List l [Exp l]

list expression

Paren l (Exp l)

parenthesised expression

LeftSection l (Exp l) (QOp l)

left section (exp qop)

RightSection l (QOp l) (Exp l)

right section (qop exp)

RecConstr l (QName l) [FieldUpdate l]

record construction expression

RecUpdate l (Exp l) [FieldUpdate l]

record update expression

EnumFrom l (Exp l)

unbounded arithmetic sequence, incrementing by 1: [from ..]

EnumFromTo l (Exp l) (Exp l)

bounded arithmetic sequence, incrementing by 1 [from .. to]

EnumFromThen l (Exp l) (Exp l)

unbounded arithmetic sequence, with first two elements given [from, then ..]

EnumFromThenTo l (Exp l) (Exp l) (Exp l)

bounded arithmetic sequence, with first two elements given [from, then .. to]

ListComp l (Exp l) [QualStmt l]

ordinary list comprehension

ParComp l (Exp l) [[QualStmt l]]

parallel list comprehension

ExpTypeSig l (Exp l) (Type l)

expression with explicit type signature

VarQuote l (QName l)

'x for template haskell reifying of expressions

TypQuote l (QName l)

''T for template haskell reifying of types

BracketExp l (Bracket l)

template haskell bracket expression

SpliceExp l (Splice l)

template haskell splice expression

QuasiQuote l String String

quasi-quotaion: [$name| string |]

XTag l (XName l) [XAttr l] (Maybe (Exp l)) [Exp l]

xml element, with attributes and children

XETag l (XName l) [XAttr l] (Maybe (Exp l))

empty xml element, with attributes

XPcdata l String

PCDATA child element

XExpTag l (Exp l)

escaped haskell expression inside xml

XChildTag l [Exp l]

children of an xml element

CorePragma l String (Exp l)

CORE pragma

SCCPragma l String (Exp l)

SCC pragma

GenPragma l String (Int, Int) (Int, Int) (Exp l)

GENERATED pragma

Proc l (Pat l) (Exp l)

arrows proc: proc pat -> exp

LeftArrApp l (Exp l) (Exp l)

arrow application (from left): exp -< exp

RightArrApp l (Exp l) (Exp l)

arrow application (from right): exp >- exp

LeftArrHighApp l (Exp l) (Exp l)

higher-order arrow application (from left): exp -<< exp

RightArrHighApp l (Exp l) (Exp l)

higher-order arrow application (from right): exp >>- exp

Instances

Functor Exp 
Typeable1 Exp 
Foldable Exp 
Traversable Exp 
Annotated Exp 
ExactP Exp 
AppFixity Exp 
Eq l => Eq (Exp l) 
Data l => Data (Exp l) 
Ord l => Ord (Exp l) 
Show l => Show (Exp l) 
SrcInfo loc => Pretty (Exp loc) 
SrcInfo loc => Parseable (Exp loc) 

data Stmt l

A statement, representing both a stmt in a do-expression, an ordinary qual in a list comprehension, as well as a stmt in a pattern guard.

Constructors

Generator l (Pat l) (Exp l)

a generator: pat <- exp

Qualifier l (Exp l)

an exp by itself: in a do-expression, an action whose result is discarded; in a list comprehension and pattern guard, a guard expression

LetStmt l (Binds l)

local bindings

RecStmt l [Stmt l]

a recursive binding group for arrows

Instances

Functor Stmt 
Typeable1 Stmt 
Foldable Stmt 
Traversable Stmt 
Annotated Stmt 
ExactP Stmt 
AppFixity Stmt 
Eq l => Eq (Stmt l) 
Data l => Data (Stmt l) 
Ord l => Ord (Stmt l) 
Show l => Show (Stmt l) 
SrcInfo loc => Pretty (Stmt loc) 
SrcInfo loc => Parseable (Stmt loc) 

data QualStmt l

A general transqual in a list comprehension, which could potentially be a transform of the kind enabled by TransformListComp.

Constructors

QualStmt l (Stmt l)

an ordinary statement

ThenTrans l (Exp l)

then exp

ThenBy l (Exp l) (Exp l)

then exp by exp

GroupBy l (Exp l)

then group by exp

GroupUsing l (Exp l)

then group using exp

GroupByUsing l (Exp l) (Exp l)

then group by exp using exp

Instances

Functor QualStmt 
Typeable1 QualStmt 
Foldable QualStmt 
Traversable QualStmt 
Annotated QualStmt 
ExactP QualStmt 
AppFixity QualStmt 
Eq l => Eq (QualStmt l) 
Data l => Data (QualStmt l) 
Ord l => Ord (QualStmt l) 
Show l => Show (QualStmt l) 
SrcInfo loc => Pretty (QualStmt loc) 

data FieldUpdate l

An fbind in a labeled construction or update expression.

Constructors

FieldUpdate l (QName l) (Exp l)

ordinary label-expresion pair

FieldPun l (Name l)

record field pun

FieldWildcard l

record field wildcard

Instances

Functor FieldUpdate 
Typeable1 FieldUpdate 
Foldable FieldUpdate 
Traversable FieldUpdate 
Annotated FieldUpdate 
ExactP FieldUpdate 
AppFixity FieldUpdate 
Eq l => Eq (FieldUpdate l) 
Data l => Data (FieldUpdate l) 
Ord l => Ord (FieldUpdate l) 
Show l => Show (FieldUpdate l) 
SrcInfo loc => Pretty (FieldUpdate loc) 

data Alt l

An alt alternative in a case expression.

Constructors

Alt l (Pat l) (GuardedAlts l) (Maybe (Binds l)) 

Instances

Functor Alt 
Typeable1 Alt 
Foldable Alt 
Traversable Alt 
Annotated Alt 
ExactP Alt 
AppFixity Alt 
Eq l => Eq (Alt l) 
Data l => Data (Alt l) 
Ord l => Ord (Alt l) 
Show l => Show (Alt l) 
SrcInfo loc => Pretty (Alt loc) 

data GuardedAlts l

The right-hand sides of a case alternative, which may be a single right-hand side or a set of guarded ones.

Constructors

UnGuardedAlt l (Exp l)

-> exp

GuardedAlts l [GuardedAlt l]

gdpat

Instances

Functor GuardedAlts 
Typeable1 GuardedAlts 
Foldable GuardedAlts 
Traversable GuardedAlts 
Annotated GuardedAlts 
ExactP GuardedAlts 
AppFixity GuardedAlts 
Eq l => Eq (GuardedAlts l) 
Data l => Data (GuardedAlts l) 
Ord l => Ord (GuardedAlts l) 
Show l => Show (GuardedAlts l) 
SrcInfo loc => Pretty (GuardedAlts loc) 

data GuardedAlt l

A guarded case alternative | stmts -> exp.

Constructors

GuardedAlt l [Stmt l] (Exp l) 

Instances

Functor GuardedAlt 
Typeable1 GuardedAlt 
Foldable GuardedAlt 
Traversable GuardedAlt 
Annotated GuardedAlt 
ExactP GuardedAlt 
AppFixity GuardedAlt 
Eq l => Eq (GuardedAlt l) 
Data l => Data (GuardedAlt l) 
Ord l => Ord (GuardedAlt l) 
Show l => Show (GuardedAlt l) 
SrcInfo loc => Pretty (GuardedAlt loc) 

data XAttr l

An xml attribute, which is a name-expression pair.

Constructors

XAttr l (XName l) (Exp l) 

Instances

Functor XAttr 
Typeable1 XAttr 
Foldable XAttr 
Traversable XAttr 
Annotated XAttr 
ExactP XAttr 
AppFixity XAttr 
Eq l => Eq (XAttr l) 
Data l => Data (XAttr l) 
Ord l => Ord (XAttr l) 
Show l => Show (XAttr l) 
SrcInfo loc => Pretty (XAttr loc) 

Patterns

data Pat l

A pattern, to be matched against a value.

Constructors

PVar l (Name l)

variable

PLit l (Literal l)

literal constant

PNeg l (Pat l)

negated pattern

PNPlusK l (Name l) Integer

n+k pattern

PInfixApp l (Pat l) (QName l) (Pat l)

pattern with an infix data constructor

PApp l (QName l) [Pat l]

data constructor and argument patterns

PTuple l Boxed [Pat l]

tuple pattern

PList l [Pat l]

list pattern

PParen l (Pat l)

parenthesized pattern

PRec l (QName l) [PatField l]

labelled pattern, record style

PAsPat l (Name l) (Pat l)

@-pattern

PWildCard l

wildcard pattern: _

PIrrPat l (Pat l)

irrefutable pattern: ~pat

PatTypeSig l (Pat l) (Type l)

pattern with type signature

PViewPat l (Exp l) (Pat l)

view patterns of the form (exp -> pat)

PRPat l [RPat l]

regular list pattern

PXTag l (XName l) [PXAttr l] (Maybe (Pat l)) [Pat l]

XML element pattern

PXETag l (XName l) [PXAttr l] (Maybe (Pat l))

XML singleton element pattern

PXPcdata l String

XML PCDATA pattern

PXPatTag l (Pat l)

XML embedded pattern

PXRPats l [RPat l]

XML regular list pattern

PExplTypeArg l (QName l) (Type l)

Explicit generics style type argument e.g. f {| Int |} x = ...

PQuasiQuote l String String

quasi quote pattern: [$name| string |]

PBangPat l (Pat l)

strict (bang) pattern: f !x = ...

Instances

Functor Pat 
Typeable1 Pat 
Foldable Pat 
Traversable Pat 
Annotated Pat 
ExactP Pat 
AppFixity Pat 
Eq l => Eq (Pat l) 
Data l => Data (Pat l) 
Ord l => Ord (Pat l) 
Show l => Show (Pat l) 
SrcInfo loc => Pretty (Pat loc) 
SrcInfo loc => Parseable (Pat loc) 

data PatField l

An fpat in a labeled record pattern.

Constructors

PFieldPat l (QName l) (Pat l)

ordinary label-pattern pair

PFieldPun l (Name l)

record field pun

PFieldWildcard l

record field wildcard

Instances

Functor PatField 
Typeable1 PatField 
Foldable PatField 
Traversable PatField 
Annotated PatField 
ExactP PatField 
AppFixity PatField 
Eq l => Eq (PatField l) 
Data l => Data (PatField l) 
Ord l => Ord (PatField l) 
Show l => Show (PatField l) 
SrcInfo loc => Pretty (PatField loc) 

data PXAttr l

An XML attribute in a pattern.

Constructors

PXAttr l (XName l) (Pat l) 

Instances

Functor PXAttr 
Typeable1 PXAttr 
Foldable PXAttr 
Traversable PXAttr 
Annotated PXAttr 
ExactP PXAttr 
AppFixity PXAttr 
Eq l => Eq (PXAttr l) 
Data l => Data (PXAttr l) 
Ord l => Ord (PXAttr l) 
Show l => Show (PXAttr l) 
SrcInfo loc => Pretty (PXAttr loc) 

data RPat l

An entity in a regular pattern.

Constructors

RPOp l (RPat l) (RPatOp l)

operator pattern, e.g. pat*

RPEither l (RPat l) (RPat l)

choice pattern, e.g. (1 | 2)

RPSeq l [RPat l]

sequence pattern, e.g. (| 1, 2, 3 |)

RPGuard l (Pat l) [Stmt l]

guarded pattern, e.g. (| p | p < 3 |)

RPCAs l (Name l) (RPat l)

non-linear variable binding, e.g. (foo@:(1 | 2))*

RPAs l (Name l) (RPat l)

linear variable binding, e.g. foo@(1 | 2)

RPParen l (RPat l)

parenthesised pattern, e.g. (2*)

RPPat l (Pat l)

an ordinary pattern

Instances

Functor RPat 
Typeable1 RPat 
Foldable RPat 
Traversable RPat 
Annotated RPat 
ExactP RPat 
AppFixity RPat 
Eq l => Eq (RPat l) 
Data l => Data (RPat l) 
Ord l => Ord (RPat l) 
Show l => Show (RPat l) 
SrcInfo loc => Pretty (RPat loc) 

data RPatOp l

A regular pattern operator.

Constructors

RPStar l

* = 0 or more

RPStarG l

*! = 0 or more, greedy

RPPlus l

+ = 1 or more

RPPlusG l

+! = 1 or more, greedy

RPOpt l

? = 0 or 1

RPOptG l

?! = 0 or 1, greedy

Instances

Functor RPatOp 
Typeable1 RPatOp 
Foldable RPatOp 
Traversable RPatOp 
Annotated RPatOp 
ExactP RPatOp 
Eq l => Eq (RPatOp l) 
Data l => Data (RPatOp l) 
Ord l => Ord (RPatOp l) 
Show l => Show (RPatOp l) 
Pretty (RPatOp l) 

Literals

data Literal l

literal Values of this type hold the abstract value of the literal, along with the precise string representation used. For example, 10, 0o12 and 0xa have the same value representation, but each carry a different string representation.

Constructors

Char l Char String

character literal

String l String String

string literal

Int l Integer String

integer literal

Frac l Rational String

floating point literal

PrimInt l Integer String

unboxed integer literal

PrimWord l Integer String

unboxed word literal

PrimFloat l Rational String

unboxed float literal

PrimDouble l Rational String

unboxed double literal

PrimChar l Char String

unboxed character literal

PrimString l String String

unboxed string literal

Instances

Functor Literal 
Typeable1 Literal 
Foldable Literal 
Traversable Literal 
Annotated Literal 
ExactP Literal 
Eq l => Eq (Literal l) 
Data l => Data (Literal l) 
Ord l => Ord (Literal l) 
Show l => Show (Literal l) 
Pretty (Literal l) 

Variables, Constructors and Operators

data ModuleName l

The name of a Haskell module.

Constructors

ModuleName l String 

Instances

Functor ModuleName 
Typeable1 ModuleName 
Foldable ModuleName 
Traversable ModuleName 
Annotated ModuleName 
ExactP ModuleName 
Eq l => Eq (ModuleName l) 
Data l => Data (ModuleName l) 
Ord l => Ord (ModuleName l) 
Show l => Show (ModuleName l) 
Pretty (ModuleName l) 

data QName l

This type is used to represent qualified variables, and also qualified constructors.

Constructors

Qual l (ModuleName l) (Name l)

name qualified with a module name

UnQual l (Name l)

unqualified local name

Special l (SpecialCon l)

built-in constructor with special syntax

Instances

Functor QName 
Typeable1 QName 
Foldable QName 
Traversable QName 
Annotated QName 
ExactP QName 
Eq l => Eq (QName l) 
Data l => Data (QName l) 
Ord l => Ord (QName l) 
Show l => Show (QName l) 
Pretty (QName l) 

data Name l

This type is used to represent variables, and also constructors.

Constructors

Ident l String

varid or conid.

Symbol l String

varsym or consym

Instances

Functor Name 
Typeable1 Name 
Foldable Name 
Traversable Name 
Annotated Name 
ExactP Name 
Eq l => Eq (Name l) 
Data l => Data (Name l) 
Ord l => Ord (Name l) 
Show l => Show (Name l) 
Pretty (Name l) 

data QOp l

Possibly qualified infix operators (qop), appearing in expressions.

Constructors

QVarOp l (QName l)

variable operator (qvarop)

QConOp l (QName l)

constructor operator (qconop)

Instances

Functor QOp 
Typeable1 QOp 
Foldable QOp 
Traversable QOp 
Annotated QOp 
ExactP QOp 
Eq l => Eq (QOp l) 
Data l => Data (QOp l) 
Ord l => Ord (QOp l) 
Show l => Show (QOp l) 
Pretty (QOp l) 

data Op l

Operators appearing in infix declarations are never qualified.

Constructors

VarOp l (Name l)

variable operator (varop)

ConOp l (Name l)

constructor operator (conop)

Instances

Functor Op 
Typeable1 Op 
Foldable Op 
Traversable Op 
Annotated Op 
ExactP Op 
Eq l => Eq (Op l) 
Data l => Data (Op l) 
Ord l => Ord (Op l) 
Show l => Show (Op l) 
Pretty (Op l) 

data SpecialCon l

Constructors with special syntax. These names are never qualified, and always refer to builtin type or data constructors.

Constructors

UnitCon l

unit type and data constructor ()

ListCon l

list type constructor []

FunCon l

function type constructor ->

TupleCon l Boxed Int

n-ary tuple type and data constructors (,) etc, possibly boxed (#,#)

Cons l

list data constructor (:)

UnboxedSingleCon l

unboxed singleton tuple constructor (# #)

Instances

Functor SpecialCon 
Typeable1 SpecialCon 
Foldable SpecialCon 
Traversable SpecialCon 
Annotated SpecialCon 
ExactP SpecialCon 
Eq l => Eq (SpecialCon l) 
Data l => Data (SpecialCon l) 
Ord l => Ord (SpecialCon l) 
Show l => Show (SpecialCon l) 

data CName l

A name (cname) of a component of a class or data type in an import or export specification.

Constructors

VarName l (Name l)

name of a method or field

ConName l (Name l)

name of a data constructor

Instances

Functor CName 
Typeable1 CName 
Foldable CName 
Traversable CName 
Annotated CName 
ExactP CName 
Eq l => Eq (CName l) 
Data l => Data (CName l) 
Ord l => Ord (CName l) 
Show l => Show (CName l) 
Pretty (CName l) 

data IPName l

An implicit parameter name.

Constructors

IPDup l String

?ident, non-linear implicit parameter

IPLin l String

%ident, linear implicit parameter

Instances

Functor IPName 
Typeable1 IPName 
Foldable IPName 
Traversable IPName 
Annotated IPName 
ExactP IPName 
Eq l => Eq (IPName l) 
Data l => Data (IPName l) 
Ord l => Ord (IPName l) 
Show l => Show (IPName l) 
Pretty (IPName l) 

data XName l

The name of an xml element or attribute, possibly qualified with a namespace.

Constructors

XName l String 
XDomName l String String 

Instances

Functor XName 
Typeable1 XName 
Foldable XName 
Traversable XName 
Annotated XName 
ExactP XName 
Eq l => Eq (XName l) 
Data l => Data (XName l) 
Ord l => Ord (XName l) 
Show l => Show (XName l) 
Pretty (XName l) 

Template Haskell

data Bracket l

A template haskell bracket expression.

Constructors

ExpBracket l (Exp l)

expression bracket: [| ... |]

PatBracket l (Pat l)

pattern bracket: [p| ... |]

TypeBracket l (Type l)

type bracket: [t| ... |]

DeclBracket l [Decl l]

declaration bracket: [d| ... |]

Instances

Functor Bracket 
Typeable1 Bracket 
Foldable Bracket 
Traversable Bracket 
Annotated Bracket 
ExactP Bracket 
AppFixity Bracket 
Eq l => Eq (Bracket l) 
Data l => Data (Bracket l) 
Ord l => Ord (Bracket l) 
Show l => Show (Bracket l) 
SrcInfo loc => Pretty (Bracket loc) 

data Splice l

A template haskell splice expression

Constructors

IdSplice l String

variable splice: $var

ParenSplice l (Exp l)

parenthesised expression splice: $(exp)

Instances

Functor Splice 
Typeable1 Splice 
Foldable Splice 
Traversable Splice 
Annotated Splice 
ExactP Splice 
AppFixity Splice 
Eq l => Eq (Splice l) 
Data l => Data (Splice l) 
Ord l => Ord (Splice l) 
Show l => Show (Splice l) 
SrcInfo loc => Pretty (Splice loc) 

FFI

data Safety l

The safety of a foreign function call.

Constructors

PlayRisky l

unsafe

PlaySafe l Bool

safe (False) or threadsafe (True)

PlayInterruptible l

interruptible

Instances

Functor Safety 
Typeable1 Safety 
Foldable Safety 
Traversable Safety 
Annotated Safety 
ExactP Safety 
Eq l => Eq (Safety l) 
Data l => Data (Safety l) 
Ord l => Ord (Safety l) 
Show l => Show (Safety l) 
Pretty (Safety l) 

data CallConv l

The calling convention of a foreign function call.

Constructors

StdCall l 
CCall l 
CPlusPlus l 
DotNet l 
Jvm l 
Js l 
CApi l 

Instances

Functor CallConv 
Typeable1 CallConv 
Foldable CallConv 
Traversable CallConv 
Annotated CallConv 
ExactP CallConv 
Eq l => Eq (CallConv l) 
Data l => Data (CallConv l) 
Ord l => Ord (CallConv l) 
Show l => Show (CallConv l) 
Pretty (CallConv l) 

Pragmas

data ModulePragma l

A top level options pragma, preceding the module header.

Constructors

LanguagePragma l [Name l]

LANGUAGE pragma

OptionsPragma l (Maybe Tool) String

OPTIONS pragma, possibly qualified with a tool, e.g. OPTIONS_GHC

AnnModulePragma l (Annotation l)

ANN pragma with module scope

Instances

Functor ModulePragma 
Typeable1 ModulePragma 
Foldable ModulePragma 
Traversable ModulePragma 
Annotated ModulePragma 
ExactP ModulePragma 
Eq l => Eq (ModulePragma l) 
Data l => Data (ModulePragma l) 
Ord l => Ord (ModulePragma l) 
Show l => Show (ModulePragma l) 
SrcInfo loc => Pretty (ModulePragma loc) 

data Tool

Recognised tools for OPTIONS pragmas.

Constructors

GHC 
HUGS 
NHC98 
YHC 
HADDOCK 
UnknownTool String 

Instances

Eq Tool 
Data Tool 
Ord Tool 
Show Tool 
Typeable Tool 
Pretty Tool 

data Rule l

The body of a RULES pragma.

Constructors

Rule l String (Maybe (Activation l)) (Maybe [RuleVar l]) (Exp l) (Exp l) 

Instances

Functor Rule 
Typeable1 Rule 
Foldable Rule 
Traversable Rule 
Annotated Rule 
ExactP Rule 
Eq l => Eq (Rule l) 
Data l => Data (Rule l) 
Ord l => Ord (Rule l) 
Show l => Show (Rule l) 
SrcInfo loc => Pretty (Rule loc) 

data RuleVar l

Variables used in a RULES pragma, optionally annotated with types

Constructors

RuleVar l (Name l) 
TypedRuleVar l (Name l) (Type l) 

Instances

Functor RuleVar 
Typeable1 RuleVar 
Foldable RuleVar 
Traversable RuleVar 
Annotated RuleVar 
ExactP RuleVar 
Eq l => Eq (RuleVar l) 
Data l => Data (RuleVar l) 
Ord l => Ord (RuleVar l) 
Show l => Show (RuleVar l) 
Pretty (RuleVar l) 

data Activation l

Activation clause of a RULES pragma.

Constructors

ActiveFrom l Int 
ActiveUntil l Int 

Instances

Functor Activation 
Typeable1 Activation 
Foldable Activation 
Traversable Activation 
Annotated Activation 
ExactP Activation 
Eq l => Eq (Activation l) 
Data l => Data (Activation l) 
Ord l => Ord (Activation l) 
Show l => Show (Activation l) 
Pretty (Activation l) 

data Annotation l

An annotation through an ANN pragma.

Constructors

Ann l (Name l) (Exp l)

An annotation for a declared name.

TypeAnn l (Name l) (Exp l)

An annotation for a declared type.

ModuleAnn l (Exp l)

An annotation for the defining module.

Instances

Functor Annotation 
Typeable1 Annotation 
Foldable Annotation 
Traversable Annotation 
Annotated Annotation 
ExactP Annotation 
AppFixity Annotation 
Eq l => Eq (Annotation l) 
Data l => Data (Annotation l) 
Ord l => Ord (Annotation l) 
Show l => Show (Annotation l) 
SrcInfo loc => Pretty (Annotation loc) 

Builtin names

Modules

Main function of a program

main_name :: l -> Name l

Constructors

tuple_con_name :: l -> Boxed -> Int -> QName l

unit_con :: l -> Exp l

tuple_con :: l -> Boxed -> Int -> Exp l

Special identifiers

as_name :: l -> Name l

hiding_name :: l -> Name l

minus_name :: l -> Name l

bang_name :: l -> Name l

dot_name :: l -> Name l

star_name :: l -> Name l

export_name :: l -> Name l

safe_name :: l -> Name l

unsafe_name :: l -> Name l

stdcall_name :: l -> Name l

ccall_name :: l -> Name l

dotnet_name :: l -> Name l

jvm_name :: l -> Name l

js_name :: l -> Name l

forall_name :: l -> Name l

family_name :: l -> Name l

Type constructors

tuple_tycon_name :: l -> Boxed -> Int -> QName l

unit_tycon :: l -> Type l

fun_tycon :: l -> Type l

list_tycon :: l -> Type l

tuple_tycon :: l -> Boxed -> Int -> Type l

Source coordinates

Annotated trees

class Functor ast => Annotated ast where

AST nodes are annotated, and this class allows manipulation of the annotations.

Methods

ann :: ast l -> l

Retrieve the annotation of an AST node.

amap :: (l -> l) -> ast l -> ast l

Change the annotation of an AST node. Note that only the annotation of the node itself is affected, and not the annotations of any child nodes. if all nodes in the AST tree are to be affected, use fmap.

(=~=) :: (Annotated a, Eq (a ())) => a l1 -> a l2 -> Bool

Test if two AST elements are equal modulo annotations.