Copyright | (c) Matt Morrow 2008 |
---|---|
License | BSD3 |
Maintainer | Matt Morrow <mjm2002@gmail.com> |
Stability | experimental |
Portability | portable (template-haskell) |
Safe Haskell | None |
Language | Haskell98 |
- class ToName a where
- class ToNames a where
- class ToLit a where
- class ToType a where
- class ToPat a where
- class ToExp a where
- class ToDecs a where
- class ToDec a where
- class ToStmt a where
- class ToLoc a where
- class ToCxt a where
- class ToPred a where
- class ToTyVars a where
- class ToMaybeKind a where
- class ToInjectivityAnn a where
- class ToDerivClauses a where
- moduleName :: [Char]
- noTH :: (Functor f, Show (f ())) => String -> f e -> a
- noTHyet :: (Functor f, Show (f ())) => String -> String -> f e -> a
- todo :: (Functor f, Show (f ())) => String -> f e -> a
- nonsense :: (Functor f, Show (f ())) => String -> String -> f e -> a
- toFieldExp :: FieldUpdate l -> FieldExp
- toMatch :: Alt l -> Match
- toBody :: Rhs l -> Body
- toGuard :: GuardedRhs l -> (Guard, Exp)
- toKind :: Kind l -> Kind
- toTyVar :: TyVarBind l -> TyVarBndr
- toStrictType :: Type l -> StrictType
- (.->.) :: Type -> Type -> Type
- toDerivStrategy :: DerivStrategy l -> DerivStrategy
- foldAppT :: Type -> [Type] -> Type
- transAct :: Maybe (Activation l) -> Phases
- qualConDeclToCon :: QualConDecl l -> Con
- conDeclToCon :: ConDecl l -> Con
- hsMatchesToFunD :: [Match l] -> Dec
- hsMatchToClause :: Match l -> Clause
- hsRhsToBody :: Rhs l -> Body
- hsGuardedRhsToBody :: GuardedRhs l -> Body
- hsStmtToGuard :: Stmt l -> Guard
- collectVars :: Type -> [TyVarBndr]
- fixForall :: Type -> Type
Documentation
class ToMaybeKind a where Source #
toMaybeKind :: a -> Maybe Kind Source #
ToMaybeKind a => ToMaybeKind (Maybe a) Source # | |
ToMaybeKind (ResultSig l) Source # | |
class ToInjectivityAnn a where Source #
toInjectivityAnn :: a -> InjectivityAnn Source #
class ToDerivClauses a where Source #
toDerivClauses :: a -> [DerivClause] Source #
ToDerivClauses a => ToDerivClauses [a] Source # | |
ToDerivClauses a => ToDerivClauses (Maybe a) Source # | |
ToDerivClauses (Deriving l) Source # | |
moduleName :: [Char] Source #
ToName {String,HsName,Module,HsSpecialCon,HsQName}
ToLit HsLiteral
ToPat HsPat
ToExp HsExp
toFieldExp :: FieldUpdate l -> FieldExp Source #
ToLoc SrcLoc
ToType HsType
toStrictType :: Type l -> StrictType Source #
toDerivStrategy :: DerivStrategy l -> DerivStrategy Source #
ToStmt HsStmt
ToDec HsDecl
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 #
ToDecs InstDecl
ToDecs HsDecl HsBinds
collectVars :: Type -> [TyVarBndr] Source #