Portability | portable |
---|---|
Stability | experimental |
Maintainer | libraries@haskell.org |
Safe Haskell | Safe-Infered |
Language.Haskell.TH.Syntax
Description
Abstract syntax definitions for Template Haskell.
Synopsis
- class (Monad m, Applicative m) => Quasi m where
- class Lift t where
- liftString :: String -> Q Exp
- data Q a
- runQ :: Quasi m => Q a -> m a
- report :: Bool -> String -> Q ()
- recover :: Q a -> Q a -> Q a
- reify :: Name -> Q Info
- lookupTypeName, lookupValueName :: String -> Q (Maybe Name)
- location :: Q Loc
- runIO :: IO a -> Q a
- addDependentFile :: FilePath -> Q ()
- isInstance :: Name -> [Type] -> Q Bool
- reifyInstances :: Name -> [Type] -> Q [Dec]
- data Name = Name OccName NameFlavour
- mkName :: String -> Name
- newName :: String -> Q Name
- nameBase :: Name -> String
- nameModule :: Name -> Maybe String
- showName :: Name -> String
- showName' :: NameIs -> Name -> String
- data NameIs
- data Dec
- = FunD Name [Clause]
- | ValD Pat Body [Dec]
- | DataD Cxt Name [TyVarBndr] [Con] [Name]
- | NewtypeD Cxt Name [TyVarBndr] Con [Name]
- | TySynD Name [TyVarBndr] Type
- | ClassD Cxt Name [TyVarBndr] [FunDep] [Dec]
- | InstanceD Cxt Type [Dec]
- | SigD Name Type
- | ForeignD Foreign
- | PragmaD Pragma
- | FamilyD FamFlavour Name [TyVarBndr] (Maybe Kind)
- | DataInstD Cxt Name [Type] [Con] [Name]
- | NewtypeInstD Cxt Name [Type] Con [Name]
- | TySynInstD Name [Type] Type
- data Exp
- = VarE Name
- | ConE Name
- | LitE Lit
- | AppE Exp Exp
- | InfixE (Maybe Exp) Exp (Maybe Exp)
- | UInfixE Exp Exp Exp
- | ParensE Exp
- | LamE [Pat] Exp
- | TupE [Exp]
- | UnboxedTupE [Exp]
- | CondE Exp Exp Exp
- | LetE [Dec] Exp
- | CaseE Exp [Match]
- | DoE [Stmt]
- | CompE [Stmt]
- | ArithSeqE Range
- | ListE [Exp]
- | SigE Exp Type
- | RecConE Name [FieldExp]
- | RecUpdE Exp [FieldExp]
- data Con
- = NormalC Name [StrictType]
- | RecC Name [VarStrictType]
- | InfixC StrictType Name StrictType
- | ForallC [TyVarBndr] Cxt Con
- data Type
- data TyVarBndr
- data Kind
- type Cxt = [Pred]
- data Pred
- data Match = Match Pat Body [Dec]
- data Clause = Clause [Pat] Body [Dec]
- data Body
- data Guard
- data Stmt
- data Range
- data Lit
- data Pat
- type FieldExp = (Name, Exp)
- type FieldPat = (Name, Pat)
- data Strict
- data Foreign
- data Callconv
- data Safety
- = Unsafe
- | Safe
- | Interruptible
- data Pragma
- data InlineSpec = InlineSpec Bool Bool (Maybe (Bool, Int))
- type StrictType = (Strict, Type)
- type VarStrictType = (Name, Strict, Type)
- data FunDep = FunDep [Name] [Name]
- data FamFlavour
- data Info
- data Loc = Loc {
- loc_filename :: String
- loc_package :: String
- loc_module :: String
- loc_start :: CharPos
- loc_end :: CharPos
- type CharPos = (Int, Int)
- data Fixity = Fixity Int FixityDirection
- data FixityDirection
- defaultFixity :: Fixity
- maxPrecedence :: Int
- returnQ :: a -> Q a
- bindQ :: Q a -> (a -> Q b) -> Q b
- sequenceQ :: [Q a] -> Q [a]
- data NameFlavour
- data NameSpace
- mkNameG_v, mkNameG_d, mkNameG_tc :: String -> String -> String -> Name
- type Uniq = Int
- mkNameL :: String -> Uniq -> Name
- mkNameU :: String -> Uniq -> Name
- tupleTypeName :: Int -> Name
- tupleDataName :: Int -> Name
- unboxedTupleTypeName :: Int -> Name
- unboxedTupleDataName :: Int -> Name
- data OccName
- mkOccName :: String -> OccName
- occString :: OccName -> String
- data ModName
- mkModName :: String -> ModName
- modString :: ModName -> String
- data PkgName
- mkPkgName :: String -> PkgName
- pkgString :: PkgName -> String
Documentation
class (Monad m, Applicative m) => Quasi m whereSource
Methods
Arguments
the error handler
action which may fail
Recover from the monadic fail
qLookupName :: Bool -> String -> m (Maybe Name)Source
qReify :: Name -> m Info Source
qReifyInstances :: Name -> [Type] -> m [Dec]Source
Input/output (dangerous)
qAddDependentFile :: FilePath -> m () Source
Instances
liftString :: String -> Q Exp Source
lookupTypeName, lookupValueName :: String -> Q (Maybe Name)Source
The runIO
function lets you run an I/O computation in the Q
monad.
Take care: you are guaranteed the ordering of calls to runIO
within
a single Q
computation, but not about the order in which splices are run.
Note: for various murky reasons, stdout and stderr handles are not necesarily flushed when the compiler finishes running, so you should flush them yourself.
addDependentFile :: FilePath -> Q () Source
Record external files that runIO is using (dependent upon). The compiler can then recognize that it should re-compile the file using this TH when the external file changes. Note that ghc -M will still not know about these dependencies - it does not execute TH. Expects an absolute file path.
Names
For global names (NameG
) we need a totally unique name,
so we must include the name-space of the thing
For unique-numbered things (NameU
), we've got a unique reference
anyway, so no need for name space
For dynamically bound thing (NameS
) we probably want them to
in a context-dependent way, so again we don't want the name
space. For example:
let v = mkName "T" in [| data $v = $v |]
Here we use the same Name for both type constructor and data constructor
NameL and NameG are bound *outside* the TH syntax tree either globally (NameG) or locally (NameL). Ex:
f x = $(h [| (map, x) |])
The map
will be a NameG, and x
wil be a NameL
These Names should never appear in a binding position in a TH syntax tree
Constructors
mkName :: String -> Name Source
The string can have a .
, thus Foo.baz,
giving a dynamically-bound qualified name,
in which case we want to generate a NameQ
Parse the string to see if it has a . in it so we know whether to generate a qualified or unqualified name It's a bit tricky because we need to parse
Foo.Baz.x as Qual Foo.Baz x
So we parse it from back to front
nameModule :: Name -> Maybe String Source
The algebraic data types
Note [Unresolved infix] ~~~~~~~~~~~~~~~~~~~~~~~
When implementing antiquotation for quasiquoters, one often wants to parse strings into expressions:
parse :: String -> Maybe 'Exp'
But how should we parse a + b * c
? If we don't know the fixities of
+
and *
, we don't know whether to parse it as a + (b * c)
or (a
+ b) * c
.
In cases like this, use UInfixE
or UInfixP
, which stand for
"unresolved infix expression" and "unresolved infix pattern". When
the compiler is given a splice containing a tree of UInfixE
applications such as
UInfixE (UInfixE e1 op1 e2) op2 (UInfixE e3 op3 e4)
it will look up and the fixities of the relevant operators and reassociate the tree as necessary.
- trees will not be reassociated across
ParensE
orParensP
, which are of use for parsing expressions like
(a + b * c) + d * e
-
InfixE
andInfixP
expressions are never reassociated. - The
UInfixE
constructor doesn't support sections. Sections such as(a *)
have no ambiguity, soInfixE
suffices. For longer sections such as(a + b * c -)
, use anInfixE
constructor for the outer-most section, and useUInfixE
constructors for all other operators:
InfixE Just (UInfixE ...a + b * c...) op Nothing
Sections such as (a + b +)
and ((a + b) +)
should be rendered
into Exp
s differently:
(+ a + b) ---> InfixE Nothing + (Just $ UInfixE a + b) -- will result in a fixity error if (+) is left-infix (+ (a + b)) ---> InfixE Nothing + (Just $ ParensE $ UInfixE a + b) -- no fixity errors
- Quoted expressions such as
[| a * b + c |] :: Q Exp [p| a : b : c |] :: Q Pat
will never contain UInfixE
, UInfixP
, ParensE
, or ParensP
constructors.
The CompE
constructor represents a list comprehension, and
takes a [Stmt
]. The result expression of the comprehension is
the *last* of these, and should be a NoBindS
.
E.g. translation:
[ f x | x <- xs ]
CompE [BindS (VarP x) (VarE xs), NoBindS (AppE (VarE f) (VarE x))]
Constructors
Constructors
Pattern in Haskell given in {}
Constructors
{ _ }
data InlineSpec Source
Instances
type StrictType = (Strict, Type)Source
type VarStrictType = (Name, Strict, Type)Source
data FamFlavour Source
Instances
Constructors
Constructors
Fields
- loc_filename :: String
- loc_package :: String
- loc_module :: String
- loc_start :: CharPos
- loc_end :: CharPos
Constructors
data FixityDirection Source
Internal functions
data NameFlavour Source
Constructors
An unqualified name; dynamically bound
Instances
Although the NameFlavour type is abstract, the Data instance is not. The reason for this is that currently we use Data to serialize values in annotations, and in order for that to work for Template Haskell names introduced via the 'x syntax we need gunfold on NameFlavour to work. Bleh!
The long term solution to this is to use the binary package for annotation serialization and then remove this instance. However, to do _that_ we need to wait on binary to become stable, since boot libraries cannot be upgraded seperately from GHC itself.
This instance cannot be derived automatically due to bug #2701