agda-language-server-0.2.2.6.2: An implementation of language server protocal (LSP) for Agda 2.
Safe HaskellSafe-Inferred
LanguageHaskell2010

Render.RichText

Synopsis

Documentation

data Block Source #

Block elements

Constructors

Labeled Inlines (Maybe String) (Maybe Range) String String 
Unlabeled Inlines (Maybe String) (Maybe Range) 
Header String 

Instances

Instances details
Generic Block Source # 
Instance details

Defined in Render.RichText

Associated Types

type Rep Block :: Type -> Type

Methods

from :: Block -> Rep Block x

to :: Rep Block x -> Block

ToJSON Block Source # 
Instance details

Defined in Render.RichText

Methods

toJSON :: Block -> Value

toEncoding :: Block -> Encoding

toJSONList :: [Block] -> Value

toEncodingList :: [Block] -> Encoding

type Rep Block Source # 
Instance details

Defined in Render.RichText

type Rep Block = D1 ('MetaData "Block" "Render.RichText" "agda-language-server-0.2.2.6.2-inplace" 'False) (C1 ('MetaCons "Labeled" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Inlines) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Range)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))) :+: (C1 ('MetaCons "Unlabeled" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Inlines) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Range)))) :+: C1 ('MetaCons "Header" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))))

newtype Inlines Source #

Constructors

Inlines 

Fields

Instances

Instances details
IsString Inlines Source # 
Instance details

Defined in Render.RichText

Methods

fromString :: String -> Inlines

Monoid Inlines Source # 
Instance details

Defined in Render.RichText

Semigroup Inlines Source # 
Instance details

Defined in Render.RichText

Methods

(<>) :: Inlines -> Inlines -> Inlines

sconcat :: NonEmpty Inlines -> Inlines

stimes :: Integral b => b -> Inlines -> Inlines

Show Inlines Source # 
Instance details

Defined in Render.RichText

Methods

showsPrec :: Int -> Inlines -> ShowS

show :: Inlines -> String

showList :: [Inlines] -> ShowS

ToJSON Inlines Source # 
Instance details

Defined in Render.RichText

Methods

toJSON :: Inlines -> Value

toEncoding :: Inlines -> Encoding

toJSONList :: [Inlines] -> Value

toEncodingList :: [Inlines] -> Encoding

space :: Inlines Source #

Whitespace

text :: String -> Inlines Source #

text' :: ClassNames -> String -> Inlines Source #

icon :: String -> Inlines Source #

(<+>) :: Inlines -> Inlines -> Inlines infixr 6 Source #

punctuate :: Inlines -> [Inlines] -> [Inlines] Source #

Utilities / Combinators

braces :: Inlines -> Inlines Source #

Single braces

braces' :: Inlines -> Inlines Source #

From braces'

dbraces :: Inlines -> Inlines Source #

Double braces

mparens :: Bool -> Inlines -> Inlines Source #

Apply parens to Doc if boolean is true.

hcat :: [Inlines] -> Inlines Source #

Just pure concatenation, no grouping or whatsoever

sep :: [Inlines] -> Inlines Source #

Horizontal listing

vcat :: [Inlines] -> Inlines Source #

Vertical listing

showIndex :: (Show i, Integral i) => i -> String Source #

Shows a non-negative integer using the characters ₀-₉ instead of 0-9 unless the user explicitly asked us to not use any unicode characters.

Orphan instances

ToJSON Range Source #

ToJSON instances for A.types

Instance details

Methods

toJSON :: Range -> Value

toEncoding :: Range -> Encoding

toJSONList :: [Range] -> Value

toEncodingList :: [Range] -> Encoding

ToJSON SrcFile Source # 
Instance details

Methods

toJSON :: SrcFile -> Value

toEncoding :: SrcFile -> Encoding

toJSONList :: [SrcFile] -> Value

toEncodingList :: [SrcFile] -> Encoding

ToJSON AbsolutePath Source # 
Instance details

Methods

toJSON :: AbsolutePath -> Value

toEncoding :: AbsolutePath -> Encoding

toJSONList :: [AbsolutePath] -> Value

toEncodingList :: [AbsolutePath] -> Encoding

ToJSON (Interval' ()) Source # 
Instance details

Methods

toJSON :: Interval' () -> Value

toEncoding :: Interval' () -> Encoding

toJSONList :: [Interval' ()] -> Value

toEncodingList :: [Interval' ()] -> Encoding

ToJSON (Position' ()) Source # 
Instance details

Methods

toJSON :: Position' () -> Value

toEncoding :: Position' () -> Encoding

toJSONList :: [Position' ()] -> Value

toEncodingList :: [Position' ()] -> Encoding