optparse-applicative-0.18.1.0: Utilities and combinators for parsing command line options
Safe HaskellSafe-Inferred
LanguageHaskell98

Options.Applicative.Help.Pretty

Synopsis

Documentation

class Pretty a where #

Minimal complete definition

pretty

Methods

pretty :: a -> Doc ann #

prettyList :: [a] -> Doc ann #

Instances

Instances details
Pretty Void 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Void -> Doc ann #

prettyList :: [Void] -> Doc ann #

Pretty Int16 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int16 -> Doc ann #

prettyList :: [Int16] -> Doc ann #

Pretty Int32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int32 -> Doc ann #

prettyList :: [Int32] -> Doc ann #

Pretty Int64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int64 -> Doc ann #

prettyList :: [Int64] -> Doc ann #

Pretty Int8 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int8 -> Doc ann #

prettyList :: [Int8] -> Doc ann #

Pretty Word16 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word16 -> Doc ann #

prettyList :: [Word16] -> Doc ann #

Pretty Word32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word32 -> Doc ann #

prettyList :: [Word32] -> Doc ann #

Pretty Word64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word64 -> Doc ann #

prettyList :: [Word64] -> Doc ann #

Pretty Word8 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word8 -> Doc ann #

prettyList :: [Word8] -> Doc ann #

Pretty Text 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Text -> Doc ann #

prettyList :: [Text] -> Doc ann #

Pretty Text 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Text -> Doc ann #

prettyList :: [Text] -> Doc ann #

Pretty Integer 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Integer -> Doc ann #

prettyList :: [Integer] -> Doc ann #

Pretty Natural 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Natural -> Doc ann #

prettyList :: [Natural] -> Doc ann #

Pretty () 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: () -> Doc ann #

prettyList :: [()] -> Doc ann #

Pretty Bool 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Bool -> Doc ann #

prettyList :: [Bool] -> Doc ann #

Pretty Char 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Char -> Doc ann #

prettyList :: [Char] -> Doc ann #

Pretty Double 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Double -> Doc ann #

prettyList :: [Double] -> Doc ann #

Pretty Float 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Float -> Doc ann #

prettyList :: [Float] -> Doc ann #

Pretty Int 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int -> Doc ann #

prettyList :: [Int] -> Doc ann #

Pretty Word 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word -> Doc ann #

prettyList :: [Word] -> Doc ann #

Pretty a => Pretty (Identity a) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Identity a -> Doc ann #

prettyList :: [Identity a] -> Doc ann #

Pretty a => Pretty (NonEmpty a) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: NonEmpty a -> Doc ann #

prettyList :: [NonEmpty a] -> Doc ann #

Pretty a => Pretty (Maybe a) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Maybe a -> Doc ann #

prettyList :: [Maybe a] -> Doc ann #

Pretty a => Pretty [a] 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: [a] -> Doc ann #

prettyList :: [[a]] -> Doc ann #

(Pretty a1, Pretty a2) => Pretty (a1, a2) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: (a1, a2) -> Doc ann #

prettyList :: [(a1, a2)] -> Doc ann #

Pretty a => Pretty (Const a b) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Const a b -> Doc ann #

prettyList :: [Const a b] -> Doc ann #

(Pretty a1, Pretty a2, Pretty a3) => Pretty (a1, a2, a3) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: (a1, a2, a3) -> Doc ann #

prettyList :: [(a1, a2, a3)] -> Doc ann #

group :: Doc ann -> Doc ann #

(<>) :: Semigroup a => a -> a -> a #

data SimpleDocStream ann #

Constructors

SFail 
SEmpty 
SChar !Char (SimpleDocStream ann) 
SText !Int !Text (SimpleDocStream ann) 
SLine !Int (SimpleDocStream ann) 
SAnnPush ann (SimpleDocStream ann) 
SAnnPop (SimpleDocStream ann) 

Instances

Instances details
Foldable SimpleDocStream 
Instance details

Defined in Prettyprinter.Internal

Methods

fold :: Monoid m => SimpleDocStream m -> m

foldMap :: Monoid m => (a -> m) -> SimpleDocStream a -> m

foldMap' :: Monoid m => (a -> m) -> SimpleDocStream a -> m

foldr :: (a -> b -> b) -> b -> SimpleDocStream a -> b

foldr' :: (a -> b -> b) -> b -> SimpleDocStream a -> b

foldl :: (b -> a -> b) -> b -> SimpleDocStream a -> b

foldl' :: (b -> a -> b) -> b -> SimpleDocStream a -> b

foldr1 :: (a -> a -> a) -> SimpleDocStream a -> a

foldl1 :: (a -> a -> a) -> SimpleDocStream a -> a

toList :: SimpleDocStream a -> [a]

null :: SimpleDocStream a -> Bool

length :: SimpleDocStream a -> Int

