pandoc-3.2: Conversion between markup formats
CopyrightCopyright (C) 2006-2024 John MacFarlane
LicenseGNU GPL, version 2 or above
MaintainerJohn MacFarlane <jgm@berkeley.edu>
Stabilityalpha
Portabilityportable
Safe HaskellNone
LanguageHaskell2010

Text.Pandoc

Description

This helper module exports the main writers, readers, and data structure definitions from the Pandoc libraries.

A typical application will chain together a reader and a writer to convert strings from one format to another. For example, the following simple program will act as a filter converting markdown fragments to reStructuredText, using reference-style links instead of inline links:

module Main where
import Text.Pandoc
import Data.Text (Text)
import qualified Data.Text.IO as T

mdToRST :: Text -> IO Text
mdToRST txt = runIOorExplode $
  readMarkdown def txt
  >>= writeRST def{ writerReferenceLinks = True }

main :: IO ()
main = do
  T.getContents >>= mdToRST >>= T.putStrLn
Synopsis

Definitions

type Attr = (Text, [Text], [(Text, Text)]) #

data Pandoc #

Constructors

Pandoc Meta [Block] 

Instances

Instances details
FromJSON Pandoc 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser Pandoc

parseJSONList :: Value -> Parser [Pandoc]

omittedField :: Maybe Pandoc

ToJSON Pandoc 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: Pandoc -> Value

toEncoding :: Pandoc -> Encoding

toJSONList :: [Pandoc] -> Value

toEncodingList :: [Pandoc] -> Encoding

omitField :: Pandoc -> Bool

Data Pandoc 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Pandoc -> c Pandoc

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Pandoc

toConstr :: Pandoc -> Constr

dataTypeOf :: Pandoc -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Pandoc)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Pandoc)

gmapT :: (forall b. Data b => b -> b) -> Pandoc -> Pandoc

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Pandoc -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Pandoc -> r

gmapQ :: (forall d. Data d => d -> u) -> Pandoc -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Pandoc -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Pandoc -> m Pandoc

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Pandoc -> m Pandoc

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Pandoc -> m Pandoc

Monoid Pandoc 
Instance details

Defined in Text.Pandoc.Definition

Semigroup Pandoc 
Instance details

Defined in Text.Pandoc.Definition

Methods

(<>) :: Pandoc -> Pandoc -> Pandoc

sconcat :: NonEmpty Pandoc -> Pandoc

stimes :: Integral b => b -> Pandoc -> Pandoc

Generic Pandoc 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep Pandoc 
Instance details

Defined in Text.Pandoc.Definition

type Rep Pandoc = D1 ('MetaData "Pandoc" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "Pandoc" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Meta) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Block])))

Methods

from :: Pandoc -> Rep Pandoc x

to :: Rep Pandoc x -> Pandoc

Read Pandoc 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS Pandoc

readList :: ReadS [Pandoc]

readPrec :: ReadPrec Pandoc

readListPrec :: ReadPrec [Pandoc]

Show Pandoc 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> Pandoc -> ShowS

show :: Pandoc -> String

showList :: [Pandoc] -> ShowS

NFData Pandoc 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: Pandoc -> ()

Eq Pandoc 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: Pandoc -> Pandoc -> Bool

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

Ord Pandoc 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: Pandoc -> Pandoc -> Ordering

(<) :: Pandoc -> Pandoc -> Bool

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

(>) :: Pandoc -> Pandoc -> Bool

(>=) :: Pandoc -> Pandoc -> Bool

max :: Pandoc -> Pandoc -> Pandoc

min :: Pandoc -> Pandoc -> Pandoc

HasMeta Pandoc 
Instance details

Defined in Text.Pandoc.Builder

Methods

setMeta :: ToMetaValue b => Text -> b -> Pandoc -> Pandoc

deleteMeta :: Text -> Pandoc -> Pandoc

Walkable Block Pandoc 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> Pandoc -> Pandoc

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> Pandoc -> m Pandoc

query :: Monoid c => (Block -> c) -> Pandoc -> c

Walkable Inline Pandoc 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> Pandoc -> Pandoc

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> Pandoc -> m Pandoc

query :: Monoid c => (Inline -> c) -> Pandoc -> c

Walkable Meta Pandoc 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Meta -> Meta) -> Pandoc -> Pandoc

walkM :: (Monad m, Applicative m, Functor m) => (Meta -> m Meta) -> Pandoc -> m Pandoc

query :: Monoid c => (Meta -> c) -> Pandoc -> c

Walkable MetaValue Pandoc 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (MetaValue -> MetaValue) -> Pandoc -> Pandoc

walkM :: (Monad m, Applicative m, Functor m) => (MetaValue -> m MetaValue) -> Pandoc -> m Pandoc

query :: Monoid c => (MetaValue -> c) -> Pandoc -> c

Walkable Pandoc Pandoc 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Pandoc -> Pandoc) -> Pandoc -> Pandoc

walkM :: (Monad m, Applicative m, Functor m) => (Pandoc -> m Pandoc) -> Pandoc -> m Pandoc

query :: Monoid c => (Pandoc -> c) -> Pandoc -> c

Walkable [Block] Pandoc 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> Pandoc -> Pandoc

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> Pandoc -> m Pandoc

query :: Monoid c => ([Block] -> c) -> Pandoc -> c

Walkable [Inline] Pandoc 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> Pandoc -> Pandoc

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> Pandoc -> m Pandoc

query :: Monoid c => ([Inline] -> c) -> Pandoc -> c

type Rep Pandoc 
Instance details

Defined in Text.Pandoc.Definition

type Rep Pandoc = D1 ('MetaData "Pandoc" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "Pandoc" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Meta) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Block])))

data Inline #

Instances

Instances details
FromJSON Inline 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser Inline

parseJSONList :: Value -> Parser [Inline]

omittedField :: Maybe Inline

ToJSON Inline 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: Inline -> Value

toEncoding :: Inline -> Encoding

toJSONList :: [Inline] -> Value

toEncodingList :: [Inline] -> Encoding

omitField :: Inline -> Bool

Data Inline 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Inline -> c Inline

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Inline

toConstr :: Inline -> Constr

dataTypeOf :: Inline -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Inline)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Inline)

gmapT :: (forall b. Data b => b -> b) -> Inline -> Inline

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Inline -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Inline -> r

gmapQ :: (forall d. Data d => d -> u) -> Inline -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Inline -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Inline -> m Inline

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Inline -> m Inline

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Inline -> m Inline

IsString Inlines 
Instance details

Defined in Text.Pandoc.Builder

Methods

fromString :: String -> Inlines

Monoid Inlines 
Instance details

Defined in Text.Pandoc.Builder

Methods

mempty :: Inlines

mappend :: Inlines -> Inlines -> Inlines

mconcat :: [Inlines] -> Inlines

Semigroup Inlines 
Instance details

Defined in Text.Pandoc.Builder

Methods

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

sconcat :: NonEmpty Inlines -> Inlines

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

Generic Inline 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep Inline 
Instance details

Defined in Text.Pandoc.Definition

