haskell-src-meta-0.0.3.1: Parse source to template-haskell abstract syntax.Source codeContentsIndex
Language.Haskell.Meta.Syntax.Translate
Portabilityportable (template-haskell)
Stabilityexperimental
MaintainerMatt Morrow <mjm2002@gmail.com>
Contents
ToName {String,HsName,Module,HsSpecialCon,HsQName}
ToLit HsLiteral
ToPat HsPat
ToExp HsExp
ToLoc SrcLoc
ToType HsType
ToStmt HsStmt
ToDec HsDecl
Description
Synopsis
class ToName a where
toName :: a -> Name
class ToLit a where
toLit :: a -> Lit
class ToType a where
toType :: a -> Type
class ToPat a where
toPat :: a -> Pat
class ToExp a where
toExp :: a -> Exp
class ToDec a where
toDec :: a -> Dec
class ToStmt a where
toStmt :: a -> Stmt
class ToLoc a where
toLoc :: a -> Loc
errorMsg :: Typeable a => String -> a -> String
toFieldExp :: FieldUpdate -> FieldExp
(.->.) :: Type -> Type -> Type
foldAppT :: Type -> [Type] -> Type
hsBindsToDecs :: Binds -> [Dec]
hsBangTypeToStrictType :: BangType -> (Strict, Type)
hsMatchesToFunD :: [Match] -> Dec
hsMatchToClause :: Match -> Clause
hsRhsToBody :: Rhs -> Body
hsGuardedRhsToBody :: GuardedRhs -> Body
hsStmtToGuard :: Stmt -> Guard
Documentation
class ToName a whereSource
Methods
toName :: a -> NameSource
show/hide Instances
class ToLit a whereSource
Methods
toLit :: a -> LitSource
show/hide Instances
class ToType a whereSource
Methods
toType :: a -> TypeSource
show/hide Instances
class ToPat a whereSource
Methods
toPat :: a -> PatSource
show/hide Instances
ToPat Pat
ToPat Lit
ToPat a => ToPat ([] a)
(ToPat a, ToPat b) => ToPat ((,) a b)
(ToPat a, ToPat b, ToPat c) => ToPat ((,,) a b c)
(ToPat a, ToPat b, ToPat c, ToPat d) => ToPat ((,,,) a b c d)
class ToExp a whereSource
Methods
toExp :: a -> ExpSource
show/hide Instances
ToExp QOp
ToExp Exp
ToExp Splice
ToExp Lit
ToExp a => ToExp ([] a)
(ToExp a, ToExp b) => ToExp ((,) a b)
(ToExp a, ToExp b, ToExp c) => ToExp ((,,) a b c)
(ToExp a, ToExp b, ToExp c, ToExp d) => ToExp ((,,,) a b c d)
class ToDec a whereSource
Methods
toDec :: a -> DecSource
show/hide Instances
class ToStmt a whereSource
Methods
toStmt :: a -> StmtSource
show/hide Instances
class ToLoc a whereSource
Methods
toLoc :: a -> LocSource
show/hide Instances
errorMsg :: Typeable a => String -> a -> StringSource
ToName {String,HsName,Module,HsSpecialCon,HsQName}
ToLit HsLiteral
ToPat HsPat
ToExp HsExp
toFieldExp :: FieldUpdate -> FieldExpSource
ToLoc SrcLoc
ToType HsType
(.->.) :: Type -> Type -> TypeSource
foldAppT :: Type -> [Type] -> TypeSource
ToStmt HsStmt
ToDec HsDecl
hsBindsToDecs :: Binds -> [Dec]Source
hsBangTypeToStrictType :: BangType -> (Strict, Type)Source
hsMatchesToFunD :: [Match] -> DecSource
hsMatchToClause :: Match -> ClauseSource
hsRhsToBody :: Rhs -> BodySource
hsGuardedRhsToBody :: GuardedRhs -> BodySource
hsStmtToGuard :: Stmt -> GuardSource
Produced by Haddock version 2.4.2