elem :: Eq a => a -> SimpleDocStream a -> Bool

maximum :: Ord a => SimpleDocStream a -> a

minimum :: Ord a => SimpleDocStream a -> a

sum :: Num a => SimpleDocStream a -> a

product :: Num a => SimpleDocStream a -> a

Traversable SimpleDocStream 
Instance details

Defined in Prettyprinter.Internal

Methods

traverse :: Applicative f => (a -> f b) -> SimpleDocStream a -> f (SimpleDocStream b)

sequenceA :: Applicative f => SimpleDocStream (f a) -> f (SimpleDocStream a)

mapM :: Monad m => (a -> m b) -> SimpleDocStream a -> m (SimpleDocStream b)

sequence :: Monad m => SimpleDocStream (m a) -> m (SimpleDocStream a)

Functor SimpleDocStream 
Instance details

Defined in Prettyprinter.Internal

Methods

fmap :: (a -> b) -> SimpleDocStream a -> SimpleDocStream b

(<$) :: a -> SimpleDocStream b -> SimpleDocStream a #

Generic (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Associated Types

type Rep (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

type Rep (SimpleDocStream ann) = D1 ('MetaData "SimpleDocStream" "Prettyprinter.Internal" "prettyprinter-1.7.1-JSgnz8iZuXV8MJvKW4vgQe" 'False) ((C1 ('MetaCons "SFail" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SEmpty" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SChar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Char) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SimpleDocStream ann))))) :+: ((C1 ('MetaCons "SText" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SimpleDocStream ann)))) :+: C1 ('MetaCons "SLine" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SimpleDocStream ann)))) :+: (C1 ('MetaCons "SAnnPush" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ann) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SimpleDocStream ann))) :+: C1 ('MetaCons "SAnnPop" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SimpleDocStream ann))))))

Methods

from :: SimpleDocStream ann -> Rep (SimpleDocStream ann) x

to :: Rep (SimpleDocStream ann) x -> SimpleDocStream ann

Show ann => Show (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Methods

showsPrec :: Int -> SimpleDocStream ann -> ShowS

show :: SimpleDocStream ann -> String

showList :: [SimpleDocStream ann] -> ShowS

Eq ann => Eq (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Methods

(==) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool

(/=) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool

Ord ann => Ord (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Methods

compare :: SimpleDocStream ann -> SimpleDocStream ann -> Ordering

(<) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool

(<=) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool

(>) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool

(>=) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool

max :: SimpleDocStream ann -> SimpleDocStream ann -> SimpleDocStream ann

min :: SimpleDocStream ann -> SimpleDocStream ann -> SimpleDocStream ann

type Rep (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

type Rep (SimpleDocStream ann) = D1 ('MetaData "SimpleDocStream" "Prettyprinter.Internal" "prettyprinter-1.7.1-JSgnz8iZuXV8MJvKW4vgQe" 'False) ((C1 ('MetaCons "SFail" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SEmpty" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SChar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Char) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SimpleDocStream ann))))) :+: ((C1 ('MetaCons "SText" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SimpleDocStream ann)))) :+: C1 ('MetaCons "SLine" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SimpleDocStream ann)))) :+: (C1 ('MetaCons "SAnnPush" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ann) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SimpleDocStream ann))) :+: C1 ('MetaCons "SAnnPop" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SimpleDocStream ann))))))

flatAlt :: Doc ann -> Doc ann -> Doc ann #

line :: Doc ann #

softline :: Doc ann #

nesting :: (Int -> Doc ann) -> Doc ann #

column :: (Int -> Doc ann) -> Doc ann #

nest :: Int -> Doc ann -> Doc ann #

(<+>) :: Doc ann -> Doc ann -> Doc ann #

align :: Doc ann -> Doc ann #

indent :: Int -> Doc ann -> Doc ann #

newtype LayoutOptions #

Constructors

LayoutOptions 

Instances

Instances details
Show LayoutOptions 
Instance details

Defined in Prettyprinter.Internal

Methods

showsPrec :: Int -> LayoutOptions -> ShowS

show :: LayoutOptions -> String

showList :: [LayoutOptions] -> ShowS

Eq LayoutOptions 
Instance details

Defined in Prettyprinter.Internal

Ord LayoutOptions 
Instance details

Defined in Prettyprinter.Internal

data PageWidth #

Constructors

AvailablePerLine !Int !Double 
Unbounded 

Instances

Instances details
Show PageWidth 
Instance details

Defined in Prettyprinter.Internal

Methods

showsPrec :: Int -> PageWidth -> ShowS

show :: PageWidth -> String

showList :: [PageWidth] -> ShowS

Eq PageWidth 
Instance details

Defined in Prettyprinter.Internal

Methods

(==) :: PageWidth -> PageWidth -> Bool

(/=) :: PageWidth -> PageWidth -> Bool

Ord PageWidth 
Instance details

Defined in Prettyprinter.Internal

Methods

compare :: PageWidth -> PageWidth -> Ordering

(<) :: PageWidth -> PageWidth -> Bool

(<=) :: PageWidth -> PageWidth -> Bool

(>) :: PageWidth -> PageWidth -> Bool

(>=) :: PageWidth -> PageWidth -> Bool

max :: PageWidth -> PageWidth -> PageWidth

min :: PageWidth -> PageWidth -> PageWidth

list :: [Doc ann] -> Doc ann #

data FusionDepth #

Constructors

Shallow 
Deep 

Instances

Instances details
Show FusionDepth 
Instance details

Defined in Prettyprinter.Internal

Methods

showsPrec :: Int -> FusionDepth -> ShowS

show :: FusionDepth -> String

showList :: [FusionDepth] -> ShowS

Eq FusionDepth 
Instance details

Defined in Prettyprinter.Internal

Methods

(==) :: FusionDepth -> FusionDepth -> Bool

(/=) :: FusionDepth -> FusionDepth -> Bool

Ord FusionDepth 
Instance details

Defined in Prettyprinter.Internal

alterAnnotations :: (ann -> [ann']) -> Doc ann -> Doc ann' #

alterAnnotationsS :: (ann -> Maybe ann') -> SimpleDocStream ann -> SimpleDocStream ann' #

annotate :: ann -> Doc ann -> Doc ann #

cat :: [Doc ann] -> Doc ann #

concatWith :: Foldable t => (Doc ann -> Doc ann -> Doc ann) -> t (Doc ann) -> Doc ann #

emptyDoc :: Doc ann #

enclose :: Doc ann -> Doc ann -> Doc ann -> Doc ann #

encloseSep :: Doc ann -> Doc ann -> Doc ann -> [Doc ann] -> Doc ann #

fill :: Int -> Doc ann -> Doc ann #

fillBreak :: Int -> Doc ann -> Doc ann #

fillCat :: [Doc ann] -> Doc ann #

fillSep :: [Doc ann] -> Doc ann #

fuse :: FusionDepth -> Doc ann -> Doc ann #

hang :: Int -> Doc ann -> Doc ann #

hardline :: Doc ann #

hcat :: [Doc ann] -> Doc ann #

hsep :: [Doc ann] -> Doc ann #

layoutCompact :: Doc ann1 -> SimpleDocStream ann2 #

line' :: Doc ann #

pageWidth :: (PageWidth -> Doc ann) -> Doc ann #

plural :: (Num amount, Eq amount) => doc -> doc -> amount -> doc #

punctuate :: Doc ann -> [Doc ann] -> [Doc ann] #

reAnnotate :: (ann -> ann') -> Doc ann -> Doc ann' #

reAnnotateS :: (ann -> ann') -> SimpleDocStream ann -> SimpleDocStream ann' #

sep :: [Doc ann] -> Doc ann #

softline' :: Doc ann #

surround :: Doc ann -> Doc ann -> Doc ann -> Doc ann #

tupled :: [Doc ann] -> Doc ann #

unAnnotate :: Doc ann -> Doc xxx #

unsafeViaShow :: Show a => a -> Doc ann #

vcat :: [Doc ann] -> Doc ann #

viaShow :: Show a => a -> Doc ann #

vsep :: [Doc ann] -> Doc ann #

width :: Doc ann -> (Int -> Doc ann) -> Doc ann #

angles :: Doc ann -> Doc ann #

backslash :: Doc ann #

braces :: Doc ann -> Doc ann #

brackets :: Doc ann -> Doc ann #

colon :: Doc ann #

comma :: Doc ann #

dot :: Doc ann #

dquote :: Doc ann #

dquotes :: Doc ann -> Doc ann #

equals :: Doc ann #

langle :: Doc ann #

lbrace :: Doc ann #

lbracket :: Doc ann #

lparen :: Doc ann #

parens :: Doc ann -> Doc ann #

pipe :: Doc ann #

rangle :: Doc ann #

rbrace :: Doc ann #

rbracket :: Doc ann #

rparen :: Doc ann #

semi :: Doc ann #

slash :: Doc ann #

space :: Doc ann #

squote :: Doc ann #

squotes :: Doc ann -> Doc ann #

data AnsiStyle #

Instances

Instances details
Monoid AnsiStyle 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Semigroup AnsiStyle 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

(<>) :: AnsiStyle -> AnsiStyle -> AnsiStyle #

sconcat :: NonEmpty AnsiStyle -> AnsiStyle

stimes :: Integral b => b -> AnsiStyle -> AnsiStyle

Show AnsiStyle 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

showsPrec :: Int -> AnsiStyle -> ShowS

show :: AnsiStyle -> String

showList :: [AnsiStyle] -> ShowS

Eq AnsiStyle 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

(==) :: AnsiStyle -> AnsiStyle -> Bool

(/=) :: AnsiStyle -> AnsiStyle -> Bool

Ord AnsiStyle 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: AnsiStyle -> AnsiStyle -> Ordering

(<) :: AnsiStyle -> AnsiStyle -> Bool

(<=) :: AnsiStyle -> AnsiStyle -> Bool

(>) :: AnsiStyle -> AnsiStyle -> Bool

(>=) :: AnsiStyle -> AnsiStyle -> Bool

max :: AnsiStyle -> AnsiStyle -> AnsiStyle

min :: AnsiStyle -> AnsiStyle -> AnsiStyle

data Color #

Constructors

Black 
Red 
Green 
Yellow 
Blue 
Magenta 
Cyan 
White 

Instances

Instances details
Show Color 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

showsPrec :: Int -> Color -> ShowS

show :: Color -> String

showList :: [Color] -> ShowS

Eq Color 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

(==) :: Color -> Color -> Bool

(/=) :: Color -> Color -> Bool

Ord Color 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Color -> Color -> Ordering

(<) :: Color -> Color -> Bool

(<=) :: Color -> Color -> Bool

(>) :: Color -> Color -> Bool

(>=) :: Color -> Color -> Bool

max :: Color -> Color -> Color

min :: Color -> Color -> Color

data Bold #

Constructors

Bold 

Instances

Instances details
Show Bold 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

showsPrec :: Int -> Bold -> ShowS

show :: Bold -> String

showList :: [Bold] -> ShowS

Eq Bold 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

(==) :: Bold -> Bold -> Bool

(/=) :: Bold -> Bold -> Bool

Ord Bold 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Bold -> Bold -> Ordering

(<) :: Bold -> Bold -> Bool

(<=) :: Bold -> Bold -> Bool

(>) :: Bold -> Bold -> Bool

(>=) :: Bold -> Bold -> Bool

max :: Bold -> Bold -> Bold

min :: Bold -> Bold -> Bold

data Intensity #

Constructors

Vivid 
Dull 

Instances

Instances details
Show Intensity 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

showsPrec :: Int -> Intensity -> ShowS

show :: Intensity -> String

showList :: [Intensity] -> ShowS

Eq Intensity 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

(==) :: Intensity -> Intensity -> Bool

(/=) :: Intensity -> Intensity -> Bool

Ord Intensity 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Intensity -> Intensity -> Ordering

(<) :: Intensity -> Intensity -> Bool

(<=) :: Intensity -> Intensity -> Bool

(>) :: Intensity -> Intensity -> Bool

(>=) :: Intensity -> Intensity -> Bool

max :: Intensity -> Intensity -> Intensity

min :: Intensity -> Intensity -> Intensity

data Italicized #

Constructors

Italicized 

Instances

Instances details
Show Italicized 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

showsPrec :: Int -> Italicized -> ShowS

show :: Italicized -> String

showList :: [Italicized] -> ShowS

Eq Italicized 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

(==) :: Italicized -> Italicized -> Bool

(/=) :: Italicized -> Italicized -> Bool

Ord Italicized 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

data Underlined #

Constructors

Underlined 

Instances

Instances details
Show Underlined 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

showsPrec :: Int -> Underlined -> ShowS

show :: Underlined -> String

showList :: [Underlined] -> ShowS

Eq Underlined 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

(==) :: Underlined -> Underlined -> Bool

(/=) :: Underlined -> Underlined -> Bool

Ord Underlined 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

hPutDoc :: Handle -> Doc AnsiStyle -> IO () #

putDoc :: Doc AnsiStyle -> IO () #

renderIO :: Handle -> SimpleDocStream AnsiStyle -> IO () #

type Doc = Doc AnsiStyle Source #

(.$.) :: Doc -> Doc -> Doc Source #

(</>) :: Doc -> Doc -> Doc Source #

groupOrNestLine :: Doc -> Doc Source #

Render flattened text on this line, or start a new line before rendering any text.

This will also nest subsequent lines in the group.

altSep :: Doc -> Doc -> Doc Source #

Separate items in an alternative with a pipe.

If the first document and the pipe don't fit on the line, then mandatorily flow the next entry onto the following line.

The (//) softbreak ensures that if the document does fit on the line, there is at least a space, but it's possible for y to still appear on the next line.

hangAtIfOver :: Int -> Int -> Doc -> Doc Source #

Printer hacks to get nice indentation for long commands and subcommands.

If we're starting this section over the desired width   (usually 1/3 of the ribbon), then we will make a line break, indent all of the usage, and go.

The ifAtRoot is an interesting clause. If this whole operation is put under a group then the linebreak will disappear; then item d will therefore not be at the starting column, and it won't be indented more.

prettyString :: Double -> Int -> Doc -> String Source #