derive-2.5.18: A program and library to derive instances for data types

Safe HaskellNone

Language.Haskell

Documentation

(?) :: Bool -> a -> a -> aSource

foralls :: Type -> TypeSource

tyApps :: Type -> [Type] -> TypeSource

fromTyApps :: Type -> (Type, [Type])Source

fromTyTuple :: Type -> [Type]Source

fromTyParen :: Type -> TypeSource

fromTyParens :: Type -> TypeSource

tyRoot :: Type -> StringSource

isTyFun :: Type -> BoolSource

fromTyList :: Type -> Maybe TypeSource

(~=) :: Pretty a => a -> String -> BoolSource

appP :: Exp -> Exp -> ExpSource

simplify :: Data a => a -> aSource

rename :: QName -> QNameSource

isAtom :: Exp -> BoolSource

paren :: Exp -> ExpSource

sl :: SrcLocSource

noSl :: Data from => from -> fromSource

qname :: String -> QNameSource

var :: String -> ExpSource

con :: String -> ExpSource

tyVar :: String -> TypeSource

tyVarBind :: String -> TyVarBindSource

tyCon :: String -> TypeSource

pVar :: String -> PatSource

qvop :: String -> QOpSource

type DataDecl = DeclSource

type CtorDecl = Either QualConDecl GadtDeclSource

type FieldDecl = [(String, Type)]Source

type FullDataDecl = (ModuleName, DataDecl)Source

moduleName :: Module -> ModuleNameSource

moduleDecls :: Module -> [Decl]Source

moduleImports :: Module -> [ImportDecl]Source

modulePragmas :: Module -> [ModulePragma]Source

showDecls :: Pretty a => [a] -> StringSource

tyApp :: Type -> [Type] -> TypeSource

tyFun :: [Type] -> TypeSource

apps :: Exp -> [Exp] -> ExpSource

bind :: String -> [Pat] -> Exp -> DeclSource

binds :: String -> [([Pat], Exp)] -> DeclSource