type Rep Inline = D1 ('MetaData "Inline" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) ((((C1 ('MetaCons "Str" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "Emph" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline]))) :+: (C1 ('MetaCons "Underline" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])) :+: (C1 ('MetaCons "Strong" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])) :+: C1 ('MetaCons "Strikeout" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline]))))) :+: ((C1 ('MetaCons "Superscript" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])) :+: C1 ('MetaCons "Subscript" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline]))) :+: (C1 ('MetaCons "SmallCaps" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])) :+: (C1 ('MetaCons "Quoted" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 QuoteType) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])) :+: C1 ('MetaCons "Cite" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Citation]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])))))) :+: (((C1 ('MetaCons "Code" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "Space" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "SoftBreak" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "LineBreak" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Math" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 MathType) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text))))) :+: ((C1 ('MetaCons "RawInline" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Format) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "Link" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Target)))) :+: (C1 ('MetaCons "Image" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Target))) :+: (C1 ('MetaCons "Note" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Block])) :+: C1 ('MetaCons "Span" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])))))))

Methods

from :: Inline -> Rep Inline x

to :: Rep Inline x -> Inline

Read Inline 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS Inline

readList :: ReadS [Inline]

readPrec :: ReadPrec Inline

readListPrec :: ReadPrec [Inline]

Show Inline 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> Inline -> ShowS

show :: Inline -> String

showList :: [Inline] -> ShowS

NFData Inline 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: Inline -> ()

Eq Inline 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: Inline -> Inline -> Bool

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

Ord Inline 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: Inline -> Inline -> Ordering

(<) :: Inline -> Inline -> Bool

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

(>) :: Inline -> Inline -> Bool

(>=) :: Inline -> Inline -> Bool

max :: Inline -> Inline -> Inline

min :: Inline -> Inline -> Inline

ToMetaValue Inlines 
Instance details

Defined in Text.Pandoc.Builder

Methods

toMetaValue :: Inlines -> MetaValue

Walkable Block Inline 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> Inline -> Inline

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> Inline -> m Inline

query :: Monoid c => (Block -> c) -> Inline -> c

Walkable Inline Chunk 
Instance details

Defined in Text.Pandoc.Chunks

Methods

walk :: (Inline -> Inline) -> Chunk -> Chunk

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> Chunk -> m Chunk

query :: Monoid c => (Inline -> c) -> Chunk -> c

Walkable Inline ChunkedDoc 
Instance details

Defined in Text.Pandoc.Chunks

Methods

walk :: (Inline -> Inline) -> ChunkedDoc -> ChunkedDoc

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> ChunkedDoc -> m ChunkedDoc

query :: Monoid c => (Inline -> c) -> ChunkedDoc -> c

Walkable Inline SecInfo 
Instance details

Defined in Text.Pandoc.Chunks

Methods

walk :: (Inline -> Inline) -> SecInfo -> SecInfo

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> SecInfo -> m SecInfo

query :: Monoid c => (Inline -> c) -> SecInfo -> c

Walkable Inline Block 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> Block -> Block

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> Block -> m Block

query :: Monoid c => (Inline -> c) -> Block -> c

Walkable Inline Caption 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> Caption -> Caption

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> Caption -> m Caption

query :: Monoid c => (Inline -> c) -> Caption -> c

Walkable Inline Cell 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> Cell -> Cell

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> Cell -> m Cell

query :: Monoid c => (Inline -> c) -> Cell -> c

Walkable Inline Citation 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> Citation -> Citation

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> Citation -> m Citation

query :: Monoid c => (Inline -> c) -> Citation -> c

Walkable Inline Inline 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> Inline -> Inline

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> Inline -> m Inline

query :: Monoid c => (Inline -> c) -> Inline -> c

Walkable Inline Meta 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> Meta -> Meta

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> Meta -> m Meta

query :: Monoid c => (Inline -> c) -> Meta -> c

Walkable Inline MetaValue 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> MetaValue -> MetaValue

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> MetaValue -> m MetaValue

query :: Monoid c => (Inline -> c) -> MetaValue -> c

Walkable Inline Pandoc 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> Pandoc -> Pandoc

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> Pandoc -> m Pandoc

query :: Monoid c => (Inline -> c) -> Pandoc -> c

Walkable Inline Row 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> Row -> Row

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> Row -> m Row

query :: Monoid c => (Inline -> c) -> Row -> c

Walkable Inline TableBody 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> TableBody -> TableBody

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> TableBody -> m TableBody

query :: Monoid c => (Inline -> c) -> TableBody -> c

Walkable Inline TableFoot 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> TableFoot -> TableFoot

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> TableFoot -> m TableFoot

query :: Monoid c => (Inline -> c) -> TableFoot -> c

Walkable Inline TableHead 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> TableHead -> TableHead

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> TableHead -> m TableHead

query :: Monoid c => (Inline -> c) -> TableHead -> c

Walkable [Block] Inline 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> Inline -> Inline

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> Inline -> m Inline

query :: Monoid c => ([Block] -> c) -> Inline -> c

Walkable [Inline] Block 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> Block -> Block

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> Block -> m Block

query :: Monoid c => ([Inline] -> c) -> Block -> c

Walkable [Inline] Caption 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> Caption -> Caption

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> Caption -> m Caption

query :: Monoid c => ([Inline] -> c) -> Caption -> c

Walkable [Inline] Cell 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> Cell -> Cell

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> Cell -> m Cell

query :: Monoid c => ([Inline] -> c) -> Cell -> c

Walkable [Inline] Citation 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> Citation -> Citation

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> Citation -> m Citation

query :: Monoid c => ([Inline] -> c) -> Citation -> c

Walkable [Inline] Inline 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> Inline -> Inline

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> Inline -> m Inline

query :: Monoid c => ([Inline] -> c) -> Inline -> c

Walkable [Inline] Meta 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> Meta -> Meta

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> Meta -> m Meta

query :: Monoid c => ([Inline] -> c) -> Meta -> c

Walkable [Inline] MetaValue 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> MetaValue -> MetaValue

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> MetaValue -> m MetaValue

query :: Monoid c => ([Inline] -> c) -> MetaValue -> c

Walkable [Inline] Pandoc 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> Pandoc -> Pandoc

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> Pandoc -> m Pandoc

query :: Monoid c => ([Inline] -> c) -> Pandoc -> c

Walkable [Inline] Row 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> Row -> Row

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> Row -> m Row

query :: Monoid c => ([Inline] -> c) -> Row -> c

Walkable [Inline] TableBody 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> TableBody -> TableBody

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> TableBody -> m TableBody

query :: Monoid c => ([Inline] -> c) -> TableBody -> c

Walkable [Inline] TableFoot 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> TableFoot -> TableFoot

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> TableFoot -> m TableFoot

query :: Monoid c => ([Inline] -> c) -> TableFoot -> c

Walkable [Inline] TableHead 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> TableHead -> TableHead

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> TableHead -> m TableHead

query :: Monoid c => ([Inline] -> c) -> TableHead -> c

Walkable [Inline] [Inline] 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> [Inline] -> [Inline]

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> [Inline] -> m [Inline]

query :: Monoid c => ([Inline] -> c) -> [Inline] -> c

HasAttributes (Cm a Inlines) 
Instance details

Defined in Commonmark.Pandoc

Methods

addAttributes :: Attributes -> Cm a Inlines -> Cm a Inlines

Rangeable (Cm b Inlines) => IsInline (Cm b Inlines) 
Instance details

Defined in Commonmark.Pandoc

Methods

lineBreak :: Cm b Inlines

softBreak :: Cm b Inlines

str :: Text -> Cm b Inlines

entity :: Text -> Cm b Inlines

escapedChar :: Char -> Cm b Inlines

emph :: Cm b Inlines -> Cm b Inlines

strong :: Cm b Inlines -> Cm b Inlines

link :: Text -> Text -> Cm b Inlines -> Cm b Inlines

image :: Text -> Text -> Cm b Inlines -> Cm b Inlines

code :: Text -> Cm b Inlines

rawInline :: Format -> Text -> Cm b Inlines

Rangeable (Cm SourceRange Inlines) 
Instance details

Defined in Commonmark.Pandoc

Methods

ranged :: SourceRange -> Cm SourceRange Inlines -> Cm SourceRange Inlines

Rangeable (Cm () Inlines) 
Instance details

Defined in Commonmark.Pandoc

Methods

ranged :: SourceRange -> Cm () Inlines -> Cm () Inlines

Rangeable (Cm a Inlines) => HasSpan (Cm a Inlines) 
Instance details

Defined in Commonmark.Pandoc

Methods

spanWith :: Attributes -> Cm a Inlines -> Cm a Inlines

HasEmoji (Cm b Inlines) 
Instance details

Defined in Commonmark.Pandoc

Methods

emoji :: Text -> Text -> Cm b Inlines

HasMath (Cm b Inlines) 
Instance details

Defined in Commonmark.Pandoc

Methods

inlineMath :: Text -> Cm b Inlines

displayMath :: Text -> Cm b Inlines

Rangeable (Cm b Inlines) => HasQuoted (Cm b Inlines) 
Instance details

Defined in Commonmark.Pandoc

Methods

singleQuoted :: Cm b Inlines -> Cm b Inlines

doubleQuoted :: Cm b Inlines -> Cm b Inlines

HasStrikethrough (Cm a Inlines) 
Instance details

Defined in Commonmark.Pandoc

Methods

strikethrough :: Cm a Inlines -> Cm a Inlines

HasSubscript (Cm a Inlines) 
Instance details

Defined in Commonmark.Pandoc

Methods

subscript :: Cm a Inlines -> Cm a Inlines

HasSuperscript (Cm a Inlines) 
Instance details

Defined in Commonmark.Pandoc

Methods

superscript :: Cm a Inlines -> Cm a Inlines

HasWikilinks (Cm b Inlines) 
Instance details

Defined in Commonmark.Pandoc

Methods

wikilink :: Text -> Cm b Inlines -> Cm b Inlines

(Rangeable (Cm a Inlines), Rangeable (Cm a Blocks)) => IsBlock (Cm a Inlines) (Cm a Blocks) 
Instance details

Defined in Commonmark.Pandoc

Methods

paragraph :: Cm a Inlines -> Cm a Blocks

plain :: Cm a Inlines -> Cm a Blocks

thematicBreak :: Cm a Blocks

blockQuote :: Cm a Blocks -> Cm a Blocks

codeBlock :: Text -> Text -> Cm a Blocks

heading :: Int -> Cm a Inlines -> Cm a Blocks

rawBlock :: Format -> Text -> Cm a Blocks

referenceLinkDefinition :: Text -> (Text, Text) -> Cm a Blocks

list :: ListType -> ListSpacing -> [Cm a Blocks] -> Cm a Blocks

(Rangeable (Cm a Inlines), Rangeable (Cm a Blocks)) => HasAlerts (Cm a Inlines) (Cm a Blocks) 
Instance details

Defined in Commonmark.Pandoc

Methods

alert :: AlertType -> Cm a Blocks -> Cm a Blocks

(Rangeable (Cm a Inlines), Rangeable (Cm a Blocks)) => HasDefinitionList (Cm a Inlines) (Cm a Blocks) 
Instance details

Defined in Commonmark.Pandoc

Methods

definitionList :: ListSpacing -> [(Cm a Inlines, [Cm a Blocks])] -> Cm a Blocks

(Rangeable (Cm a Inlines), Rangeable (Cm a Blocks)) => HasFootnote (Cm a Inlines) (Cm a Blocks) 
Instance details

Defined in Commonmark.Pandoc

Methods

footnote :: Int -> Text -> Cm a Blocks -> Cm a Blocks

footnoteList :: [Cm a Blocks] -> Cm a Blocks

footnoteRef :: Text -> Text -> Cm a Blocks -> Cm a Inlines

HasPipeTable (Cm a Inlines) (Cm a Blocks) 
Instance details

Defined in Commonmark.Pandoc

Methods

pipeTable :: [ColAlignment] -> [Cm a Inlines] -> [[Cm a Inlines]] -> Cm a Blocks

(Rangeable (Cm a Inlines), Rangeable (Cm a Blocks)) => HasTaskList (Cm a Inlines) (Cm a Blocks) 
Instance details

Defined in Commonmark.Pandoc

Methods

taskList :: ListType -> ListSpacing -> [(Bool, Cm a Blocks)] -> Cm a Blocks

type Rep Inline 
Instance details

Defined in Text.Pandoc.Definition

type Rep Inline = D1 ('MetaData "Inline" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) ((((C1 ('MetaCons "Str" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "Emph" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline]))) :+: (C1 ('MetaCons "Underline" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])) :+: (C1 ('MetaCons "Strong" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])) :+: C1 ('MetaCons "Strikeout" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline]))))) :+: ((C1 ('MetaCons "Superscript" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])) :+: C1 ('MetaCons "Subscript" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline]))) :+: (C1 ('MetaCons "SmallCaps" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])) :+: (C1 ('MetaCons "Quoted" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 QuoteType) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])) :+: C1 ('MetaCons "Cite" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Citation]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])))))) :+: (((C1 ('MetaCons "Code" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "Space" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "SoftBreak" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "LineBreak" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Math" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 MathType) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text))))) :+: ((C1 ('MetaCons "RawInline" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Format) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "Link" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Target)))) :+: (C1 ('MetaCons "Image" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Target))) :+: (C1 ('MetaCons "Note" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Block])) :+: C1 ('MetaCons "Span" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])))))))

newtype Format #

Constructors

Format Text 

Instances

Instances details
FromJSON Format 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser Format

parseJSONList :: Value -> Parser [Format]

omittedField :: Maybe Format

ToJSON Format 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: Format -> Value

toEncoding :: Format -> Encoding

toJSONList :: [Format] -> Value

toEncodingList :: [Format] -> Encoding

omitField :: Format -> Bool

Data Format 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Format -> c Format

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Format

toConstr :: Format -> Constr

dataTypeOf :: Format -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Format)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Format)

gmapT :: (forall b. Data b => b -> b) -> Format -> Format

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Format -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Format -> r

gmapQ :: (forall d. Data d => d -> u) -> Format -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Format -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Format -> m Format

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Format -> m Format

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Format -> m Format

IsString Format 
Instance details

Defined in Text.Pandoc.Definition

Methods

fromString :: String -> Format

Generic Format 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep Format 
Instance details

Defined in Text.Pandoc.Definition

