Agda-2.6.4: A dependently typed functional programming language and proof assistant
Safe HaskellSafe-Inferred
LanguageHaskell2010

Agda.Syntax.Concrete.Pretty

Description

Pretty printer for the concrete syntax.

Synopsis

Documentation

newtype Tel Source #

Constructors

Tel Telescope 

Instances

Instances details
Pretty Tel Source # 
Instance details

Defined in Agda.Syntax.Concrete.Pretty

Methods

pretty :: Tel -> Doc Source #

prettyPrec :: Int -> Tel -> Doc Source #

prettyList :: [Tel] -> Doc Source #

data NamedBinding Source #

Constructors

NamedBinding 

Instances

Instances details
Pretty NamedBinding Source # 
Instance details

Defined in Agda.Syntax.Concrete.Pretty

prettyHiding :: LensHiding a => a -> (Doc -> Doc) -> Doc -> Doc Source #

prettyHiding info visible doc puts the correct braces around doc according to info info and returns visible doc if the we deal with a visible thing.

bracesAndSemicolons :: Foldable t => t Doc -> Doc Source #

prettyLock :: LensLock a => a -> Doc -> Doc Source #

attributesForModality :: Modality -> Doc Source #

Show the attributes necessary to recover a modality, in long-form (e.g. using at-syntax rather than dots). For the default modality, the result is at-ω (rather than the empty document). Suitable for showing modalities outside of binders.

prettyOpApp :: forall a. Pretty a => Aspect -> QName -> [NamedArg (MaybePlaceholder a)] -> [Doc] Source #

Orphan instances

Pretty Associativity Source # 
Instance details

Pretty Cohesion Source # 
Instance details

Pretty Erased Source # 
Instance details

Pretty Fixity Source # 
Instance details

Pretty Fixity' Source # 
Instance details

Pretty FixityLevel Source # 
Instance details

Pretty Modality Source # 
Instance details

Pretty NotationPart Source # 
Instance details

Pretty Q0Origin Source # 
Instance details

Pretty Q1Origin Source # 
Instance details

Pretty Quantity Source # 
Instance details

Pretty QωOrigin Source # 
Instance details

Pretty Relevance Source # 
Instance details

Pretty BoundName Source # 
Instance details

Pretty Declaration Source # 
Instance details

Pretty DoStmt Source # 
Instance details

Pretty Expr Source # 
Instance details

Methods

pretty :: Expr -> Doc Source #

prettyPrec :: Int -> Expr -> Doc Source #

prettyList :: [Expr] -> Doc Source #

Pretty LHS Source # 
Instance details

Methods

pretty :: LHS -> Doc Source #

prettyPrec :: Int -> LHS -> Doc Source #

prettyList :: [LHS] -> Doc Source #

Pretty LHSCore Source # 
Instance details

Pretty LamBinding Source # 
Instance details

Pretty LamClause Source # 
Instance details

Pretty ModuleApplication Source # 
Instance details

Pretty ModuleAssignment Source # 
Instance details

Pretty OpenShortHand Source # 
Instance details

Pretty Pattern Source # 
Instance details

Pretty Pragma Source # 
Instance details

Pretty RHS Source # 
Instance details

Methods

pretty :: RHS -> Doc Source #

prettyPrec :: Int -> RHS -> Doc Source #

prettyList :: [RHS] -> Doc Source #

Pretty TypedBinding Source # 
Instance details

Pretty WhereClause Source # 
Instance details

Show BoundName Source # 
Instance details

Methods

showsPrec :: Int -> BoundName -> ShowS

show :: BoundName -> String

showList :: [BoundName] -> ShowS

Show Declaration Source # 
Instance details

Methods

showsPrec :: Int -> Declaration -> ShowS

show :: Declaration -> String

showList :: [Declaration] -> ShowS

Show DoStmt Source # 
Instance details

Methods

showsPrec :: Int -> DoStmt -> ShowS

show :: DoStmt -> String

showList :: [DoStmt] -> ShowS

Show Expr Source # 
Instance details

Methods

showsPrec :: Int -> Expr -> ShowS

show :: Expr -> String

showList :: [Expr] -> ShowS

Show LHS Source # 
Instance details

Methods

showsPrec :: Int -> LHS -> ShowS

show :: LHS -> String

showList :: [LHS] -> ShowS

Show LHSCore Source # 
Instance details

Methods

showsPrec :: Int -> LHSCore -> ShowS

show :: LHSCore -> String

showList :: [LHSCore] -> ShowS

Show LamBinding Source # 
Instance details

Methods

showsPrec :: Int -> LamBinding -> ShowS

show :: LamBinding -> String

showList :: [LamBinding] -> ShowS

Show LamClause Source # 
Instance details

Methods

showsPrec :: Int -> LamClause -> ShowS

show :: LamClause -> String

showList :: [LamClause] -> ShowS

Show Module Source # 
Instance details

Methods

