Safe Haskell | None |
---|
Text.PrettyPrint.MPPPC.OneDim
Documentation
encloseSep :: Printable s t => Pretty s t -> Pretty s t -> Pretty s t -> [Pretty s t] -> Pretty s tSource
semiBraces :: Printable s t => [Pretty s t] -> Pretty s tSource
dullYellow :: Pretty s t -> Pretty s tSource
dullMagenta :: Pretty s t -> Pretty s tSource
onDullBlack :: Pretty s t -> Pretty s tSource
onDullGreen :: Pretty s t -> Pretty s tSource
onDullYellow :: Pretty s t -> Pretty s tSource
onDullBlue :: Pretty s t -> Pretty s tSource
onDullMagenta :: Pretty s t -> Pretty s tSource
onDullCyan :: Pretty s t -> Pretty s tSource
onDullWhite :: Pretty s t -> Pretty s tSource
deUnderline :: Pretty s t -> Pretty s tSource
quotesDouble :: Printable s t => Pretty s t -> Pretty s tSource
quotesSingle :: Printable s t => Pretty s t -> Pretty s tSource
angleRight :: Printable s t => Pretty s tSource
braceRight :: Printable s t => Pretty s tSource
bracketLeft :: Printable s t => Pretty s tSource
bracketRight :: Printable s t => Pretty s tSource
parenRight :: Printable s t => Pretty s tSource
quoteDouble :: Printable s t => Pretty s tSource
quoteSingle :: Printable s t => Pretty s tSource
hPutSimplePretty :: forall s t. Printable s t => Handle -> SimplePretty s t -> IO ()Source
data FormatState Source
Constructors
FormatState | |
Fields |
Constructors
Empty | |
Printable s t => Char t | |
Printable s t => Text !Int s | |
Line Bool | |
Cat (Pretty s t) (Pretty s t) | |
Nest Int (Pretty s t) | |
Union (Pretty s t) (Pretty s t) | |
Column (Int -> Pretty s t) | |
Nesting (Int -> Pretty s t) | |
Color ConsoleLayer ColorIntensity Color (Pretty s t) | |
Intensify ConsoleIntensity (Pretty s t) | |
Underline Underlining (Pretty s t) | |
RestoreFormat FormatState |
data SimplePretty s t Source
Constructors
SimpleEmpty | |
Printable s t => SimpleChar t (SimplePretty s t) | |
Printable s t => SimpleText Int s (SimplePretty s t) | |
SimpleLine Int (SimplePretty s t) | |
SimpleSGR [SGR] (SimplePretty s t) |
renderPretty :: Float -> Int -> Pretty s t -> SimplePretty s tSource
renderCompact :: Pretty s t -> SimplePretty s tSource
renderSimplePretty :: forall s t. Printable s t => SimplePretty s t -> sSource
Instances
Eq s => Eq (Seq s t) | |
(Eq (Seq s t), Ord s) => Ord (Seq s t) | |
Show s => Show (Seq s t) | |
IsString (Seq String Char) | |
IsString (Seq Text Char) | |
IsString (Pretty (Seq String Char) (Tok String Char)) | |
IsString (Pretty (Seq Text Char) (Tok Text Char)) | |
Printable (Seq String Char) (Tok String Char) | |
Printable (Seq Text Char) (Tok Text Char) |
class (Eq s, Eq t, IsString s) => Printable s t | s -> t, t -> s whereSource
Methods
chunk :: Int -> s -> [s]Source
hPutTok :: Handle -> t -> IO ()Source
hPutSeq :: Handle -> s -> IO ()Source
replicate :: Int -> s -> sSource
splitAt :: Int -> s -> (s, s)Source
tokAngleLeft :: tSource
tokAngleRight :: tSource
tokBackslash :: tSource
tokBraceLeft :: tSource
tokBraceRight :: tSource
tokBracketLeft :: tSource
tokNewline :: tSource
tokParenLeft :: tSource
tokParenRight :: tSource
tokQuoteDouble :: tSource
tokQuoteSingle :: tSource