type Rep Format = D1 ('MetaData "Format" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'True) (C1 ('MetaCons "Format" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

Methods

from :: Format -> Rep Format x

to :: Rep Format x -> Format

Read Format 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS Format

readList :: ReadS [Format]

readPrec :: ReadPrec Format

readListPrec :: ReadPrec [Format]

Show Format 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> Format -> ShowS

show :: Format -> String

showList :: [Format] -> ShowS

NFData Format 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: Format -> ()

Eq Format 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: Format -> Format -> Bool

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

Ord Format 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: Format -> Format -> Ordering

(<) :: Format -> Format -> Bool

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

(>) :: Format -> Format -> Bool

(>=) :: Format -> Format -> Bool

max :: Format -> Format -> Format

min :: Format -> Format -> Format

(ToJSONFilter m a, MonadIO m) => ToJSONFilter m (Maybe Format -> a) 
Instance details

Defined in Text.Pandoc.JSON

Methods

toJSONFilter :: (Maybe Format -> a) -> m ()

type Rep Format 
Instance details

Defined in Text.Pandoc.Definition

type Rep Format = D1 ('MetaData "Format" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'True) (C1 ('MetaCons "Format" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data Block #

Instances

Instances details
FromJSON Block 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser Block

parseJSONList :: Value -> Parser [Block]

omittedField :: Maybe Block

ToJSON Block 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: Block -> Value

toEncoding :: Block -> Encoding

toJSONList :: [Block] -> Value

toEncodingList :: [Block] -> Encoding

omitField :: Block -> Bool

Data Block 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Block -> c Block

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Block

toConstr :: Block -> Constr

dataTypeOf :: Block -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Block)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Block)

gmapT :: (forall b. Data b => b -> b) -> Block -> Block

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Block -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Block -> r

gmapQ :: (forall d. Data d => d -> u) -> Block -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Block -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Block -> m Block

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Block -> m Block

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Block -> m Block

Monoid Blocks 
Instance details

Defined in Text.Pandoc.Builder

Methods

mempty :: Blocks

mappend :: Blocks -> Blocks -> Blocks

mconcat :: [Blocks] -> Blocks

Semigroup Blocks 
Instance details

Defined in Text.Pandoc.Builder

Methods

(<>) :: Blocks -> Blocks -> Blocks

sconcat :: NonEmpty Blocks -> Blocks

stimes :: Integral b => b -> Blocks -> Blocks

Generic Block 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep Block 
Instance details

Defined in Text.Pandoc.Definition

type Rep Block = D1 ('MetaData "Block" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (((C1 ('MetaCons "Plain" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])) :+: (C1 ('MetaCons "Para" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])) :+: C1 ('MetaCons "LineBlock" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [[Inline]])))) :+: ((C1 ('MetaCons "CodeBlock" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "RawBlock" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Format) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text))) :+: (C1 ('MetaCons "BlockQuote" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Block])) :+: C1 ('MetaCons "OrderedList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ListAttributes) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [[Block]]))))) :+: ((C1 ('MetaCons "BulletList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [[Block]])) :+: (C1 ('MetaCons "DefinitionList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [([Inline], [[Block]])])) :+: C1 ('MetaCons "Header" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline]))))) :+: ((C1 ('MetaCons "HorizontalRule" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Table" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Caption) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [ColSpec]))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 TableHead) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [TableBody]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 TableFoot))))) :+: (C1 ('MetaCons "Figure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Caption) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Block]))) :+: C1 ('MetaCons "Div" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Block]))))))

Methods

from :: Block -> Rep Block x

to :: Rep Block x -> Block

Read Block 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS Block

readList :: ReadS [Block]

readPrec :: ReadPrec Block

readListPrec :: ReadPrec [Block]

Show Block 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> Block -> ShowS

show :: Block -> String

showList :: [Block] -> ShowS

NFData Block 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: Block -> ()

Eq Block 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: Block -> Block -> Bool

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

Ord Block 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: Block -> Block -> Ordering

(<) :: Block -> Block -> Bool

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

(>) :: Block -> Block -> Bool

(>=) :: Block -> Block -> Bool

max :: Block -> Block -> Block

min :: Block -> Block -> Block

ToMetaValue Blocks 
Instance details

Defined in Text.Pandoc.Builder

Methods

toMetaValue :: Blocks -> MetaValue

Walkable Block Chunk 
Instance details

Defined in Text.Pandoc.Chunks

Methods

walk :: (Block -> Block) -> Chunk -> Chunk

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> Chunk -> m Chunk

query :: Monoid c => (Block -> c) -> Chunk -> c

Walkable Block ChunkedDoc 
Instance details

Defined in Text.Pandoc.Chunks

Methods

walk :: (Block -> Block) -> ChunkedDoc -> ChunkedDoc

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> ChunkedDoc -> m ChunkedDoc

query :: Monoid c => (Block -> c) -> ChunkedDoc -> c

Walkable Block Block 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> Block -> Block

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> Block -> m Block

query :: Monoid c => (Block -> c) -> Block -> c

Walkable Block Caption 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> Caption -> Caption

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> Caption -> m Caption

query :: Monoid c => (Block -> c) -> Caption -> c

Walkable Block Cell 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> Cell -> Cell

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> Cell -> m Cell

query :: Monoid c => (Block -> c) -> Cell -> c

Walkable Block Citation 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> Citation -> Citation

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> Citation -> m Citation

query :: Monoid c => (Block -> c) -> Citation -> c

Walkable Block Inline 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> Inline -> Inline

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> Inline -> m Inline

query :: Monoid c => (Block -> c) -> Inline -> c

Walkable Block Meta 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> Meta -> Meta

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> Meta -> m Meta

query :: Monoid c => (Block -> c) -> Meta -> c

Walkable Block MetaValue 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> MetaValue -> MetaValue

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> MetaValue -> m MetaValue

query :: Monoid c => (Block -> c) -> MetaValue -> c

Walkable Block Pandoc 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> Pandoc -> Pandoc

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> Pandoc -> m Pandoc

query :: Monoid c => (Block -> c) -> Pandoc -> c

Walkable Block Row 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> Row -> Row

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> Row -> m Row

query :: Monoid c => (Block -> c) -> Row -> c

Walkable Block TableBody 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> TableBody -> TableBody

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> TableBody -> m TableBody

query :: Monoid c => (Block -> c) -> TableBody -> c

Walkable Block TableFoot 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> TableFoot -> TableFoot

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> TableFoot -> m TableFoot

query :: Monoid c => (Block -> c) -> TableFoot -> c

Walkable Block TableHead 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> TableHead -> TableHead

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> TableHead -> m TableHead

query :: Monoid c => (Block -> c) -> TableHead -> c

Walkable Inline Block 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> Block -> Block

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> Block -> m Block

query :: Monoid c => (Inline -> c) -> Block -> c

Walkable [Block] Block 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> Block -> Block

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> Block -> m Block

query :: Monoid c => ([Block] -> c) -> Block -> c

Walkable [Block] Caption 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> Caption -> Caption

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> Caption -> m Caption

query :: Monoid c => ([Block] -> c) -> Caption -> c

Walkable [Block] Cell 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> Cell -> Cell

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> Cell -> m Cell

query :: Monoid c => ([Block] -> c) -> Cell -> c

Walkable [Block] Citation 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> Citation -> Citation

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> Citation -> m Citation

query :: Monoid c => ([Block] -> c) -> Citation -> c

Walkable [Block] Inline 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> Inline -> Inline

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> Inline -> m Inline

query :: Monoid c => ([Block] -> c) -> Inline -> c

Walkable [Block] Meta 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> Meta -> Meta

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> Meta -> m Meta

query :: Monoid c => ([Block] -> c) -> Meta -> c

Walkable [Block] MetaValue 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> MetaValue -> MetaValue

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> MetaValue -> m MetaValue

query :: Monoid c => ([Block] -> c) -> MetaValue -> c

Walkable [Block] Pandoc 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> Pandoc -> Pandoc

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> Pandoc -> m Pandoc

query :: Monoid c => ([Block] -> c) -> Pandoc -> c

Walkable [Block] Row 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> Row -> Row

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> Row -> m Row

query :: Monoid c => ([Block] -> c) -> Row -> c

Walkable [Block] TableBody 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> TableBody -> TableBody

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> TableBody -> m TableBody

query :: Monoid c => ([Block] -> c) -> TableBody -> c

Walkable [Block] TableFoot 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> TableFoot -> TableFoot

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> TableFoot -> m TableFoot

query :: Monoid c => ([Block] -> c) -> TableFoot -> c

Walkable [Block] TableHead 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> TableHead -> TableHead

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> TableHead -> m TableHead

query :: Monoid c => ([Block] -> c) -> TableHead -> c

Walkable [Inline] Block 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> Block -> Block

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> Block -> m Block

query :: Monoid c => ([Inline] -> c) -> Block -> c

Walkable [Block] [Block] 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> [Block] -> [Block]

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> [Block] -> m [Block]

query :: Monoid c => ([Block] -> c) -> [Block] -> c

HasAttributes (Cm a Blocks) 
Instance details

Defined in Commonmark.Pandoc

Methods

addAttributes :: Attributes -> Cm a Blocks -> Cm a Blocks

Rangeable (Cm SourceRange Blocks) 
Instance details

Defined in Commonmark.Pandoc

Methods

ranged :: SourceRange -> Cm SourceRange Blocks -> Cm SourceRange Blocks

Rangeable (Cm () Blocks) 
Instance details

Defined in Commonmark.Pandoc

Methods

ranged :: SourceRange -> Cm () Blocks -> Cm () Blocks

Rangeable (Cm a Blocks) => HasDiv (Cm a Blocks) 
Instance details

Defined in Commonmark.Pandoc

Methods

div_ :: Cm a Blocks -> Cm a Blocks

(Rangeable (Cm a Inlines), Rangeable (Cm a Blocks)) => IsBlock (Cm a Inlines) (Cm a Blocks) 
Instance details

Defined in Commonmark.Pandoc

Methods

paragraph :: Cm a Inlines -> Cm a Blocks

plain :: Cm a Inlines -> Cm a Blocks

thematicBreak :: Cm a Blocks

blockQuote :: Cm a Blocks -> Cm a Blocks

codeBlock :: Text -> Text -> Cm a Blocks

heading :: Int -> Cm a Inlines -> Cm a Blocks

rawBlock :: Format -> Text -> Cm a Blocks

referenceLinkDefinition :: Text -> (Text, Text) -> Cm a Blocks

list :: ListType -> ListSpacing -> [Cm a Blocks] -> Cm a Blocks

(Rangeable (Cm a Inlines), Rangeable (Cm a Blocks)) => HasAlerts (Cm a Inlines) (Cm a Blocks) 
Instance details

Defined in Commonmark.Pandoc

Methods

alert :: AlertType -> Cm a Blocks -> Cm a Blocks

(Rangeable (Cm a Inlines), Rangeable (Cm a Blocks)) => HasDefinitionList (Cm a Inlines) (Cm a Blocks) 
Instance details

Defined in Commonmark.Pandoc

Methods

definitionList :: ListSpacing -> [(Cm a Inlines, [Cm a Blocks])] -> Cm a Blocks

(Rangeable (Cm a Inlines), Rangeable (Cm a Blocks)) => HasFootnote (Cm a Inlines) (Cm a Blocks) 
Instance details

Defined in Commonmark.Pandoc

Methods

footnote :: Int -> Text -> Cm a Blocks -> Cm a Blocks

footnoteList :: [Cm a Blocks] -> Cm a Blocks

footnoteRef :: Text -> Text -> Cm a Blocks -> Cm a Inlines

HasPipeTable (Cm a Inlines) (Cm a Blocks) 
Instance details

Defined in Commonmark.Pandoc

Methods

pipeTable :: [ColAlignment] -> [Cm a Inlines] -> [[Cm a Inlines]] -> Cm a Blocks

(Rangeable (Cm a Inlines), Rangeable (Cm a Blocks)) => HasTaskList (Cm a Inlines) (Cm a Blocks) 
Instance details

Defined in Commonmark.Pandoc

Methods

taskList :: ListType -> ListSpacing -> [(Bool, Cm a Blocks)] -> Cm a Blocks

type Rep Block 
Instance details

Defined in Text.Pandoc.Definition

type Rep Block = D1 ('MetaData "Block" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (((C1 ('MetaCons "Plain" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])) :+: (C1 ('MetaCons "Para" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])) :+: C1 ('MetaCons "LineBlock" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [[Inline]])))) :+: ((C1 ('MetaCons "CodeBlock" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "RawBlock" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Format) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text))) :+: (C1 ('MetaCons "BlockQuote" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Block])) :+: C1 ('MetaCons "OrderedList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ListAttributes) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [[Block]]))))) :+: ((C1 ('MetaCons "BulletList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [[Block]])) :+: (C1 ('MetaCons "DefinitionList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [([Inline], [[Block]])])) :+: C1 ('MetaCons "Header" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline]))))) :+: ((C1 ('MetaCons "HorizontalRule" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Table" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Caption) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [ColSpec]))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 TableHead) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [TableBody]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 TableFoot))))) :+: (C1 ('MetaCons "Figure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Caption) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Block]))) :+: C1 ('MetaCons "Div" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Block]))))))

data Citation #

Instances

Instances details
FromJSON Citation 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser Citation

parseJSONList :: Value -> Parser [Citation]

omittedField :: Maybe Citation

ToJSON Citation 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: Citation -> Value

toEncoding :: Citation -> Encoding

toJSONList :: [Citation] -> Value

toEncodingList :: [Citation] -> Encoding

omitField :: Citation -> Bool

Data Citation 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Citation -> c Citation

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Citation

toConstr :: Citation -> Constr

dataTypeOf :: Citation -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Citation)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Citation)

