template-haskell
Safe HaskellSafe
LanguageHaskell2010

Language.Haskell.TH.Ppr

Description

contains a prettyprinter for the Template Haskell datatypes

Synopsis

Documentation

appPrec :: Precedence #

bar :: Doc #

bytesToString :: [Word8] -> String #

commaSep :: Ppr a => [a] -> Doc #

commaSepApplied :: [Name] -> Doc #

commaSepWith :: (a -> Doc) -> [a] -> Doc #

fromTANormal :: TypeArg -> Maybe Type #

funPrec :: Precedence #

hashParens :: Doc -> Doc #

isStarT :: Type -> Bool #

isSymOcc :: Name -> Bool #

nestDepth :: Int #

noPrec :: Precedence #

opPrec :: Precedence #

parensIf :: Bool -> Doc -> Doc #

pprBangType :: BangType -> Doc #

pprBndrVis :: BndrVis -> Doc -> Doc #

pprBody :: Bool -> Body -> Doc #

pprClause :: Bool -> Clause -> Doc #

pprCtxWith :: Ppr a => (Precedence -> a -> Doc) -> [a] -> Doc #

pprCxt :: Cxt -> Doc #

pprExp :: Precedence -> Exp -> Doc #

pprFields :: [(Name, Exp)] -> Doc #

pprFixity :: Name -> Fixity -> NamespaceSpecifier -> Doc #

pprForall :: [TyVarBndr Specificity] -> Cxt -> Doc #

pprForall' :: PprFlag flag => ForallVisFlag -> [TyVarBndr flag] -> Cxt -> Doc #

pprForallVis :: [TyVarBndr ()] -> Cxt -> Doc #

pprFunArgType :: Type -> Doc #

pprGadtRHS :: [(Strict, Type)] -> Type -> Doc #

pprGuarded :: Doc -> (Guard, Exp) -> Doc #

pprInfixExp :: Exp -> Doc #

pprInfixT :: Precedence -> Type -> Doc #

pprLit :: Precedence -> Lit -> Doc #

pprMatchPat :: Pat -> Doc #

pprMaybeExp :: Precedence -> Maybe Exp -> Doc #

pprNamespaceSpecifier :: NamespaceSpecifier -> Doc #

pprParendType :: Type -> Doc #

pprParendTypeArg :: TypeArg -> Doc #

pprPat :: Precedence -> Pat -> Doc #

pprPatSynSig :: Name -> PatSynType -> Doc #

Pretty prints a pattern synonym type signature

pprPatSynType :: PatSynType -> Doc #

Pretty prints a pattern synonym's type; follows the usual conventions to print a pattern synonym type compactly, yet unambiguously. See the note on PatSynType and the section on pattern synonyms in the GHC user's guide for more information.

pprPrefixOcc :: Name -> Doc #

pprRecFields :: [(Name, Strict, Type)] -> Type -> Doc #

pprStrictType :: (Strict, Type) -> Doc #

Deprecated: As of template-haskell-2.11.0.0, StrictType has been replaced by BangType . Please use pprBangType instead.

pprString :: String -> Doc #

pprTyApp :: Precedence -> (Type, [TypeArg]) -> Doc #

pprTyLit :: TyLit -> Doc #

pprType :: Precedence -> Type -> Doc #

pprVarBangType :: VarBangType -> Doc #

pprVarStrictType :: (Name, Strict, Type) -> Doc #

Deprecated: As of template-haskell-2.11.0.0, VarStrictType has been replaced by VarBangType . Please use pprVarBangType instead.

ppr_bndrs :: PprFlag flag => Maybe [TyVarBndr flag] -> Doc #

ppr_ctx_preds_with :: Ppr a => (Precedence -> a -> Doc) -> Precedence -> [a] -> Doc #

ppr_cxt_preds :: Precedence -> Cxt -> Doc #

ppr_data #

Arguments

:: Bool

declaration on the toplevel?

-> Doc
-> Cxt
-> Maybe Name
-> Doc
-> Maybe Kind
-> [Con]
-> Doc

ppr_dec #

Arguments

:: Bool

declaration on the toplevel?

-> Dec
-> Doc

ppr_deriv_clause :: DerivClause -> Doc #

ppr_deriv_strategy :: DerivStrategy -> Doc #

ppr_newtype #

Arguments

:: Bool

declaration on the toplevel?

-> Doc
-> Cxt
-> Maybe Name
-> Doc
-> Maybe Kind
-> Con
-> Doc

