Copyright | (c) Matt Morrow 2008 |
---|---|
License | BSD3 |
Maintainer | Matt Morrow <mjm2002@gmail.com> |
Stability | experimental |
Portability | portable (template-haskell) |
Safe Haskell | None |
Language | Haskell2010 |
Documentation
class ToDerivClauses a where Source #
toDerivClauses :: a -> [DerivClause] Source #
Instances
ToDerivClauses a => ToDerivClauses [a] Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate toDerivClauses :: [a] -> [DerivClause] Source # | |
ToDerivClauses a => ToDerivClauses (Maybe a) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate toDerivClauses :: Maybe a -> [DerivClause] Source # | |
ToDerivClauses (Deriving l) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate toDerivClauses :: Deriving l -> [DerivClause] Source # |
type DerivClause = DerivClause Source #
class ToInjectivityAnn a where Source #
toInjectivityAnn :: a -> InjectivityAnn Source #
Instances
ToInjectivityAnn (InjectivityInfo l) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate |
class ToMaybeKind a where Source #
toMaybeKind :: a -> Maybe Kind Source #
Instances
ToMaybeKind a => ToMaybeKind (Maybe a) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate | |
ToMaybeKind (ResultSig l) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate |
class ToTyVars a where Source #
toTyVars :: a -> [TyVarBndr_ ()] Source #
Instances
ToTyVars a => ToTyVars [a] Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate toTyVars :: [a] -> [TyVarBndr_ ()] Source # | |
ToTyVars a => ToTyVars (Maybe a) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate toTyVars :: Maybe a -> [TyVarBndr_ ()] Source # | |
ToTyVars (DeclHead l) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate toTyVars :: DeclHead l -> [TyVarBndr_ ()] Source # | |
ToTyVars (TyVarBind l) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate toTyVars :: TyVarBind l -> [TyVarBndr_ ()] Source # |
Instances
ToExp Lit Source # | |
ToExp a => ToExp [a] Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate | |
ToExp (QOp l) Source # | |
ToExp (Exp l) Source # | |
(ToExp a, ToExp b) => ToExp (a, b) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate | |
(ToExp a, ToExp b, ToExp c) => ToExp (a, b, c) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate | |
(ToExp a, ToExp b, ToExp c, ToExp d) => ToExp (a, b, c, d) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate |
Instances
ToPat Lit Source # | |
ToPat a => ToPat [a] Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate | |
ToPat (Pat l) Source # | |
(ToPat a, ToPat b) => ToPat (a, b) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate | |
(ToPat a, ToPat b, ToPat c) => ToPat (a, b, c) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate | |
(ToPat a, ToPat b, ToPat c, ToPat d) => ToPat (a, b, c, d) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate |
Instances
ToName Name Source # | |
ToName String Source # | |
ToName (SpecialCon l) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate toName :: SpecialCon l -> Name Source # | |
ToName (QName l) Source # | |
ToName (Name l) Source # | |
ToName (Op l) Source # | |
ToName (DeclHead l) Source # | |
ToName (MaybePromotedName l) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate toName :: MaybePromotedName l -> Name Source # | |
ToName (TyVarBind l) Source # | |
ToName (TyVarBndr_ flag) Source # | |
Defined in Language.Haskell.Meta.Syntax.Translate toName :: TyVarBndr_ flag -> Name Source # |
moduleName :: String Source #
toFieldExp :: FieldUpdate l -> FieldExp Source #
toTyVar :: TyVarBind l -> TyVarBndr_ () Source #
toTyVarSpec :: TyVarBndr_ flag -> TyVarBndr_ flag Source #
toStrictType :: Type l -> StrictType Source #
toDerivStrategy :: DerivStrategy l -> DerivStrategy Source #
qualConDeclToCon :: QualConDecl l -> Con Source #
conDeclToCon :: ConDecl l -> Con Source #
hsMatchesToFunD :: [Match l] -> Dec Source #
hsMatchToClause :: Match l -> Clause Source #
hsRhsToBody :: Rhs l -> Body Source #
hsGuardedRhsToBody :: GuardedRhs l -> Body Source #
hsStmtToGuard :: Stmt l -> Guard Source #
type TyVarBndr_ flag = TyVarBndr Source #