gmapT :: (forall b. Data b => b -> b) -> Citation -> Citation

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Citation -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Citation -> r

gmapQ :: (forall d. Data d => d -> u) -> Citation -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Citation -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Citation -> m Citation

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Citation -> m Citation

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Citation -> m Citation

Generic Citation 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep Citation 
Instance details

Defined in Text.Pandoc.Definition

type Rep Citation = D1 ('MetaData "Citation" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "Citation" 'PrefixI 'True) ((S1 ('MetaSel ('Just "citationId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: (S1 ('MetaSel ('Just "citationPrefix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline]) :*: S1 ('MetaSel ('Just "citationSuffix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline]))) :*: (S1 ('MetaSel ('Just "citationMode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 CitationMode) :*: (S1 ('MetaSel ('Just "citationNoteNum") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Just "citationHash") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int)))))

Methods

from :: Citation -> Rep Citation x

to :: Rep Citation x -> Citation

Read Citation 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS Citation

readList :: ReadS [Citation]

readPrec :: ReadPrec Citation

readListPrec :: ReadPrec [Citation]

Show Citation 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> Citation -> ShowS

show :: Citation -> String

showList :: [Citation] -> ShowS

NFData Citation 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: Citation -> ()

Eq Citation 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: Citation -> Citation -> Bool

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

Ord Citation 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: Citation -> Citation -> Ordering

(<) :: Citation -> Citation -> Bool

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

(>) :: Citation -> Citation -> Bool

(>=) :: Citation -> Citation -> Bool

max :: Citation -> Citation -> Citation

min :: Citation -> Citation -> Citation

Walkable Block Citation 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> Citation -> Citation

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> Citation -> m Citation

query :: Monoid c => (Block -> c) -> Citation -> c

Walkable Inline Citation 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> Citation -> Citation

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> Citation -> m Citation

query :: Monoid c => (Inline -> c) -> Citation -> c

Walkable [Block] Citation 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> Citation -> Citation

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> Citation -> m Citation

query :: Monoid c => ([Block] -> c) -> Citation -> c

Walkable [Inline] Citation 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> Citation -> Citation

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> Citation -> m Citation

query :: Monoid c => ([Inline] -> c) -> Citation -> c

type Rep Citation 
Instance details

Defined in Text.Pandoc.Definition

type Rep Citation = D1 ('MetaData "Citation" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "Citation" 'PrefixI 'True) ((S1 ('MetaSel ('Just "citationId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: (S1 ('MetaSel ('Just "citationPrefix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline]) :*: S1 ('MetaSel ('Just "citationSuffix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline]))) :*: (S1 ('MetaSel ('Just "citationMode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 CitationMode) :*: (S1 ('MetaSel ('Just "citationNoteNum") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Just "citationHash") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int)))))

data Row #

Constructors

Row Attr [Cell] 

Instances

Instances details
FromJSON Row 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser Row

parseJSONList :: Value -> Parser [Row]

omittedField :: Maybe Row

ToJSON Row 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: Row -> Value

toEncoding :: Row -> Encoding

toJSONList :: [Row] -> Value

toEncodingList :: [Row] -> Encoding

omitField :: Row -> Bool

Data Row 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Row -> c Row

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Row

toConstr :: Row -> Constr

dataTypeOf :: Row -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Row)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Row)

gmapT :: (forall b. Data b => b -> b) -> Row -> Row

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Row -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Row -> r

gmapQ :: (forall d. Data d => d -> u) -> Row -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Row -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Row -> m Row

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Row -> m Row

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Row -> m Row

Generic Row 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep Row 
Instance details

Defined in Text.Pandoc.Definition

type Rep Row = D1 ('MetaData "Row" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "Row" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Cell])))

Methods

from :: Row -> Rep Row x

to :: Rep Row x -> Row

Read Row 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS Row

readList :: ReadS [Row]

readPrec :: ReadPrec Row

readListPrec :: ReadPrec [Row]

Show Row 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> Row -> ShowS

show :: Row -> String

showList :: [Row] -> ShowS

NFData Row 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: Row -> ()

Eq Row 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: Row -> Row -> Bool

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

Ord Row 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: Row -> Row -> Ordering

(<) :: Row -> Row -> Bool

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

(>) :: Row -> Row -> Bool

(>=) :: Row -> Row -> Bool

max :: Row -> Row -> Row

min :: Row -> Row -> Row

Walkable Block Row 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> Row -> Row

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> Row -> m Row

query :: Monoid c => (Block -> c) -> Row -> c

Walkable Inline Row 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> Row -> Row

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> Row -> m Row

query :: Monoid c => (Inline -> c) -> Row -> c

Walkable [Block] Row 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> Row -> Row

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> Row -> m Row

query :: Monoid c => ([Block] -> c) -> Row -> c

Walkable [Inline] Row 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> Row -> Row

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> Row -> m Row

query :: Monoid c => ([Inline] -> c) -> Row -> c

type Rep Row 
Instance details

Defined in Text.Pandoc.Definition

type Rep Row = D1 ('MetaData "Row" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "Row" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Cell])))

data MetaValue #

Instances

Instances details
FromJSON MetaValue 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser MetaValue

parseJSONList :: Value -> Parser [MetaValue]

omittedField :: Maybe MetaValue

ToJSON MetaValue 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: MetaValue -> Value

toEncoding :: MetaValue -> Encoding

toJSONList :: [MetaValue] -> Value

toEncodingList :: [MetaValue] -> Encoding

omitField :: MetaValue -> Bool

Data MetaValue 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MetaValue -> c MetaValue

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MetaValue

toConstr :: MetaValue -> Constr

dataTypeOf :: MetaValue -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MetaValue)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MetaValue)

gmapT :: (forall b. Data b => b -> b) -> MetaValue -> MetaValue

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MetaValue -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MetaValue -> r

gmapQ :: (forall d. Data d => d -> u) -> MetaValue -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> MetaValue -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MetaValue -> m MetaValue

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MetaValue -> m MetaValue

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MetaValue -> m MetaValue

Generic MetaValue 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep MetaValue 
Instance details

Defined in Text.Pandoc.Definition

type Rep MetaValue = D1 ('MetaData "MetaValue" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) ((C1 ('MetaCons "MetaMap" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Map Text MetaValue))) :+: (C1 ('MetaCons "MetaList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [MetaValue])) :+: C1 ('MetaCons "MetaBool" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Bool)))) :+: (C1 ('MetaCons "MetaString" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :+: (C1 ('MetaCons "MetaInlines" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])) :+: C1 ('MetaCons "MetaBlocks" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Block])))))

Methods

from :: MetaValue -> Rep MetaValue x

to :: Rep MetaValue x -> MetaValue

Read MetaValue 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS MetaValue

readList :: ReadS [MetaValue]

readPrec :: ReadPrec MetaValue

readListPrec :: ReadPrec [MetaValue]

Show MetaValue 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> MetaValue -> ShowS

show :: MetaValue -> String

showList :: [MetaValue] -> ShowS

NFData MetaValue 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: MetaValue -> ()

Eq MetaValue 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: MetaValue -> MetaValue -> Bool

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

Ord MetaValue 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: MetaValue -> MetaValue -> Ordering

(<) :: MetaValue -> MetaValue -> Bool

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

(>) :: MetaValue -> MetaValue -> Bool

(>=) :: MetaValue -> MetaValue -> Bool

max :: MetaValue -> MetaValue -> MetaValue

min :: MetaValue -> MetaValue -> MetaValue

ToMetaValue MetaValue 
Instance details

Defined in Text.Pandoc.Builder

Walkable Block MetaValue 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> MetaValue -> MetaValue

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> MetaValue -> m MetaValue

query :: Monoid c => (Block -> c) -> MetaValue -> c

Walkable Inline MetaValue 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> MetaValue -> MetaValue

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> MetaValue -> m MetaValue

query :: Monoid c => (Inline -> c) -> MetaValue -> c

Walkable MetaValue Meta 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (MetaValue -> MetaValue) -> Meta -> Meta

walkM :: (Monad m, Applicative m, Functor m) => (MetaValue -> m MetaValue) -> Meta -> m Meta

query :: Monoid c => (MetaValue -> c) -> Meta -> c

Walkable MetaValue MetaValue 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (MetaValue -> MetaValue) -> MetaValue -> MetaValue

walkM :: (Monad m, Applicative m, Functor m) => (MetaValue -> m MetaValue) -> MetaValue -> m MetaValue

query :: Monoid c => (MetaValue -> c) -> MetaValue -> c

Walkable MetaValue Pandoc 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (MetaValue -> MetaValue) -> Pandoc -> Pandoc

walkM :: (Monad m, Applicative m, Functor m) => (MetaValue -> m MetaValue) -> Pandoc -> m Pandoc

query :: Monoid c => (MetaValue -> c) -> Pandoc -> c

Walkable [Block] MetaValue 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> MetaValue -> MetaValue

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> MetaValue -> m MetaValue

query :: Monoid c => ([Block] -> c) -> MetaValue -> c

Walkable [Inline] MetaValue 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> MetaValue -> MetaValue

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> MetaValue -> m MetaValue

query :: Monoid c => ([Inline] -> c) -> MetaValue -> c

type Rep MetaValue 
Instance details

Defined in Text.Pandoc.Definition

type Rep MetaValue = D1 ('MetaData "MetaValue" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) ((C1 ('MetaCons "MetaMap" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Map Text MetaValue))) :+: (C1 ('MetaCons "MetaList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [MetaValue])) :+: C1 ('MetaCons "MetaBool" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Bool)))) :+: (C1 ('MetaCons "MetaString" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :+: (C1 ('MetaCons "MetaInlines" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Inline])) :+: C1 ('MetaCons "MetaBlocks" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Block])))))

data ListNumberDelim #

Instances

Instances details
FromJSON ListNumberDelim 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser ListNumberDelim

parseJSONList :: Value -> Parser [ListNumberDelim]

omittedField :: Maybe ListNumberDelim

ToJSON ListNumberDelim 
Instance details

Defined in Text.Pandoc.Definition

Data ListNumberDelim 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ListNumberDelim -> c ListNumberDelim

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ListNumberDelim

toConstr :: ListNumberDelim -> Constr

dataTypeOf :: ListNumberDelim -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ListNumberDelim)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ListNumberDelim)