ppr_overlap :: Overlap -> Doc #

ppr_sig :: Name -> Type -> Doc #

ppr_tf_head :: TypeFamilyHead -> Doc #

ppr_tySyn :: Doc -> Maybe Name -> Doc -> Type -> Doc #

ppr_type_data #

Arguments

:: Bool

declaration on the toplevel?

-> Doc
-> Cxt
-> Maybe Name
-> Doc
-> Maybe Kind
-> [Con]
-> Doc

ppr_typedef :: String -> Bool -> Doc -> Cxt -> Maybe Name -> Doc -> Maybe Kind -> [Con] -> [DerivClause] -> Doc #

pprint :: Ppr a => a -> String #

qualPrec :: Precedence #

quoteParens :: Doc -> Doc #

semiSep :: Ppr a => [a] -> Doc #

semiSepWith :: (a -> Doc) -> [a] -> Doc #

sepWith :: Doc -> (a -> Doc) -> [a] -> Doc #

showtextl :: Show a => a -> Doc #

sigPrec :: Precedence #

split :: Type -> (Type, [TypeArg]) #

unboxedSumBars :: Doc -> SumAlt -> SumArity -> Doc #

unopPrec :: Precedence #

where_clause :: [Dec] -> Doc #

data ForallVisFlag #

Constructors

Instances

Instances details
Instance details

Defined in GHC.Internal.TH.Ppr

class Ppr a where #

Minimal complete definition

ppr

Methods

ppr :: a -> Doc #

ppr_list :: [a] -> Doc #

Instances

Instances details
Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: TypeArg -> Doc #

ppr_list :: [TypeArg] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Bang -> Doc #

ppr_list :: [Bang] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Clause -> Doc #

ppr_list :: [Clause] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Con -> Doc #

ppr_list :: [Con] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Dec -> Doc #

ppr_list :: [Dec] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Exp -> Doc #

ppr_list :: [Exp] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Foreign -> Doc #

ppr_list :: [Foreign] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: FunDep -> Doc #

ppr_list :: [FunDep] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Info -> Doc #

ppr_list :: [Info] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Inline -> Doc #

ppr_list :: [Inline] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Lit -> Doc #

ppr_list :: [Lit] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Loc -> Doc #

ppr_list :: [Loc] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Match -> Doc #

ppr_list :: [Match] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Module -> Doc #

ppr_list :: [Module] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: ModuleInfo -> Doc #

ppr_list :: [ModuleInfo] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Name -> Doc #

ppr_list :: [Name] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Pat -> Doc #

ppr_list :: [Pat] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: PatSynArgs -> Doc #

ppr_list :: [PatSynArgs] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: PatSynDir -> Doc #

ppr_list :: [PatSynDir] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Phases -> Doc #

ppr_list :: [Phases] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Pragma -> Doc #

ppr_list :: [Pragma] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Range -> Doc #

ppr_list :: [Range] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Role -> Doc #

ppr_list :: [Role] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: RuleBndr -> Doc #

ppr_list :: [RuleBndr] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: RuleMatch -> Doc #

ppr_list :: [RuleMatch] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Instance details

Defined in GHC.Internal.TH.Ppr

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Stmt -> Doc #

ppr_list :: [Stmt] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: TyLit -> Doc #

ppr_list :: [TyLit] -> Doc #

Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: Type -> Doc #

ppr_list :: [Type] -> Doc #

PprFlag flag => Ppr (TyVarBndr flag) #
Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: TyVarBndr flag -> Doc #

ppr_list :: [TyVarBndr flag] -> Doc #

Ppr a => Ppr [a] #
Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: [a] -> Doc #

ppr_list :: [[a]] -> Doc #

class PprFlag flag where #

Methods

pprTyVarBndr :: TyVarBndr flag -> Doc #

Instances

Instances details
Instance details

Defined in GHC.Internal.TH.Ppr

Instance details

Defined in GHC.Internal.TH.Ppr

PprFlag () #
Instance details

Defined in GHC.Internal.TH.Ppr

Methods

pprTyVarBndr :: TyVarBndr () -> Doc #

type Precedence = Int #

data TypeArg #

Constructors

Instances

Instances details
Instance details

Defined in GHC.Internal.TH.Ppr

Methods

ppr :: TypeArg -> Doc #

ppr_list :: [TypeArg] -> Doc #

AltStyle によって変換されたページ (->オリジナル) /