showsPrec :: Int -> Module -> ShowS

show :: Module -> String

showList :: [Module] -> ShowS

Show ModuleApplication Source # 
Instance details

Methods

showsPrec :: Int -> ModuleApplication -> ShowS

show :: ModuleApplication -> String

showList :: [ModuleApplication] -> ShowS

Show ModuleAssignment Source # 
Instance details

Methods

showsPrec :: Int -> ModuleAssignment -> ShowS

show :: ModuleAssignment -> String

showList :: [ModuleAssignment] -> ShowS

Show Pattern Source # 
Instance details

Methods

showsPrec :: Int -> Pattern -> ShowS

show :: Pattern -> String

showList :: [Pattern] -> ShowS

Show Pragma Source # 
Instance details

Methods

showsPrec :: Int -> Pragma -> ShowS

show :: Pragma -> String

showList :: [Pragma] -> ShowS

Show RHS Source # 
Instance details

Methods

showsPrec :: Int -> RHS -> ShowS

show :: RHS -> String

showList :: [RHS] -> ShowS

Show TypedBinding Source # 
Instance details

Methods

showsPrec :: Int -> TypedBinding -> ShowS

show :: TypedBinding -> String

showList :: [TypedBinding] -> ShowS

Show WhereClause Source # 
Instance details

Methods

showsPrec :: Int -> WhereClause -> ShowS

show :: WhereClause -> String

showList :: [WhereClause] -> ShowS

Pretty a => Pretty (Arg a) Source # 
Instance details

Methods

pretty :: Arg a -> Doc Source #

prettyPrec :: Int -> Arg a -> Doc Source #

prettyList :: [Arg a] -> Doc Source #

Pretty a => Pretty (MaybePlaceholder a) Source # 
Instance details

Pretty e => Pretty (Named_ e) Source # 
Instance details

Methods

pretty :: Named_ e -> Doc Source #

prettyPrec :: Int -> Named_ e -> Doc Source #

prettyList :: [Named_ e] -> Doc Source #

Pretty a => Pretty (WithHiding a) Source # 
Instance details

Pretty a => Pretty (Binder' a) Source # 
Instance details

Methods

pretty :: Binder' a -> Doc Source #

prettyPrec :: Int -> Binder' a -> Doc Source #

prettyList :: [Binder' a] -> Doc Source #

Pretty a => Pretty (FieldAssignment' a) Source # 
Instance details

Pretty (OpApp Expr) Source # 
Instance details

Pretty (ThingWithFixity Name) Source # 
Instance details

Show a => Show (Binder' a) Source # 
Instance details

Methods

showsPrec :: Int -> Binder' a -> ShowS

show :: Binder' a -> String

showList :: [Binder' a] -> ShowS

Show a => Show (OpApp a) Source # 
Instance details

Methods

showsPrec :: Int -> OpApp a -> ShowS

show :: OpApp a -> String

showList :: [OpApp a] -> ShowS

(Pretty a, Pretty b) => Pretty (ImportDirective' a b) Source # 
Instance details

(Pretty a, Pretty b) => Pretty (ImportedName' a b) Source # 
Instance details

(Pretty a, Pretty b) => Pretty (Renaming' a b) Source # 
Instance details

Methods

pretty :: Renaming' a b -> Doc Source #

prettyPrec :: Int -> Renaming' a b -> Doc Source #

prettyList :: [Renaming' a b] -> Doc Source #

(Pretty a, Pretty b) => Pretty (Using' a b) Source # 
Instance details

Methods

pretty :: Using' a b -> Doc Source #

prettyPrec :: Int -> Using' a b -> Doc Source #

prettyList :: [Using' a b] -> Doc Source #

(Pretty a, Pretty b) => Pretty (Either a b) Source # 
Instance details

Methods

pretty :: Either a b -> Doc Source #

prettyPrec :: Int -> Either a b -> Doc Source #

prettyList :: [Either a b] -> Doc Source #

(Pretty a, Pretty b) => Pretty (a, b) Source # 
Instance details

Methods

pretty :: (a, b) -> Doc Source #

prettyPrec :: Int -> (a, b) -> Doc Source #

prettyList :: [(a, b)] -> Doc Source #

(Show a, Show b) => Show (ImportDirective' a b) Source # 
Instance details

Methods

showsPrec :: Int -> ImportDirective' a b -> ShowS

show :: ImportDirective' a b -> String

showList :: [ImportDirective' a b] -> ShowS

(Show a, Show b) => Show (Renaming' a b) Source # 
Instance details

Methods

showsPrec :: Int -> Renaming' a b -> ShowS

show :: Renaming' a b -> String

showList :: [Renaming' a b] -> ShowS

(Show a, Show b) => Show (Using' a b) Source # 
Instance details

Methods

showsPrec :: Int -> Using' a b -> ShowS

show :: Using' a b -> String

showList :: [Using' a b] -> ShowS