gmapT :: (forall b. Data b => b -> b) -> ListNumberDelim -> ListNumberDelim

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ListNumberDelim -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ListNumberDelim -> r

gmapQ :: (forall d. Data d => d -> u) -> ListNumberDelim -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> ListNumberDelim -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ListNumberDelim -> m ListNumberDelim

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ListNumberDelim -> m ListNumberDelim

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ListNumberDelim -> m ListNumberDelim

Generic ListNumberDelim 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep ListNumberDelim 
Instance details

Defined in Text.Pandoc.Definition

type Rep ListNumberDelim = D1 ('MetaData "ListNumberDelim" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) ((C1 ('MetaCons "DefaultDelim" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Period" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "OneParen" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TwoParens" 'PrefixI 'False) (U1 :: Type -> Type)))
Read ListNumberDelim 
Instance details

Defined in Text.Pandoc.Definition

Show ListNumberDelim 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> ListNumberDelim -> ShowS

show :: ListNumberDelim -> String

showList :: [ListNumberDelim] -> ShowS

NFData ListNumberDelim 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: ListNumberDelim -> ()

Eq ListNumberDelim 
Instance details

Defined in Text.Pandoc.Definition

Ord ListNumberDelim 
Instance details

Defined in Text.Pandoc.Definition

type Rep ListNumberDelim 
Instance details

Defined in Text.Pandoc.Definition

type Rep ListNumberDelim = D1 ('MetaData "ListNumberDelim" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) ((C1 ('MetaCons "DefaultDelim" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Period" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "OneParen" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TwoParens" 'PrefixI 'False) (U1 :: Type -> Type)))

data ListNumberStyle #

Instances

Instances details
FromJSON ListNumberStyle 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser ListNumberStyle

parseJSONList :: Value -> Parser [ListNumberStyle]

omittedField :: Maybe ListNumberStyle

ToJSON ListNumberStyle 
Instance details

Defined in Text.Pandoc.Definition

Data ListNumberStyle 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ListNumberStyle -> c ListNumberStyle

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ListNumberStyle

toConstr :: ListNumberStyle -> Constr

dataTypeOf :: ListNumberStyle -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ListNumberStyle)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ListNumberStyle)

gmapT :: (forall b. Data b => b -> b) -> ListNumberStyle -> ListNumberStyle

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ListNumberStyle -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ListNumberStyle -> r

gmapQ :: (forall d. Data d => d -> u) -> ListNumberStyle -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> ListNumberStyle -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ListNumberStyle -> m ListNumberStyle

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ListNumberStyle -> m ListNumberStyle

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ListNumberStyle -> m ListNumberStyle

Generic ListNumberStyle 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep ListNumberStyle 
Instance details

Defined in Text.Pandoc.Definition

type Rep ListNumberStyle = D1 ('MetaData "ListNumberStyle" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) ((C1 ('MetaCons "DefaultStyle" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Example" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Decimal" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "LowerRoman" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UpperRoman" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LowerAlpha" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UpperAlpha" 'PrefixI 'False) (U1 :: Type -> Type))))
Read ListNumberStyle 
Instance details

Defined in Text.Pandoc.Definition

Show ListNumberStyle 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> ListNumberStyle -> ShowS

show :: ListNumberStyle -> String

showList :: [ListNumberStyle] -> ShowS

NFData ListNumberStyle 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: ListNumberStyle -> ()

Eq ListNumberStyle 
Instance details

Defined in Text.Pandoc.Definition

Ord ListNumberStyle 
Instance details

Defined in Text.Pandoc.Definition

type Rep ListNumberStyle 
Instance details

Defined in Text.Pandoc.Definition

type Rep ListNumberStyle = D1 ('MetaData "ListNumberStyle" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) ((C1 ('MetaCons "DefaultStyle" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Example" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Decimal" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "LowerRoman" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UpperRoman" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LowerAlpha" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UpperAlpha" 'PrefixI 'False) (U1 :: Type -> Type))))

data Caption #

Constructors

Caption (Maybe ShortCaption) [Block] 

Instances

Instances details
FromJSON Caption 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser Caption

parseJSONList :: Value -> Parser [Caption]

omittedField :: Maybe Caption

ToJSON Caption 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: Caption -> Value

toEncoding :: Caption -> Encoding

toJSONList :: [Caption] -> Value

toEncodingList :: [Caption] -> Encoding

omitField :: Caption -> Bool

Data Caption 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Caption -> c Caption

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Caption

toConstr :: Caption -> Constr

dataTypeOf :: Caption -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Caption)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Caption)

gmapT :: (forall b. Data b => b -> b) -> Caption -> Caption

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Caption -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Caption -> r

gmapQ :: (forall d. Data d => d -> u) -> Caption -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Caption -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Caption -> m Caption

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Caption -> m Caption

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Caption -> m Caption

Generic Caption 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep Caption 
Instance details

Defined in Text.Pandoc.Definition

type Rep Caption = D1 ('MetaData "Caption" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "Caption" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe ShortCaption)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Block])))

Methods

from :: Caption -> Rep Caption x

to :: Rep Caption x -> Caption

Read Caption 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS Caption

readList :: ReadS [Caption]

readPrec :: ReadPrec Caption

readListPrec :: ReadPrec [Caption]

Show Caption 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> Caption -> ShowS

show :: Caption -> String

showList :: [Caption] -> ShowS

NFData Caption 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: Caption -> ()

Eq Caption 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: Caption -> Caption -> Bool

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

Ord Caption 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: Caption -> Caption -> Ordering

(<) :: Caption -> Caption -> Bool

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

(>) :: Caption -> Caption -> Bool

(>=) :: Caption -> Caption -> Bool

max :: Caption -> Caption -> Caption

min :: Caption -> Caption -> Caption

Walkable Block Caption 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> Caption -> Caption

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> Caption -> m Caption

query :: Monoid c => (Block -> c) -> Caption -> c

Walkable Inline Caption 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> Caption -> Caption

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> Caption -> m Caption

query :: Monoid c => (Inline -> c) -> Caption -> c

Walkable [Block] Caption 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> Caption -> Caption

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> Caption -> m Caption

query :: Monoid c => ([Block] -> c) -> Caption -> c

Walkable [Inline] Caption 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> Caption -> Caption

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> Caption -> m Caption

query :: Monoid c => ([Inline] -> c) -> Caption -> c

type Rep Caption 
Instance details

Defined in Text.Pandoc.Definition

type Rep Caption = D1 ('MetaData "Caption" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "Caption" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe ShortCaption)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Block])))

data TableHead #

Constructors

TableHead Attr [Row] 

Instances

Instances details
FromJSON TableHead 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser TableHead

parseJSONList :: Value -> Parser [TableHead]

omittedField :: Maybe TableHead

ToJSON TableHead 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: TableHead -> Value

toEncoding :: TableHead -> Encoding

toJSONList :: [TableHead] -> Value

toEncodingList :: [TableHead] -> Encoding

omitField :: TableHead -> Bool

Data TableHead 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TableHead -> c TableHead

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TableHead

toConstr :: TableHead -> Constr

dataTypeOf :: TableHead -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TableHead)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TableHead)

gmapT :: (forall b. Data b => b -> b) -> TableHead -> TableHead

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TableHead -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TableHead -> r

gmapQ :: (forall d. Data d => d -> u) -> TableHead -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> TableHead -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TableHead -> m TableHead

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TableHead -> m TableHead

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TableHead -> m TableHead

Generic TableHead 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep TableHead 
Instance details

Defined in Text.Pandoc.Definition

type Rep TableHead = D1 ('MetaData "TableHead" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "TableHead" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Row])))

Methods

from :: TableHead -> Rep TableHead x

to :: Rep TableHead x -> TableHead

Read TableHead 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS TableHead

readList :: ReadS [TableHead]

readPrec :: ReadPrec TableHead

readListPrec :: ReadPrec [TableHead]

Show TableHead 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> TableHead -> ShowS

show :: TableHead -> String

showList :: [TableHead] -> ShowS

NFData TableHead 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: TableHead -> ()

Eq TableHead 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: TableHead -> TableHead -> Bool

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

Ord TableHead 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: TableHead -> TableHead -> Ordering

(<) :: TableHead -> TableHead -> Bool

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

(>) :: TableHead -> TableHead -> Bool

(>=) :: TableHead -> TableHead -> Bool

max :: TableHead -> TableHead -> TableHead

min :: TableHead -> TableHead -> TableHead

Walkable Block TableHead 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> TableHead -> TableHead

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> TableHead -> m TableHead

query :: Monoid c => (Block -> c) -> TableHead -> c

Walkable Inline TableHead 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> TableHead -> TableHead

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> TableHead -> m TableHead

query :: Monoid c => (Inline -> c) -> TableHead -> c

Walkable [Block] TableHead 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> TableHead -> TableHead

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> TableHead -> m TableHead

query :: Monoid c => ([Block] -> c) -> TableHead -> c

Walkable [Inline] TableHead 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> TableHead -> TableHead

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> TableHead -> m TableHead

query :: Monoid c => ([Inline] -> c) -> TableHead -> c

type Rep TableHead 
Instance details

Defined in Text.Pandoc.Definition

type Rep TableHead = D1 ('MetaData "TableHead" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "TableHead" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Row])))

data TableBody #

Constructors

TableBody Attr RowHeadColumns [Row] [Row] 

Instances

Instances details
FromJSON TableBody 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser TableBody

parseJSONList :: Value -> Parser [TableBody]

omittedField :: Maybe TableBody

ToJSON TableBody 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: TableBody -> Value

toEncoding :: TableBody -> Encoding

toJSONList :: [TableBody] -> Value

toEncodingList :: [TableBody] -> Encoding

omitField :: TableBody -> Bool

Data TableBody 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TableBody -> c TableBody

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TableBody

toConstr :: TableBody -> Constr

dataTypeOf :: TableBody -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TableBody)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TableBody)

