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

Safe HaskellNone
LanguageHaskell2010

Language.Haskell

Documentation

(?) :: Bool -> a -> a -> a infix 1 Source #

foralls :: Type () -> Type () Source #

tyApps :: Type () -> [Type ()] -> Type () Source #

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

(~=) :: Pretty a => a -> String -> Bool Source #

appP :: Exp () -> Exp () -> Exp () Source #

simplify :: Data a => a -> a Source #

rename :: QName () -> QName () Source #

paren :: Exp () -> Exp () Source #

noSl :: Data from => from -> from Source #

title :: [Char] -> [Char] Source #

var :: String -> Exp () Source #

con :: String -> Exp () Source #

type DataDecl = Decl () Source #

type FieldDecl = [(String, Type ())] Source #

showDecls :: Pretty a => [a] -> String Source #

tyApp :: Type () -> [Type ()] -> Type () Source #

tyFun :: [Type ()] -> Type () Source #

apps :: Exp () -> [Exp ()] -> Exp () Source #

bind :: String -> [Pat ()] -> Exp () -> Decl () Source #

binds :: String -> [([Pat ()], Exp ())] -> Decl () Source #