Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
fromTyTuple :: Type l -> [Type l] Source #
fromTyParen :: Type () -> Type () Source #
fromTyParens :: Type () -> Type () Source #
isGuardFalse :: Match l -> Bool Source #
dataDeclType :: DataDecl -> Type () Source #
dataDeclFields :: DataDecl -> [String] Source #
type FullDataDecl = (ModuleName (), DataDecl) Source #
moduleName :: Module l -> ModuleName l Source #
moduleDecls :: Module l -> [Decl l] Source #
moduleImports :: Module l -> [ImportDecl l] Source #
modulePragmas :: Module l -> [ModulePragma l] Source #
isDataDecl :: Decl () -> Bool Source #
dataDeclName :: DataDecl -> String Source #
fromIParen :: InstRule a -> InstRule a Source #
dataDeclVars :: DataDecl -> [String] Source #
dataDeclVarsStar :: DataDecl -> [String] Source #
dataDeclArity :: DataDecl -> Int Source #
dataDeclCtors :: DataDecl -> [CtorDecl] Source #
ctorDeclName :: CtorDecl -> String Source #
ctorDeclName' :: CtorDecl -> Name () Source #
ctorDeclFields :: CtorDecl -> FieldDecl Source #
ctorDeclArity :: CtorDecl -> Int Source #
module Language.Haskell.Exts