gmapT :: (forall b. Data b => b -> b) -> TableBody -> TableBody

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TableBody -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TableBody -> r

gmapQ :: (forall d. Data d => d -> u) -> TableBody -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> TableBody -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TableBody -> m TableBody

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TableBody -> m TableBody

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TableBody -> m TableBody

Generic TableBody 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep TableBody 
Instance details

Defined in Text.Pandoc.Definition

type Rep TableBody = D1 ('MetaData "TableBody" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "TableBody" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 RowHeadColumns)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Row]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Row]))))

Methods

from :: TableBody -> Rep TableBody x

to :: Rep TableBody x -> TableBody

Read TableBody 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS TableBody

readList :: ReadS [TableBody]

readPrec :: ReadPrec TableBody

readListPrec :: ReadPrec [TableBody]

Show TableBody 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> TableBody -> ShowS

show :: TableBody -> String

showList :: [TableBody] -> ShowS

NFData TableBody 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: TableBody -> ()

Eq TableBody 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: TableBody -> TableBody -> Bool

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

Ord TableBody 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: TableBody -> TableBody -> Ordering

(<) :: TableBody -> TableBody -> Bool

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

(>) :: TableBody -> TableBody -> Bool

(>=) :: TableBody -> TableBody -> Bool

max :: TableBody -> TableBody -> TableBody

min :: TableBody -> TableBody -> TableBody

Walkable Block TableBody 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> TableBody -> TableBody

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> TableBody -> m TableBody

query :: Monoid c => (Block -> c) -> TableBody -> c

Walkable Inline TableBody 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> TableBody -> TableBody

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> TableBody -> m TableBody

query :: Monoid c => (Inline -> c) -> TableBody -> c

Walkable [Block] TableBody 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> TableBody -> TableBody

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> TableBody -> m TableBody

query :: Monoid c => ([Block] -> c) -> TableBody -> c

Walkable [Inline] TableBody 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> TableBody -> TableBody

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> TableBody -> m TableBody

query :: Monoid c => ([Inline] -> c) -> TableBody -> c

type Rep TableBody 
Instance details

Defined in Text.Pandoc.Definition

type Rep TableBody = D1 ('MetaData "TableBody" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "TableBody" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 RowHeadColumns)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Row]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Row]))))

data TableFoot #

Constructors

TableFoot Attr [Row] 

Instances

Instances details
FromJSON TableFoot 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser TableFoot

parseJSONList :: Value -> Parser [TableFoot]

omittedField :: Maybe TableFoot

ToJSON TableFoot 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: TableFoot -> Value

toEncoding :: TableFoot -> Encoding

toJSONList :: [TableFoot] -> Value

toEncodingList :: [TableFoot] -> Encoding

omitField :: TableFoot -> Bool

Data TableFoot 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TableFoot -> c TableFoot

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TableFoot

toConstr :: TableFoot -> Constr

dataTypeOf :: TableFoot -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TableFoot)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TableFoot)

gmapT :: (forall b. Data b => b -> b) -> TableFoot -> TableFoot

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TableFoot -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TableFoot -> r

gmapQ :: (forall d. Data d => d -> u) -> TableFoot -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> TableFoot -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TableFoot -> m TableFoot

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TableFoot -> m TableFoot

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TableFoot -> m TableFoot

Generic TableFoot 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep TableFoot 
Instance details

Defined in Text.Pandoc.Definition

type Rep TableFoot = D1 ('MetaData "TableFoot" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "TableFoot" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Row])))

Methods

from :: TableFoot -> Rep TableFoot x

to :: Rep TableFoot x -> TableFoot

Read TableFoot 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS TableFoot

readList :: ReadS [TableFoot]

readPrec :: ReadPrec TableFoot

readListPrec :: ReadPrec [TableFoot]

Show TableFoot 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> TableFoot -> ShowS

show :: TableFoot -> String

showList :: [TableFoot] -> ShowS

NFData TableFoot 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: TableFoot -> ()

Eq TableFoot 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: TableFoot -> TableFoot -> Bool

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

Ord TableFoot 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: TableFoot -> TableFoot -> Ordering

(<) :: TableFoot -> TableFoot -> Bool

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

(>) :: TableFoot -> TableFoot -> Bool

(>=) :: TableFoot -> TableFoot -> Bool

max :: TableFoot -> TableFoot -> TableFoot

min :: TableFoot -> TableFoot -> TableFoot

Walkable Block TableFoot 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> TableFoot -> TableFoot

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> TableFoot -> m TableFoot

query :: Monoid c => (Block -> c) -> TableFoot -> c

Walkable Inline TableFoot 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> TableFoot -> TableFoot

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> TableFoot -> m TableFoot

query :: Monoid c => (Inline -> c) -> TableFoot -> c

Walkable [Block] TableFoot 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> TableFoot -> TableFoot

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> TableFoot -> m TableFoot

query :: Monoid c => ([Block] -> c) -> TableFoot -> c

Walkable [Inline] TableFoot 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> TableFoot -> TableFoot

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> TableFoot -> m TableFoot

query :: Monoid c => ([Inline] -> c) -> TableFoot -> c

type Rep TableFoot 
Instance details

Defined in Text.Pandoc.Definition

type Rep TableFoot = D1 ('MetaData "TableFoot" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "TableFoot" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Row])))

data Cell #

Instances

Instances details
FromJSON Cell 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser Cell

parseJSONList :: Value -> Parser [Cell]

omittedField :: Maybe Cell

ToJSON Cell 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: Cell -> Value

toEncoding :: Cell -> Encoding

toJSONList :: [Cell] -> Value

toEncodingList :: [Cell] -> Encoding

omitField :: Cell -> Bool

Data Cell 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Cell -> c Cell

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Cell

toConstr :: Cell -> Constr

dataTypeOf :: Cell -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Cell)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Cell)

gmapT :: (forall b. Data b => b -> b) -> Cell -> Cell

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Cell -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Cell -> r

gmapQ :: (forall d. Data d => d -> u) -> Cell -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Cell -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Cell -> m Cell

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Cell -> m Cell

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Cell -> m Cell

Generic Cell 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep Cell 
Instance details

Defined in Text.Pandoc.Definition

type Rep Cell = D1 ('MetaData "Cell" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "Cell" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Alignment)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 RowSpan) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 ColSpan) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Block])))))

Methods

from :: Cell -> Rep Cell x

to :: Rep Cell x -> Cell

Read Cell 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS Cell

readList :: ReadS [Cell]

readPrec :: ReadPrec Cell

readListPrec :: ReadPrec [Cell]

Show Cell 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> Cell -> ShowS

show :: Cell -> String

showList :: [Cell] -> ShowS

NFData Cell 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: Cell -> ()

Eq Cell 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: Cell -> Cell -> Bool

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

Ord Cell 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: Cell -> Cell -> Ordering

(<) :: Cell -> Cell -> Bool

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

(>) :: Cell -> Cell -> Bool

(>=) :: Cell -> Cell -> Bool

max :: Cell -> Cell -> Cell

min :: Cell -> Cell -> Cell

Walkable Block Cell 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> Cell -> Cell

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> Cell -> m Cell

query :: Monoid c => (Block -> c) -> Cell -> c

Walkable Inline Cell 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> Cell -> Cell

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> Cell -> m Cell

query :: Monoid c => (Inline -> c) -> Cell -> c

Walkable [Block] Cell 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> Cell -> Cell

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> Cell -> m Cell

query :: Monoid c => ([Block] -> c) -> Cell -> c

Walkable [Inline] Cell 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> Cell -> Cell

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> Cell -> m Cell

query :: Monoid c => ([Inline] -> c) -> Cell -> c

type Rep Cell 
Instance details

Defined in Text.Pandoc.Definition

type Rep Cell = D1 ('MetaData "Cell" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "Cell" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Attr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Alignment)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 RowSpan) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 ColSpan) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Block])))))

newtype Meta #

Constructors

Meta 

Fields

Instances

Instances details
FromJSON Meta 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser Meta

parseJSONList :: Value -> Parser [Meta]

omittedField :: Maybe Meta

ToJSON Meta 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: Meta -> Value

toEncoding :: Meta -> Encoding

toJSONList :: [Meta] -> Value

toEncodingList :: [Meta] -> Encoding

omitField :: Meta -> Bool

Data Meta 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Meta -> c Meta

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Meta

toConstr :: Meta -> Constr

dataTypeOf :: Meta -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Meta)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Meta)

gmapT :: (forall b. Data b => b -> b) -> Meta -> Meta

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Meta -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Meta -> r

gmapQ :: (forall d. Data d => d -> u) -> Meta -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Meta -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Meta -> m Meta

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Meta -> m Meta

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Meta -> m Meta

Monoid Meta 
Instance details

Defined in Text.Pandoc.Definition

Methods

mempty :: Meta

mappend :: Meta -> Meta -> Meta

mconcat :: [Meta] -> Meta

Semigroup Meta 
Instance details

Defined in Text.Pandoc.Definition

Methods

(<>) :: Meta -> Meta -> Meta

sconcat :: NonEmpty Meta -> Meta

stimes :: Integral b => b -> Meta -> Meta

Generic Meta 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep Meta 
Instance details

Defined in Text.Pandoc.Definition

type Rep Meta = D1 ('MetaData "Meta" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'True) (C1 ('MetaCons "Meta" 'PrefixI 'True) (S1 ('MetaSel ('Just "unMeta") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map Text MetaValue))))

Methods

from :: Meta -> Rep Meta x

to :: Rep Meta x -> Meta

Read Meta 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS Meta

readList :: ReadS [Meta]

readPrec :: ReadPrec Meta

readListPrec :: ReadPrec [Meta]

Show Meta 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> Meta -> ShowS

show :: Meta -> String

showList :: [Meta] -> ShowS

NFData Meta 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: Meta -> ()

Eq Meta 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: Meta -> Meta -> Bool

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

Ord Meta 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: Meta -> Meta -> Ordering

(<) :: Meta -> Meta -> Bool

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

(>) :: Meta -> Meta -> Bool

(>=) :: Meta -> Meta -> Bool

max :: Meta -> Meta -> Meta

min :: Meta -> Meta -> Meta

HasMeta Meta 
Instance details

Defined in Text.Pandoc.Builder

Methods

setMeta :: ToMetaValue b => Text -> b -> Meta -> Meta

deleteMeta :: Text -> Meta -> Meta

Walkable Block Meta 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Block -> Block) -> Meta -> Meta

walkM :: (Monad m, Applicative m, Functor m) => (Block -> m Block) -> Meta -> m Meta

query :: Monoid c => (Block -> c) -> Meta -> c

Walkable Inline Meta 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Inline -> Inline) -> Meta -> Meta

walkM :: (Monad m, Applicative m, Functor m) => (Inline -> m Inline) -> Meta -> m Meta

query :: Monoid c => (Inline -> c) -> Meta -> c

Walkable Meta Meta 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Meta -> Meta) -> Meta -> Meta

walkM :: (Monad m, Applicative m, Functor m) => (Meta -> m Meta) -> Meta -> m Meta

query :: Monoid c => (Meta -> c) -> Meta -> c

Walkable Meta Pandoc 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (Meta -> Meta) -> Pandoc -> Pandoc

walkM :: (Monad m, Applicative m, Functor m) => (Meta -> m Meta) -> Pandoc -> m Pandoc

query :: Monoid c => (Meta -> c) -> Pandoc -> c

Walkable MetaValue Meta 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: (MetaValue -> MetaValue) -> Meta -> Meta

walkM :: (Monad m, Applicative m, Functor m) => (MetaValue -> m MetaValue) -> Meta -> m Meta

query :: Monoid c => (MetaValue -> c) -> Meta -> c

Walkable [Block] Meta 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Block] -> [Block]) -> Meta -> Meta

walkM :: (Monad m, Applicative m, Functor m) => ([Block] -> m [Block]) -> Meta -> m Meta

query :: Monoid c => ([Block] -> c) -> Meta -> c

Walkable [Inline] Meta 
Instance details

Defined in Text.Pandoc.Walk

Methods

walk :: ([Inline] -> [Inline]) -> Meta -> Meta

walkM :: (Monad m, Applicative m, Functor m) => ([Inline] -> m [Inline]) -> Meta -> m Meta

query :: Monoid c => ([Inline] -> c) -> Meta -> c

type Rep Meta 
Instance details

Defined in Text.Pandoc.Definition

type Rep Meta = D1 ('MetaData "Meta" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'True) (C1 ('MetaCons "Meta" 'PrefixI 'True) (S1 ('MetaSel ('Just "unMeta") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map Text MetaValue))))

type Target = (Text, Text) #

data Alignment #

Instances

Instances details
FromJSON Alignment 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser Alignment

parseJSONList :: Value -> Parser [Alignment]

omittedField :: Maybe Alignment

ToJSON Alignment 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: Alignment -> Value

toEncoding :: Alignment -> Encoding

toJSONList :: [Alignment] -> Value

toEncodingList :: [Alignment] -> Encoding

omitField :: Alignment -> Bool

Data Alignment 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Alignment -> c Alignment

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Alignment

toConstr :: Alignment -> Constr

dataTypeOf :: Alignment -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Alignment)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Alignment)

gmapT :: (forall b. Data b => b -> b) -> Alignment -> Alignment

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Alignment -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Alignment -> r

gmapQ :: (forall d. Data d => d -> u) -> Alignment -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Alignment -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Alignment -> m Alignment

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Alignment -> m Alignment

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Alignment -> m Alignment

Generic Alignment 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep Alignment 
Instance details

Defined in Text.Pandoc.Definition

type Rep Alignment = D1 ('MetaData "Alignment" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) ((C1 ('MetaCons "AlignLeft" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AlignRight" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "AlignCenter" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AlignDefault" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: Alignment -> Rep Alignment x

to :: Rep Alignment x -> Alignment

Read Alignment 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS Alignment

readList :: ReadS [Alignment]

readPrec :: ReadPrec Alignment

readListPrec :: ReadPrec [Alignment]

Show Alignment 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> Alignment -> ShowS

show :: Alignment -> String

showList :: [Alignment] -> ShowS

NFData Alignment 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: Alignment -> ()

Eq Alignment 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: Alignment -> Alignment -> Bool

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

Ord Alignment 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: Alignment -> Alignment -> Ordering

(<) :: Alignment -> Alignment -> Bool

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

(>) :: Alignment -> Alignment -> Bool

(>=) :: Alignment -> Alignment -> Bool

max :: Alignment -> Alignment -> Alignment

min :: Alignment -> Alignment -> Alignment

type Rep Alignment 
Instance details

Defined in Text.Pandoc.Definition

type Rep Alignment = D1 ('MetaData "Alignment" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) ((C1 ('MetaCons "AlignLeft" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AlignRight" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "AlignCenter" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AlignDefault" 'PrefixI 'False) (U1 :: Type -> Type)))

newtype RowSpan #

Constructors

RowSpan Int 

Instances

Instances details
FromJSON RowSpan 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser RowSpan

parseJSONList :: Value -> Parser [RowSpan]

omittedField :: Maybe RowSpan

ToJSON RowSpan 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: RowSpan -> Value

toEncoding :: RowSpan -> Encoding

toJSONList :: [RowSpan] -> Value

toEncodingList :: [RowSpan] -> Encoding

omitField :: RowSpan -> Bool

Data RowSpan 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RowSpan -> c RowSpan

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RowSpan

toConstr :: RowSpan -> Constr

dataTypeOf :: RowSpan -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RowSpan)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RowSpan)

gmapT :: (forall b. Data b => b -> b) -> RowSpan -> RowSpan

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RowSpan -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RowSpan -> r

gmapQ :: (forall d. Data d => d -> u) -> RowSpan -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> RowSpan -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RowSpan -> m RowSpan

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RowSpan -> m RowSpan

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RowSpan -> m RowSpan

Enum RowSpan 
Instance details

Defined in Text.Pandoc.Definition

Generic RowSpan 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep RowSpan 
Instance details

Defined in Text.Pandoc.Definition

type Rep RowSpan = D1 ('MetaData "RowSpan" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'True) (C1 ('MetaCons "RowSpan" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

Methods

from :: RowSpan -> Rep RowSpan x

to :: Rep RowSpan x -> RowSpan

Num RowSpan 
Instance details

Defined in Text.Pandoc.Definition

Read RowSpan 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS RowSpan

readList :: ReadS [RowSpan]

readPrec :: ReadPrec RowSpan

readListPrec :: ReadPrec [RowSpan]

Show RowSpan 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> RowSpan -> ShowS

show :: RowSpan -> String

showList :: [RowSpan] -> ShowS

NFData RowSpan 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: RowSpan -> ()

Eq RowSpan 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: RowSpan -> RowSpan -> Bool

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

Ord RowSpan 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: RowSpan -> RowSpan -> Ordering

(<) :: RowSpan -> RowSpan -> Bool

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

(>) :: RowSpan -> RowSpan -> Bool

(>=) :: RowSpan -> RowSpan -> Bool

max :: RowSpan -> RowSpan -> RowSpan

min :: RowSpan -> RowSpan -> RowSpan

type Rep RowSpan 
Instance details

Defined in Text.Pandoc.Definition

type Rep RowSpan = D1 ('MetaData "RowSpan" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'True) (C1 ('MetaCons "RowSpan" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

newtype ColSpan #

Constructors

ColSpan Int 

Instances

Instances details
FromJSON ColSpan 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser ColSpan

parseJSONList :: Value -> Parser [ColSpan]

omittedField :: Maybe ColSpan

ToJSON ColSpan 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: ColSpan -> Value

toEncoding :: ColSpan -> Encoding

toJSONList :: [ColSpan] -> Value

toEncodingList :: [ColSpan] -> Encoding

omitField :: ColSpan -> Bool

Data ColSpan 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ColSpan -> c ColSpan

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ColSpan

toConstr :: ColSpan -> Constr

dataTypeOf :: ColSpan -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ColSpan)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ColSpan)

gmapT :: (forall b. Data b => b -> b) -> ColSpan -> ColSpan

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ColSpan -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ColSpan -> r

gmapQ :: (forall d. Data d => d -> u) -> ColSpan -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> ColSpan -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ColSpan -> m ColSpan

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ColSpan -> m ColSpan

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ColSpan -> m ColSpan

Enum ColSpan 
Instance details

Defined in Text.Pandoc.Definition

Generic ColSpan 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep ColSpan 
Instance details

Defined in Text.Pandoc.Definition

type Rep ColSpan = D1 ('MetaData "ColSpan" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'True) (C1 ('MetaCons "ColSpan" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

Methods

from :: ColSpan -> Rep ColSpan x

to :: Rep ColSpan x -> ColSpan

Num ColSpan 
Instance details

Defined in Text.Pandoc.Definition

Read ColSpan 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS ColSpan

readList :: ReadS [ColSpan]

readPrec :: ReadPrec ColSpan

readListPrec :: ReadPrec [ColSpan]

Show ColSpan 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> ColSpan -> ShowS

show :: ColSpan -> String

showList :: [ColSpan] -> ShowS

NFData ColSpan 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: ColSpan -> ()

Eq ColSpan 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: ColSpan -> ColSpan -> Bool

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

Ord ColSpan 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: ColSpan -> ColSpan -> Ordering

(<) :: ColSpan -> ColSpan -> Bool

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

(>) :: ColSpan -> ColSpan -> Bool

(>=) :: ColSpan -> ColSpan -> Bool

max :: ColSpan -> ColSpan -> ColSpan

min :: ColSpan -> ColSpan -> ColSpan

type Rep ColSpan 
Instance details

Defined in Text.Pandoc.Definition

type Rep ColSpan = D1 ('MetaData "ColSpan" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'True) (C1 ('MetaCons "ColSpan" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

data ColWidth #

Constructors

ColWidth Double 
ColWidthDefault 

Instances

Instances details
FromJSON ColWidth 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser ColWidth

parseJSONList :: Value -> Parser [ColWidth]

omittedField :: Maybe ColWidth

ToJSON ColWidth 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: ColWidth -> Value

toEncoding :: ColWidth -> Encoding

toJSONList :: [ColWidth] -> Value

toEncodingList :: [ColWidth] -> Encoding

omitField :: ColWidth -> Bool

Data ColWidth 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ColWidth -> c ColWidth

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ColWidth

toConstr :: ColWidth -> Constr

dataTypeOf :: ColWidth -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ColWidth)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ColWidth)

gmapT :: (forall b. Data b => b -> b) -> ColWidth -> ColWidth

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ColWidth -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ColWidth -> r

gmapQ :: (forall d. Data d => d -> u) -> ColWidth -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> ColWidth -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ColWidth -> m ColWidth

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ColWidth -> m ColWidth

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ColWidth -> m ColWidth

Generic ColWidth 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep ColWidth 
Instance details

Defined in Text.Pandoc.Definition

type Rep ColWidth = D1 ('MetaData "ColWidth" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "ColWidth" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Double)) :+: C1 ('MetaCons "ColWidthDefault" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: ColWidth -> Rep ColWidth x

to :: Rep ColWidth x -> ColWidth

Read ColWidth 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS ColWidth

readList :: ReadS [ColWidth]

readPrec :: ReadPrec ColWidth

readListPrec :: ReadPrec [ColWidth]

Show ColWidth 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> ColWidth -> ShowS

show :: ColWidth -> String

showList :: [ColWidth] -> ShowS

NFData ColWidth 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: ColWidth -> ()

Eq ColWidth 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: ColWidth -> ColWidth -> Bool

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

Ord ColWidth 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: ColWidth -> ColWidth -> Ordering

(<) :: ColWidth -> ColWidth -> Bool

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

(>) :: ColWidth -> ColWidth -> Bool

(>=) :: ColWidth -> ColWidth -> Bool

max :: ColWidth -> ColWidth -> ColWidth

min :: ColWidth -> ColWidth -> ColWidth

type Rep ColWidth 
Instance details

Defined in Text.Pandoc.Definition

type Rep ColWidth = D1 ('MetaData "ColWidth" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "ColWidth" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Double)) :+: C1 ('MetaCons "ColWidthDefault" 'PrefixI 'False) (U1 :: Type -> Type))

data CitationMode #

Instances

Instances details
FromJSON CitationMode 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser CitationMode

parseJSONList :: Value -> Parser [CitationMode]

omittedField :: Maybe CitationMode

ToJSON CitationMode 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: CitationMode -> Value

toEncoding :: CitationMode -> Encoding

toJSONList :: [CitationMode] -> Value

toEncodingList :: [CitationMode] -> Encoding

omitField :: CitationMode -> Bool

Data CitationMode 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CitationMode -> c CitationMode

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CitationMode

toConstr :: CitationMode -> Constr

dataTypeOf :: CitationMode -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CitationMode)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CitationMode)

gmapT :: (forall b. Data b => b -> b) -> CitationMode -> CitationMode

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CitationMode -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CitationMode -> r

gmapQ :: (forall d. Data d => d -> u) -> CitationMode -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> CitationMode -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CitationMode -> m CitationMode

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CitationMode -> m CitationMode

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CitationMode -> m CitationMode

Generic CitationMode 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep CitationMode 
Instance details

Defined in Text.Pandoc.Definition

type Rep CitationMode = D1 ('MetaData "CitationMode" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "AuthorInText" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SuppressAuthor" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NormalCitation" 'PrefixI 'False) (U1 :: Type -> Type)))
Read CitationMode 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS CitationMode

readList :: ReadS [CitationMode]

readPrec :: ReadPrec CitationMode

readListPrec :: ReadPrec [CitationMode]

Show CitationMode 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> CitationMode -> ShowS

show :: CitationMode -> String

showList :: [CitationMode] -> ShowS

NFData CitationMode 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: CitationMode -> ()

Eq CitationMode 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: CitationMode -> CitationMode -> Bool

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

Ord CitationMode 
Instance details

Defined in Text.Pandoc.Definition

type Rep CitationMode 
Instance details

Defined in Text.Pandoc.Definition

type Rep CitationMode = D1 ('MetaData "CitationMode" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "AuthorInText" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SuppressAuthor" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NormalCitation" 'PrefixI 'False) (U1 :: Type -> Type)))

data MathType #

Constructors

DisplayMath 
InlineMath 

Instances

Instances details
FromJSON MathType 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser MathType

parseJSONList :: Value -> Parser [MathType]

omittedField :: Maybe MathType

ToJSON MathType 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: MathType -> Value

toEncoding :: MathType -> Encoding

toJSONList :: [MathType] -> Value

toEncodingList :: [MathType] -> Encoding

omitField :: MathType -> Bool

Data MathType 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MathType -> c MathType

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MathType

toConstr :: MathType -> Constr

dataTypeOf :: MathType -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MathType)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MathType)

gmapT :: (forall b. Data b => b -> b) -> MathType -> MathType

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MathType -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MathType -> r

gmapQ :: (forall d. Data d => d -> u) -> MathType -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> MathType -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MathType -> m MathType

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MathType -> m MathType

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MathType -> m MathType

Generic MathType 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep MathType 
Instance details

Defined in Text.Pandoc.Definition

type Rep MathType = D1 ('MetaData "MathType" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "DisplayMath" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InlineMath" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: MathType -> Rep MathType x

to :: Rep MathType x -> MathType

Read MathType 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS MathType

readList :: ReadS [MathType]

readPrec :: ReadPrec MathType

readListPrec :: ReadPrec [MathType]

Show MathType 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> MathType -> ShowS

show :: MathType -> String

showList :: [MathType] -> ShowS

NFData MathType 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: MathType -> ()

Eq MathType 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: MathType -> MathType -> Bool

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

Ord MathType 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: MathType -> MathType -> Ordering

(<) :: MathType -> MathType -> Bool

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

(>) :: MathType -> MathType -> Bool

(>=) :: MathType -> MathType -> Bool

max :: MathType -> MathType -> MathType

min :: MathType -> MathType -> MathType

type Rep MathType 
Instance details

Defined in Text.Pandoc.Definition

type Rep MathType = D1 ('MetaData "MathType" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "DisplayMath" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InlineMath" 'PrefixI 'False) (U1 :: Type -> Type))

data QuoteType #

Constructors

SingleQuote 
DoubleQuote 

Instances

Instances details
FromJSON QuoteType 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser QuoteType

parseJSONList :: Value -> Parser [QuoteType]

omittedField :: Maybe QuoteType

ToJSON QuoteType 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: QuoteType -> Value

toEncoding :: QuoteType -> Encoding

toJSONList :: [QuoteType] -> Value

toEncodingList :: [QuoteType] -> Encoding

omitField :: QuoteType -> Bool

Data QuoteType 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> QuoteType -> c QuoteType

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c QuoteType

toConstr :: QuoteType -> Constr

dataTypeOf :: QuoteType -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c QuoteType)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c QuoteType)

gmapT :: (forall b. Data b => b -> b) -> QuoteType -> QuoteType

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> QuoteType -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> QuoteType -> r

gmapQ :: (forall d. Data d => d -> u) -> QuoteType -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> QuoteType -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> QuoteType -> m QuoteType

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> QuoteType -> m QuoteType

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> QuoteType -> m QuoteType

Generic QuoteType 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep QuoteType 
Instance details

Defined in Text.Pandoc.Definition

type Rep QuoteType = D1 ('MetaData "QuoteType" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "SingleQuote" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DoubleQuote" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: QuoteType -> Rep QuoteType x

to :: Rep QuoteType x -> QuoteType

Read QuoteType 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS QuoteType

readList :: ReadS [QuoteType]

readPrec :: ReadPrec QuoteType

readListPrec :: ReadPrec [QuoteType]

Show QuoteType 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> QuoteType -> ShowS

show :: QuoteType -> String

showList :: [QuoteType] -> ShowS

NFData QuoteType 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: QuoteType -> ()

Eq QuoteType 
Instance details

Defined in Text.Pandoc.Definition

Methods

(==) :: QuoteType -> QuoteType -> Bool

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

Ord QuoteType 
Instance details

Defined in Text.Pandoc.Definition

Methods

compare :: QuoteType -> QuoteType -> Ordering

(<) :: QuoteType -> QuoteType -> Bool

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

(>) :: QuoteType -> QuoteType -> Bool

(>=) :: QuoteType -> QuoteType -> Bool

max :: QuoteType -> QuoteType -> QuoteType

min :: QuoteType -> QuoteType -> QuoteType

type Rep QuoteType 
Instance details

Defined in Text.Pandoc.Definition

type Rep QuoteType = D1 ('MetaData "QuoteType" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'False) (C1 ('MetaCons "SingleQuote" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DoubleQuote" 'PrefixI 'False) (U1 :: Type -> Type))

newtype RowHeadColumns #

Constructors

RowHeadColumns Int 

Instances

Instances details
FromJSON RowHeadColumns 
Instance details

Defined in Text.Pandoc.Definition

Methods

parseJSON :: Value -> Parser RowHeadColumns

parseJSONList :: Value -> Parser [RowHeadColumns]

omittedField :: Maybe RowHeadColumns

ToJSON RowHeadColumns 
Instance details

Defined in Text.Pandoc.Definition

Methods

toJSON :: RowHeadColumns -> Value

toEncoding :: RowHeadColumns -> Encoding

toJSONList :: [RowHeadColumns] -> Value

toEncodingList :: [RowHeadColumns] -> Encoding

omitField :: RowHeadColumns -> Bool

Data RowHeadColumns 
Instance details

Defined in Text.Pandoc.Definition

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RowHeadColumns -> c RowHeadColumns

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RowHeadColumns

toConstr :: RowHeadColumns -> Constr

dataTypeOf :: RowHeadColumns -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RowHeadColumns)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RowHeadColumns)

gmapT :: (forall b. Data b => b -> b) -> RowHeadColumns -> RowHeadColumns

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RowHeadColumns -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RowHeadColumns -> r

gmapQ :: (forall d. Data d => d -> u) -> RowHeadColumns -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> RowHeadColumns -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RowHeadColumns -> m RowHeadColumns

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RowHeadColumns -> m RowHeadColumns

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RowHeadColumns -> m RowHeadColumns

Enum RowHeadColumns 
Instance details

Defined in Text.Pandoc.Definition

Generic RowHeadColumns 
Instance details

Defined in Text.Pandoc.Definition

Associated Types

type Rep RowHeadColumns 
Instance details

Defined in Text.Pandoc.Definition

type Rep RowHeadColumns = D1 ('MetaData "RowHeadColumns" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'True) (C1 ('MetaCons "RowHeadColumns" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))
Num RowHeadColumns 
Instance details

Defined in Text.Pandoc.Definition

Read RowHeadColumns 
Instance details

Defined in Text.Pandoc.Definition

Methods

readsPrec :: Int -> ReadS RowHeadColumns

readList :: ReadS [RowHeadColumns]

readPrec :: ReadPrec RowHeadColumns

readListPrec :: ReadPrec [RowHeadColumns]

Show RowHeadColumns 
Instance details

Defined in Text.Pandoc.Definition

Methods

showsPrec :: Int -> RowHeadColumns -> ShowS

show :: RowHeadColumns -> String

showList :: [RowHeadColumns] -> ShowS

NFData RowHeadColumns 
Instance details

Defined in Text.Pandoc.Definition

Methods

rnf :: RowHeadColumns -> ()

Eq RowHeadColumns 
Instance details

Defined in Text.Pandoc.Definition

Ord RowHeadColumns 
Instance details

Defined in Text.Pandoc.Definition

type Rep RowHeadColumns 
Instance details

Defined in Text.Pandoc.Definition

type Rep RowHeadColumns = D1 ('MetaData "RowHeadColumns" "Text.Pandoc.Definition" "pandoc-types-1.23.1-9I8GvJCA2iRr2EqZdn4hx" 'True) (C1 ('MetaCons "RowHeadColumns" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

pattern SimpleFigure :: Attr -> [Inline] -> Target -> Block #

isNullMeta :: Meta -> Bool #

lookupMeta :: Text -> Meta -> Maybe MetaValue #

Generics

bottomUp :: (Data a, Data b) => (a -> a) -> b -> b #

bottomUpM :: (Monad m, Data a, Data b) => (a -> m a) -> b -> m b #

queryWith :: (Data a, Monoid b, Data c) => (a -> b) -> c -> b #

topDown :: (Data a, Data b) => (a -> a) -> b -> b #

Options

Logging

Typeclass

Internal data files

Error handling

Readers: converting to Pandoc format

Writers: converting from Pandoc format

Rendering templates and default templates

Localization

setTranslations :: PandocMonad m => Lang -> m () Source #

Select the language to use with translateTerm. Note that this does not read a translation file; that is only done the first time translateTerm is used.

translateTerm :: PandocMonad m => Term -> m Text Source #

Get a translation from the current term map. Issue a warning if the term is not defined.

Version information

pandocVersion :: Version Source #

Version number of pandoc library.

pandocVersionText :: Text Source #

Text representation of the library's version number.