Copyright | Copyright (C) 2006-2024 John MacFarlane |
---|---|
License | GNU GPL, version 2 or above |
Maintainer | John MacFarlane <jgm@berkeley.edu> |
Stability | alpha |
Portability | portable |
Safe Haskell | None |
Language | Haskell2010 |
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
- type Attr = (Text, [Text], [(Text, Text)])
- data Pandoc = Pandoc Meta [Block]
- data Inline
- = Str Text
- | Emph [Inline]
- | Underline [Inline]
- | Strong [Inline]
- | Strikeout [Inline]
- | Superscript [Inline]
- | Subscript [Inline]
- | SmallCaps [Inline]
- | Quoted QuoteType [Inline]
- | Cite [Citation] [Inline]
- | Code Attr Text
- | Space
- | SoftBreak
- | LineBreak
- | Math MathType Text
- | RawInline Format Text
- | Link Attr [Inline] Target
- | Image Attr [Inline] Target
- | Note [Block]
- | Span Attr [Inline]
- newtype Format = Format Text
- data Block
- = Plain [Inline]
- | Para [Inline]
- | LineBlock [[Inline]]
- | CodeBlock Attr Text
- | RawBlock Format Text
- | BlockQuote [Block]
- | OrderedList ListAttributes [[Block]]
- | BulletList [[Block]]
- | DefinitionList [([Inline], [[Block]])]
- | Header Int Attr [Inline]
- | HorizontalRule
- | Table Attr Caption [ColSpec] TableHead [TableBody] TableFoot
- | Figure Attr Caption [Block]
- | Div Attr [Block]
- data Citation = Citation {
- citationId :: Text
- citationPrefix :: [Inline]
- citationSuffix :: [Inline]
- citationMode :: CitationMode
- citationNoteNum :: Int
- citationHash :: Int
- data Row = Row Attr [Cell]
- data MetaValue
- = MetaMap (Map Text MetaValue)
- | MetaList [MetaValue]
- | MetaBool Bool
- | MetaString Text
- | MetaInlines [Inline]
- | MetaBlocks [Block]
- data ListNumberDelim
- data ListNumberStyle
- nullMeta :: Meta
- newtype Meta = Meta {}
- data Caption = Caption (Maybe ShortCaption) [Block]
- data TableHead = TableHead Attr [Row]
- data TableBody = TableBody Attr RowHeadColumns [Row] [Row]
- data TableFoot = TableFoot Attr [Row]
- data Cell = Cell Attr Alignment RowSpan ColSpan [Block]
- type ListAttributes = (Int, ListNumberStyle, ListNumberDelim)
- type Target = (Text, Text)
- data Alignment
- type ColSpec = (Alignment, ColWidth)
- newtype RowSpan = RowSpan Int
- newtype ColSpan = ColSpan Int
- data ColWidth
- = ColWidth Double
- | ColWidthDefault
- data CitationMode
- data MathType
- data QuoteType
- newtype RowHeadColumns = RowHeadColumns Int
- type ShortCaption = [Inline]
- pattern SimpleFigure :: Attr -> [Inline] -> Target -> Block
- docAuthors :: Meta -> [[Inline]]
- docDate :: Meta -> [Inline]
- docTitle :: Meta -> [Inline]
- isNullMeta :: Meta -> Bool
- lookupMeta :: Text -> Meta -> Maybe MetaValue
- nullAttr :: Attr
- pandocTypesVersion :: Version
- 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
- module Text.Pandoc.Options
- module Text.Pandoc.Logging
- module Text.Pandoc.Class
- module Text.Pandoc.Data
- module Text.Pandoc.Error
- module Text.Pandoc.Readers
- module Text.Pandoc.Writers
- module Text.Pandoc.Templates
- setTranslations :: PandocMonad m => Lang -> m ()
- translateTerm :: PandocMonad m => Term -> m Text
- pandocVersion :: Version
- pandocVersionText :: Text
Definitions
Instances
FromJSON Pandoc | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser Pandoc parseJSONList :: Value -> Parser [Pandoc] omittedField :: Maybe Pandoc | |||||
ToJSON Pandoc | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: Pandoc -> Encoding toJSONList :: [Pandoc] -> Value toEncodingList :: [Pandoc] -> Encoding | |||||
NFData Pandoc | |||||
Defined in Text.Pandoc.Definition | |||||
Monoid Pandoc | |||||
Semigroup Pandoc | |||||
Data Pandoc | |||||
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 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 | |||||
Generic Pandoc | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read Pandoc | |||||
Defined in Text.Pandoc.Definition | |||||
Show Pandoc | |||||
Eq Pandoc | |||||
Ord Pandoc | |||||
HasMeta Pandoc | |||||
Defined in Text.Pandoc.Builder | |||||
Walkable Block Pandoc | |||||
Walkable Inline Pandoc | |||||
Walkable Meta Pandoc | |||||
Walkable MetaValue Pandoc | |||||
Walkable Pandoc Pandoc | |||||
Walkable [Block] Pandoc | |||||
Walkable [Inline] Pandoc | |||||
type Rep Pandoc | |||||
Defined in Text.Pandoc.Definition type Rep Pandoc = D1 ('MetaData "Pandoc" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" '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]))) |
Constructors
Str Text | |
Emph [Inline] | |
Underline [Inline] | |
Strong [Inline] | |
Strikeout [Inline] | |
Superscript [Inline] | |
Subscript [Inline] | |
SmallCaps [Inline] | |
Quoted QuoteType [Inline] | |
Cite [Citation] [Inline] | |
Code Attr Text | |
Space | |
SoftBreak | |
LineBreak | |
Math MathType Text | |
RawInline Format Text | |
Link Attr [Inline] Target | |
Image Attr [Inline] Target | |
Note [Block] | |
Span Attr [Inline] |
Instances
FromJSON Inline | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser Inline parseJSONList :: Value -> Parser [Inline] omittedField :: Maybe Inline | |||||
ToJSON Inline | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: Inline -> Encoding toJSONList :: [Inline] -> Value toEncodingList :: [Inline] -> Encoding | |||||
NFData Inline | |||||
Defined in Text.Pandoc.Definition | |||||
Monoid Inlines | |||||
Defined in Text.Pandoc.Builder | |||||
Semigroup Inlines | |||||
Defined in Text.Pandoc.Builder | |||||
Data Inline | |||||
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 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 | |||||
Defined in Text.Pandoc.Builder Methods fromString :: String -> Inlines | |||||
Generic Inline | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read Inline | |||||
Defined in Text.Pandoc.Definition | |||||
Show Inline | |||||
Eq Inline | |||||
Ord Inline | |||||
ToMetaValue Inlines | |||||
Defined in Text.Pandoc.Builder Methods toMetaValue :: Inlines -> MetaValue | |||||
Walkable Block Inline | |||||
Walkable Inline Chunk | |||||
Walkable Inline ChunkedDoc | |||||
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 | |||||
Walkable Inline Block | |||||
Walkable Inline Caption | |||||
Walkable Inline Cell | |||||
Walkable Inline Citation | |||||
Walkable Inline Inline | |||||
Walkable Inline Meta | |||||
Walkable Inline MetaValue | |||||
Walkable Inline Pandoc | |||||
Walkable Inline Row | |||||
Walkable Inline TableBody | |||||
Walkable Inline TableFoot | |||||
Walkable Inline TableHead | |||||
Walkable [Block] Inline | |||||
Walkable [Inline] Block | |||||
Walkable [Inline] Caption | |||||
Walkable [Inline] Cell | |||||
Walkable [Inline] Citation | |||||
Walkable [Inline] Inline | |||||
Walkable [Inline] Meta | |||||
Walkable [Inline] MetaValue | |||||
Walkable [Inline] Pandoc | |||||
Walkable [Inline] Row | |||||
Walkable [Inline] TableBody | |||||
Walkable [Inline] TableFoot | |||||
Walkable [Inline] TableHead | |||||
Walkable [Inline] [Inline] | |||||
HasAttributes (Cm a Inlines) | |||||
Defined in Commonmark.Pandoc Methods addAttributes :: Attributes -> Cm a Inlines -> Cm a Inlines | |||||
Rangeable (Cm b Inlines) => IsInline (Cm b Inlines) | |||||
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) | |||||
Defined in Commonmark.Pandoc Methods ranged :: SourceRange -> Cm SourceRange Inlines -> Cm SourceRange Inlines | |||||
Rangeable (Cm () Inlines) | |||||
Defined in Commonmark.Pandoc Methods ranged :: SourceRange -> Cm () Inlines -> Cm () Inlines | |||||
Rangeable (Cm a Inlines) => HasSpan (Cm a Inlines) | |||||
Defined in Commonmark.Pandoc Methods spanWith :: Attributes -> Cm a Inlines -> Cm a Inlines | |||||
HasEmoji (Cm b Inlines) | |||||
Defined in Commonmark.Pandoc Methods emoji :: Text -> Text -> Cm b Inlines | |||||
HasMath (Cm b Inlines) | |||||
Defined in Commonmark.Pandoc | |||||
Rangeable (Cm b Inlines) => HasQuoted (Cm b Inlines) | |||||
Defined in Commonmark.Pandoc | |||||
HasStrikethrough (Cm a Inlines) | |||||
Defined in Commonmark.Pandoc Methods strikethrough :: Cm a Inlines -> Cm a Inlines | |||||
HasSubscript (Cm a Inlines) | |||||
Defined in Commonmark.Pandoc Methods subscript :: Cm a Inlines -> Cm a Inlines | |||||
HasSuperscript (Cm a Inlines) | |||||
Defined in Commonmark.Pandoc Methods superscript :: Cm a Inlines -> Cm a Inlines | |||||
HasWikilinks (Cm b Inlines) | |||||
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) | |||||
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) | |||||
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) | |||||
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) | |||||
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) | |||||
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) | |||||
Defined in Commonmark.Pandoc Methods taskList :: ListType -> ListSpacing -> [(Bool, Cm a Blocks)] -> Cm a Blocks | |||||
type Rep Inline | |||||
Defined in Text.Pandoc.Definition type Rep Inline = D1 ('MetaData "Inline" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" '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]))))))) |
Constructors
Format Text |
Instances
FromJSON Format | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser Format parseJSONList :: Value -> Parser [Format] omittedField :: Maybe Format | |||||
ToJSON Format | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: Format -> Encoding toJSONList :: [Format] -> Value toEncodingList :: [Format] -> Encoding | |||||
NFData Format | |||||
Defined in Text.Pandoc.Definition | |||||
Data Format | |||||
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 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 | |||||
Defined in Text.Pandoc.Definition Methods fromString :: String -> Format | |||||
Generic Format | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read Format | |||||
Defined in Text.Pandoc.Definition | |||||
Show Format | |||||
Eq Format | |||||
Ord Format | |||||
(ToJSONFilter m a, MonadIO m) => ToJSONFilter m (Maybe Format -> a) | |||||
Defined in Text.Pandoc.JSON Methods toJSONFilter :: (Maybe Format -> a) -> m () | |||||
type Rep Format | |||||
Defined in Text.Pandoc.Definition type Rep Format = D1 ('MetaData "Format" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" 'True) (C1 ('MetaCons "Format" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))) |
Constructors
Plain [Inline] | |
Para [Inline] | |
LineBlock [[Inline]] | |
CodeBlock Attr Text | |
RawBlock Format Text | |
BlockQuote [Block] | |
OrderedList ListAttributes [[Block]] | |
BulletList [[Block]] | |
DefinitionList [([Inline], [[Block]])] | |
Header Int Attr [Inline] | |
HorizontalRule | |
Table Attr Caption [ColSpec] TableHead [TableBody] TableFoot | |
Figure Attr Caption [Block] | |
Div Attr [Block] |
Instances
FromJSON Block | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser Block parseJSONList :: Value -> Parser [Block] omittedField :: Maybe Block | |||||
ToJSON Block | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: Block -> Encoding toJSONList :: [Block] -> Value toEncodingList :: [Block] -> Encoding | |||||
NFData Block | |||||
Defined in Text.Pandoc.Definition | |||||
Monoid Blocks | |||||
Defined in Text.Pandoc.Builder | |||||
Semigroup Blocks | |||||
Defined in Text.Pandoc.Builder | |||||
Data Block | |||||
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 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 | |||||
Generic Block | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read Block | |||||
Defined in Text.Pandoc.Definition | |||||
Show Block | |||||
Eq Block | |||||
Ord Block | |||||
ToMetaValue Blocks | |||||
Defined in Text.Pandoc.Builder Methods toMetaValue :: Blocks -> MetaValue | |||||
Walkable Block Chunk | |||||
Walkable Block ChunkedDoc | |||||
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 | |||||
Walkable Block Caption | |||||
Walkable Block Cell | |||||
Walkable Block Citation | |||||
Walkable Block Inline | |||||
Walkable Block Meta | |||||
Walkable Block MetaValue | |||||
Walkable Block Pandoc | |||||
Walkable Block Row | |||||
Walkable Block TableBody | |||||
Walkable Block TableFoot | |||||
Walkable Block TableHead | |||||
Walkable Inline Block | |||||
Walkable [Block] Block | |||||
Walkable [Block] Caption | |||||
Walkable [Block] Cell | |||||
Walkable [Block] Citation | |||||
Walkable [Block] Inline | |||||
Walkable [Block] Meta | |||||
Walkable [Block] MetaValue | |||||
Walkable [Block] Pandoc | |||||
Walkable [Block] Row | |||||
Walkable [Block] TableBody | |||||
Walkable [Block] TableFoot | |||||
Walkable [Block] TableHead | |||||
Walkable [Inline] Block | |||||
Walkable [Block] [Block] | |||||
HasAttributes (Cm a Blocks) | |||||
Defined in Commonmark.Pandoc Methods addAttributes :: Attributes -> Cm a Blocks -> Cm a Blocks | |||||
Rangeable (Cm SourceRange Blocks) | |||||
Defined in Commonmark.Pandoc Methods ranged :: SourceRange -> Cm SourceRange Blocks -> Cm SourceRange Blocks | |||||
Rangeable (Cm () Blocks) | |||||
Defined in Commonmark.Pandoc Methods ranged :: SourceRange -> Cm () Blocks -> Cm () Blocks | |||||
Rangeable (Cm a Blocks) => HasDiv (Cm a Blocks) | |||||
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) | |||||
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) | |||||
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) | |||||
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) | |||||
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) | |||||
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) | |||||
Defined in Commonmark.Pandoc Methods taskList :: ListType -> ListSpacing -> [(Bool, Cm a Blocks)] -> Cm a Blocks | |||||
type Rep Block | |||||
Defined in Text.Pandoc.Definition type Rep Block = D1 ('MetaData "Block" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" '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])))))) |
Constructors
Citation | |
Fields
|
Instances
FromJSON Citation | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser Citation parseJSONList :: Value -> Parser [Citation] omittedField :: Maybe Citation | |||||
ToJSON Citation | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: Citation -> Encoding toJSONList :: [Citation] -> Value toEncodingList :: [Citation] -> Encoding | |||||
NFData Citation | |||||
Defined in Text.Pandoc.Definition | |||||
Data Citation | |||||
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 | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read Citation | |||||
Defined in Text.Pandoc.Definition | |||||
Show Citation | |||||
Eq Citation | |||||
Ord Citation | |||||
Defined in Text.Pandoc.Definition | |||||
Walkable Block Citation | |||||
Walkable Inline Citation | |||||
Walkable [Block] Citation | |||||
Walkable [Inline] Citation | |||||
type Rep Citation | |||||
Defined in Text.Pandoc.Definition type Rep Citation = D1 ('MetaData "Citation" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" '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))))) |
Instances
FromJSON Row | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser Row parseJSONList :: Value -> Parser [Row] omittedField :: Maybe Row | |||||
ToJSON Row | |||||
Defined in Text.Pandoc.Definition | |||||
NFData Row | |||||
Defined in Text.Pandoc.Definition | |||||
Data Row | |||||
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 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 | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read Row | |||||
Defined in Text.Pandoc.Definition | |||||
Show Row | |||||
Eq Row | |||||
Ord Row | |||||
Walkable Block Row | |||||
Walkable Inline Row | |||||
Walkable [Block] Row | |||||
Walkable [Inline] Row | |||||
type Rep Row | |||||
Defined in Text.Pandoc.Definition type Rep Row = D1 ('MetaData "Row" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" '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]))) |
Constructors
MetaMap (Map Text MetaValue) | |
MetaList [MetaValue] | |
MetaBool Bool | |
MetaString Text | |
MetaInlines [Inline] | |
MetaBlocks [Block] |
Instances
FromJSON MetaValue | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser MetaValue parseJSONList :: Value -> Parser [MetaValue] omittedField :: Maybe MetaValue | |||||
ToJSON MetaValue | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: MetaValue -> Encoding toJSONList :: [MetaValue] -> Value toEncodingList :: [MetaValue] -> Encoding | |||||
NFData MetaValue | |||||
Defined in Text.Pandoc.Definition | |||||
Data MetaValue | |||||
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 | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read MetaValue | |||||
Defined in Text.Pandoc.Definition | |||||
Show MetaValue | |||||
Eq MetaValue | |||||
Ord MetaValue | |||||
Defined in Text.Pandoc.Definition | |||||
ToMetaValue MetaValue | |||||
Defined in Text.Pandoc.Builder Methods toMetaValue :: MetaValue -> MetaValue | |||||
Walkable Block MetaValue | |||||
Walkable Inline MetaValue | |||||
Walkable MetaValue Meta | |||||
Walkable MetaValue MetaValue | |||||
Walkable MetaValue Pandoc | |||||
Walkable [Block] MetaValue | |||||
Walkable [Inline] MetaValue | |||||
type Rep MetaValue | |||||
Defined in Text.Pandoc.Definition type Rep MetaValue = D1 ('MetaData "MetaValue" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" '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 #
Constructors
DefaultDelim | |
Period | |
OneParen | |
TwoParens |
Instances
FromJSON ListNumberDelim | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser ListNumberDelim parseJSONList :: Value -> Parser [ListNumberDelim] omittedField :: Maybe ListNumberDelim | |||||
ToJSON ListNumberDelim | |||||
Defined in Text.Pandoc.Definition Methods toJSON :: ListNumberDelim -> Value toEncoding :: ListNumberDelim -> Encoding toJSONList :: [ListNumberDelim] -> Value toEncodingList :: [ListNumberDelim] -> Encoding omitField :: ListNumberDelim -> Bool | |||||
NFData ListNumberDelim | |||||
Defined in Text.Pandoc.Definition Methods rnf :: ListNumberDelim -> () | |||||
Data ListNumberDelim | |||||
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 | |||||
Defined in Text.Pandoc.Definition Associated Types
Methods from :: ListNumberDelim -> Rep ListNumberDelim x to :: Rep ListNumberDelim x -> ListNumberDelim | |||||
Read ListNumberDelim | |||||
Defined in Text.Pandoc.Definition Methods readsPrec :: Int -> ReadS ListNumberDelim readList :: ReadS [ListNumberDelim] readPrec :: ReadPrec ListNumberDelim readListPrec :: ReadPrec [ListNumberDelim] | |||||
Show ListNumberDelim | |||||
Defined in Text.Pandoc.Definition Methods showsPrec :: Int -> ListNumberDelim -> ShowS show :: ListNumberDelim -> String showList :: [ListNumberDelim] -> ShowS | |||||
Eq ListNumberDelim | |||||
Defined in Text.Pandoc.Definition Methods (==) :: ListNumberDelim -> ListNumberDelim -> Bool (/=) :: ListNumberDelim -> ListNumberDelim -> Bool | |||||
Ord ListNumberDelim | |||||
Defined in Text.Pandoc.Definition Methods compare :: ListNumberDelim -> ListNumberDelim -> Ordering (<) :: ListNumberDelim -> ListNumberDelim -> Bool (<=) :: ListNumberDelim -> ListNumberDelim -> Bool (>) :: ListNumberDelim -> ListNumberDelim -> Bool (>=) :: ListNumberDelim -> ListNumberDelim -> Bool max :: ListNumberDelim -> ListNumberDelim -> ListNumberDelim min :: ListNumberDelim -> ListNumberDelim -> ListNumberDelim | |||||
type Rep ListNumberDelim | |||||
Defined in Text.Pandoc.Definition type Rep ListNumberDelim = D1 ('MetaData "ListNumberDelim" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" '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 #
Constructors
DefaultStyle | |
Example | |
Decimal | |
LowerRoman | |
UpperRoman | |
LowerAlpha | |
UpperAlpha |
Instances
FromJSON ListNumberStyle | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser ListNumberStyle parseJSONList :: Value -> Parser [ListNumberStyle] omittedField :: Maybe ListNumberStyle | |||||
ToJSON ListNumberStyle | |||||
Defined in Text.Pandoc.Definition Methods toJSON :: ListNumberStyle -> Value toEncoding :: ListNumberStyle -> Encoding toJSONList :: [ListNumberStyle] -> Value toEncodingList :: [ListNumberStyle] -> Encoding omitField :: ListNumberStyle -> Bool | |||||
NFData ListNumberStyle | |||||
Defined in Text.Pandoc.Definition Methods rnf :: ListNumberStyle -> () | |||||
Data ListNumberStyle | |||||
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 | |||||
Defined in Text.Pandoc.Definition Associated Types
Methods from :: ListNumberStyle -> Rep ListNumberStyle x to :: Rep ListNumberStyle x -> ListNumberStyle | |||||
Read ListNumberStyle | |||||
Defined in Text.Pandoc.Definition Methods readsPrec :: Int -> ReadS ListNumberStyle readList :: ReadS [ListNumberStyle] readPrec :: ReadPrec ListNumberStyle readListPrec :: ReadPrec [ListNumberStyle] | |||||
Show ListNumberStyle | |||||
Defined in Text.Pandoc.Definition Methods showsPrec :: Int -> ListNumberStyle -> ShowS show :: ListNumberStyle -> String showList :: [ListNumberStyle] -> ShowS | |||||
Eq ListNumberStyle | |||||
Defined in Text.Pandoc.Definition Methods (==) :: ListNumberStyle -> ListNumberStyle -> Bool (/=) :: ListNumberStyle -> ListNumberStyle -> Bool | |||||
Ord ListNumberStyle | |||||
Defined in Text.Pandoc.Definition Methods compare :: ListNumberStyle -> ListNumberStyle -> Ordering (<) :: ListNumberStyle -> ListNumberStyle -> Bool (<=) :: ListNumberStyle -> ListNumberStyle -> Bool (>) :: ListNumberStyle -> ListNumberStyle -> Bool (>=) :: ListNumberStyle -> ListNumberStyle -> Bool max :: ListNumberStyle -> ListNumberStyle -> ListNumberStyle min :: ListNumberStyle -> ListNumberStyle -> ListNumberStyle | |||||
type Rep ListNumberStyle | |||||
Defined in Text.Pandoc.Definition type Rep ListNumberStyle = D1 ('MetaData "ListNumberStyle" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" '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)))) |
Instances
FromJSON Meta | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser Meta parseJSONList :: Value -> Parser [Meta] omittedField :: Maybe Meta | |||||
ToJSON Meta | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: Meta -> Encoding toJSONList :: [Meta] -> Value toEncodingList :: [Meta] -> Encoding | |||||
NFData Meta | |||||
Defined in Text.Pandoc.Definition | |||||
Monoid Meta | |||||
Semigroup Meta | |||||
Data Meta | |||||
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 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 | |||||
Generic Meta | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read Meta | |||||
Defined in Text.Pandoc.Definition | |||||
Show Meta | |||||
Eq Meta | |||||
Ord Meta | |||||
HasMeta Meta | |||||
Defined in Text.Pandoc.Builder | |||||
Walkable Block Meta | |||||
Walkable Inline Meta | |||||
Walkable Meta Meta | |||||
Walkable Meta Pandoc | |||||
Walkable MetaValue Meta | |||||
Walkable [Block] Meta | |||||
Walkable [Inline] Meta | |||||
type Rep Meta | |||||
Defined in Text.Pandoc.Definition |
Constructors
Caption (Maybe ShortCaption) [Block] |
Instances
FromJSON Caption | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser Caption parseJSONList :: Value -> Parser [Caption] omittedField :: Maybe Caption | |||||
ToJSON Caption | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: Caption -> Encoding toJSONList :: [Caption] -> Value toEncodingList :: [Caption] -> Encoding | |||||
NFData Caption | |||||
Defined in Text.Pandoc.Definition | |||||
Data Caption | |||||
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 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 | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read Caption | |||||
Defined in Text.Pandoc.Definition | |||||
Show Caption | |||||
Eq Caption | |||||
Ord Caption | |||||
Walkable Block Caption | |||||
Walkable Inline Caption | |||||
Walkable [Block] Caption | |||||
Walkable [Inline] Caption | |||||
type Rep Caption | |||||
Defined in Text.Pandoc.Definition type Rep Caption = D1 ('MetaData "Caption" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" '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]))) |
Instances
FromJSON TableHead | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser TableHead parseJSONList :: Value -> Parser [TableHead] omittedField :: Maybe TableHead | |||||
ToJSON TableHead | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: TableHead -> Encoding toJSONList :: [TableHead] -> Value toEncodingList :: [TableHead] -> Encoding | |||||
NFData TableHead | |||||
Defined in Text.Pandoc.Definition | |||||
Data TableHead | |||||
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 | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read TableHead | |||||
Defined in Text.Pandoc.Definition | |||||
Show TableHead | |||||
Eq TableHead | |||||
Ord TableHead | |||||
Defined in Text.Pandoc.Definition | |||||
Walkable Block TableHead | |||||
Walkable Inline TableHead | |||||
Walkable [Block] TableHead | |||||
Walkable [Inline] TableHead | |||||
type Rep TableHead | |||||
Defined in Text.Pandoc.Definition type Rep TableHead = D1 ('MetaData "TableHead" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" '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]))) |
Constructors
TableBody Attr RowHeadColumns [Row] [Row] |
Instances
FromJSON TableBody | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser TableBody parseJSONList :: Value -> Parser [TableBody] omittedField :: Maybe TableBody | |||||
ToJSON TableBody | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: TableBody -> Encoding toJSONList :: [TableBody] -> Value toEncodingList :: [TableBody] -> Encoding | |||||
NFData TableBody | |||||
Defined in Text.Pandoc.Definition | |||||
Data TableBody | |||||
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 | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read TableBody | |||||
Defined in Text.Pandoc.Definition | |||||
Show TableBody | |||||
Eq TableBody | |||||
Ord TableBody | |||||
Defined in Text.Pandoc.Definition | |||||
Walkable Block TableBody | |||||
Walkable Inline TableBody | |||||
Walkable [Block] TableBody | |||||
Walkable [Inline] TableBody | |||||
type Rep TableBody | |||||
Defined in Text.Pandoc.Definition type Rep TableBody = D1 ('MetaData "TableBody" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" '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])))) |
Instances
FromJSON TableFoot | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser TableFoot parseJSONList :: Value -> Parser [TableFoot] omittedField :: Maybe TableFoot | |||||
ToJSON TableFoot | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: TableFoot -> Encoding toJSONList :: [TableFoot] -> Value toEncodingList :: [TableFoot] -> Encoding | |||||
NFData TableFoot | |||||
Defined in Text.Pandoc.Definition | |||||
Data TableFoot | |||||
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 | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read TableFoot | |||||
Defined in Text.Pandoc.Definition | |||||
Show TableFoot | |||||
Eq TableFoot | |||||
Ord TableFoot | |||||
Defined in Text.Pandoc.Definition | |||||
Walkable Block TableFoot | |||||
Walkable Inline TableFoot | |||||
Walkable [Block] TableFoot | |||||
Walkable [Inline] TableFoot | |||||
type Rep TableFoot | |||||
Defined in Text.Pandoc.Definition type Rep TableFoot = D1 ('MetaData "TableFoot" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" '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]))) |
Instances
FromJSON Cell | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser Cell parseJSONList :: Value -> Parser [Cell] omittedField :: Maybe Cell | |||||
ToJSON Cell | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: Cell -> Encoding toJSONList :: [Cell] -> Value toEncodingList :: [Cell] -> Encoding | |||||
NFData Cell | |||||
Defined in Text.Pandoc.Definition | |||||
Data Cell | |||||
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 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 | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read Cell | |||||
Defined in Text.Pandoc.Definition | |||||
Show Cell | |||||
Eq Cell | |||||
Ord Cell | |||||
Walkable Block Cell | |||||
Walkable Inline Cell | |||||
Walkable [Block] Cell | |||||
Walkable [Inline] Cell | |||||
type Rep Cell | |||||
Defined in Text.Pandoc.Definition type Rep Cell = D1 ('MetaData "Cell" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" '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]))))) |
type ListAttributes = (Int, ListNumberStyle, ListNumberDelim) #
Constructors
AlignLeft | |
AlignRight | |
AlignCenter | |
AlignDefault |
Instances
FromJSON Alignment | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser Alignment parseJSONList :: Value -> Parser [Alignment] omittedField :: Maybe Alignment | |||||
ToJSON Alignment | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: Alignment -> Encoding toJSONList :: [Alignment] -> Value toEncodingList :: [Alignment] -> Encoding | |||||
NFData Alignment | |||||
Defined in Text.Pandoc.Definition | |||||
Data Alignment | |||||
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 | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read Alignment | |||||
Defined in Text.Pandoc.Definition | |||||
Show Alignment | |||||
Eq Alignment | |||||
Ord Alignment | |||||
Defined in Text.Pandoc.Definition | |||||
type Rep Alignment | |||||
Defined in Text.Pandoc.Definition type Rep Alignment = D1 ('MetaData "Alignment" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" '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))) |
Constructors
RowSpan Int |
Instances
FromJSON RowSpan | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser RowSpan parseJSONList :: Value -> Parser [RowSpan] omittedField :: Maybe RowSpan | |||||
ToJSON RowSpan | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: RowSpan -> Encoding toJSONList :: [RowSpan] -> Value toEncodingList :: [RowSpan] -> Encoding | |||||
NFData RowSpan | |||||
Defined in Text.Pandoc.Definition | |||||
Data RowSpan | |||||
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 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 | |||||
Defined in Text.Pandoc.Definition | |||||
Generic RowSpan | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Num RowSpan | |||||
Read RowSpan | |||||
Defined in Text.Pandoc.Definition | |||||
Show RowSpan | |||||
Eq RowSpan | |||||
Ord RowSpan | |||||
type Rep RowSpan | |||||
Defined in Text.Pandoc.Definition type Rep RowSpan = D1 ('MetaData "RowSpan" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" 'True) (C1 ('MetaCons "RowSpan" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) |
Constructors
ColSpan Int |
Instances
FromJSON ColSpan | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser ColSpan parseJSONList :: Value -> Parser [ColSpan] omittedField :: Maybe ColSpan | |||||
ToJSON ColSpan | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: ColSpan -> Encoding toJSONList :: [ColSpan] -> Value toEncodingList :: [ColSpan] -> Encoding | |||||
NFData ColSpan | |||||
Defined in Text.Pandoc.Definition | |||||
Data ColSpan | |||||
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 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 | |||||
Defined in Text.Pandoc.Definition | |||||
Generic ColSpan | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Num ColSpan | |||||
Read ColSpan | |||||
Defined in Text.Pandoc.Definition | |||||
Show ColSpan | |||||
Eq ColSpan | |||||
Ord ColSpan | |||||
type Rep ColSpan | |||||
Defined in Text.Pandoc.Definition type Rep ColSpan = D1 ('MetaData "ColSpan" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" 'True) (C1 ('MetaCons "ColSpan" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) |
Constructors
ColWidth Double | |
ColWidthDefault |
Instances
FromJSON ColWidth | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser ColWidth parseJSONList :: Value -> Parser [ColWidth] omittedField :: Maybe ColWidth | |||||
ToJSON ColWidth | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: ColWidth -> Encoding toJSONList :: [ColWidth] -> Value toEncodingList :: [ColWidth] -> Encoding | |||||
NFData ColWidth | |||||
Defined in Text.Pandoc.Definition | |||||
Data ColWidth | |||||
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 | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read ColWidth | |||||
Defined in Text.Pandoc.Definition | |||||
Show ColWidth | |||||
Eq ColWidth | |||||
Ord ColWidth | |||||
Defined in Text.Pandoc.Definition | |||||
type Rep ColWidth | |||||
Defined in Text.Pandoc.Definition type Rep ColWidth = D1 ('MetaData "ColWidth" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" '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 #
Constructors
AuthorInText | |
SuppressAuthor | |
NormalCitation |
Instances
FromJSON CitationMode | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser CitationMode parseJSONList :: Value -> Parser [CitationMode] omittedField :: Maybe CitationMode | |||||
ToJSON CitationMode | |||||
Defined in Text.Pandoc.Definition Methods toJSON :: CitationMode -> Value toEncoding :: CitationMode -> Encoding toJSONList :: [CitationMode] -> Value toEncodingList :: [CitationMode] -> Encoding omitField :: CitationMode -> Bool | |||||
NFData CitationMode | |||||
Defined in Text.Pandoc.Definition Methods rnf :: CitationMode -> () | |||||
Data CitationMode | |||||
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 | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read CitationMode | |||||
Defined in Text.Pandoc.Definition Methods readsPrec :: Int -> ReadS CitationMode readList :: ReadS [CitationMode] readPrec :: ReadPrec CitationMode readListPrec :: ReadPrec [CitationMode] | |||||
Show CitationMode | |||||
Defined in Text.Pandoc.Definition Methods showsPrec :: Int -> CitationMode -> ShowS show :: CitationMode -> String showList :: [CitationMode] -> ShowS | |||||
Eq CitationMode | |||||
Defined in Text.Pandoc.Definition | |||||
Ord CitationMode | |||||
Defined in Text.Pandoc.Definition Methods compare :: CitationMode -> CitationMode -> Ordering (<) :: CitationMode -> CitationMode -> Bool (<=) :: CitationMode -> CitationMode -> Bool (>) :: CitationMode -> CitationMode -> Bool (>=) :: CitationMode -> CitationMode -> Bool max :: CitationMode -> CitationMode -> CitationMode min :: CitationMode -> CitationMode -> CitationMode | |||||
type Rep CitationMode | |||||
Defined in Text.Pandoc.Definition type Rep CitationMode = D1 ('MetaData "CitationMode" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" '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))) |
Constructors
DisplayMath | |
InlineMath |
Instances
FromJSON MathType | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser MathType parseJSONList :: Value -> Parser [MathType] omittedField :: Maybe MathType | |||||
ToJSON MathType | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: MathType -> Encoding toJSONList :: [MathType] -> Value toEncodingList :: [MathType] -> Encoding | |||||
NFData MathType | |||||
Defined in Text.Pandoc.Definition | |||||
Data MathType | |||||
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 | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read MathType | |||||
Defined in Text.Pandoc.Definition | |||||
Show MathType | |||||
Eq MathType | |||||
Ord MathType | |||||
Defined in Text.Pandoc.Definition | |||||
type Rep MathType | |||||
Defined in Text.Pandoc.Definition type Rep MathType = D1 ('MetaData "MathType" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" 'False) (C1 ('MetaCons "DisplayMath" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InlineMath" 'PrefixI 'False) (U1 :: Type -> Type)) |
Constructors
SingleQuote | |
DoubleQuote |
Instances
FromJSON QuoteType | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser QuoteType parseJSONList :: Value -> Parser [QuoteType] omittedField :: Maybe QuoteType | |||||
ToJSON QuoteType | |||||
Defined in Text.Pandoc.Definition Methods toEncoding :: QuoteType -> Encoding toJSONList :: [QuoteType] -> Value toEncodingList :: [QuoteType] -> Encoding | |||||
NFData QuoteType | |||||
Defined in Text.Pandoc.Definition | |||||
Data QuoteType | |||||
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 | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Read QuoteType | |||||
Defined in Text.Pandoc.Definition | |||||
Show QuoteType | |||||
Eq QuoteType | |||||
Ord QuoteType | |||||
Defined in Text.Pandoc.Definition | |||||
type Rep QuoteType | |||||
Defined in Text.Pandoc.Definition type Rep QuoteType = D1 ('MetaData "QuoteType" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" 'False) (C1 ('MetaCons "SingleQuote" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DoubleQuote" 'PrefixI 'False) (U1 :: Type -> Type)) |
newtype RowHeadColumns #
Constructors
RowHeadColumns Int |
Instances
FromJSON RowHeadColumns | |||||
Defined in Text.Pandoc.Definition Methods parseJSON :: Value -> Parser RowHeadColumns parseJSONList :: Value -> Parser [RowHeadColumns] omittedField :: Maybe RowHeadColumns | |||||
ToJSON RowHeadColumns | |||||
Defined in Text.Pandoc.Definition Methods toJSON :: RowHeadColumns -> Value toEncoding :: RowHeadColumns -> Encoding toJSONList :: [RowHeadColumns] -> Value toEncodingList :: [RowHeadColumns] -> Encoding omitField :: RowHeadColumns -> Bool | |||||
NFData RowHeadColumns | |||||
Defined in Text.Pandoc.Definition Methods rnf :: RowHeadColumns -> () | |||||
Data RowHeadColumns | |||||
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 | |||||
Defined in Text.Pandoc.Definition Methods succ :: RowHeadColumns -> RowHeadColumns pred :: RowHeadColumns -> RowHeadColumns toEnum :: Int -> RowHeadColumns fromEnum :: RowHeadColumns -> Int enumFrom :: RowHeadColumns -> [RowHeadColumns] enumFromThen :: RowHeadColumns -> RowHeadColumns -> [RowHeadColumns] enumFromTo :: RowHeadColumns -> RowHeadColumns -> [RowHeadColumns] enumFromThenTo :: RowHeadColumns -> RowHeadColumns -> RowHeadColumns -> [RowHeadColumns] | |||||
Generic RowHeadColumns | |||||
Defined in Text.Pandoc.Definition Associated Types
| |||||
Num RowHeadColumns | |||||
Defined in Text.Pandoc.Definition Methods (+) :: RowHeadColumns -> RowHeadColumns -> RowHeadColumns (-) :: RowHeadColumns -> RowHeadColumns -> RowHeadColumns (*) :: RowHeadColumns -> RowHeadColumns -> RowHeadColumns negate :: RowHeadColumns -> RowHeadColumns abs :: RowHeadColumns -> RowHeadColumns signum :: RowHeadColumns -> RowHeadColumns fromInteger :: Integer -> RowHeadColumns | |||||
Read RowHeadColumns | |||||
Defined in Text.Pandoc.Definition Methods readsPrec :: Int -> ReadS RowHeadColumns readList :: ReadS [RowHeadColumns] readPrec :: ReadPrec RowHeadColumns readListPrec :: ReadPrec [RowHeadColumns] | |||||
Show RowHeadColumns | |||||
Defined in Text.Pandoc.Definition Methods showsPrec :: Int -> RowHeadColumns -> ShowS show :: RowHeadColumns -> String showList :: [RowHeadColumns] -> ShowS | |||||
Eq RowHeadColumns | |||||
Defined in Text.Pandoc.Definition Methods (==) :: RowHeadColumns -> RowHeadColumns -> Bool (/=) :: RowHeadColumns -> RowHeadColumns -> Bool | |||||
Ord RowHeadColumns | |||||
Defined in Text.Pandoc.Definition Methods compare :: RowHeadColumns -> RowHeadColumns -> Ordering (<) :: RowHeadColumns -> RowHeadColumns -> Bool (<=) :: RowHeadColumns -> RowHeadColumns -> Bool (>) :: RowHeadColumns -> RowHeadColumns -> Bool (>=) :: RowHeadColumns -> RowHeadColumns -> Bool max :: RowHeadColumns -> RowHeadColumns -> RowHeadColumns min :: RowHeadColumns -> RowHeadColumns -> RowHeadColumns | |||||
type Rep RowHeadColumns | |||||
Defined in Text.Pandoc.Definition type Rep RowHeadColumns = D1 ('MetaData "RowHeadColumns" "Text.Pandoc.Definition" "pandoc-types-1.23.1-1BPu9VQunrP27rDKL5Jy6H" 'True) (C1 ('MetaCons "RowHeadColumns" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) |
type ShortCaption = [Inline] #
docAuthors :: Meta -> [[Inline]] #
isNullMeta :: Meta -> Bool #
lookupMeta :: Text -> Meta -> Maybe MetaValue #
pandocTypesVersion :: Version #
Generics
Options
module Text.Pandoc.Options
Logging
module Text.Pandoc.Logging
Typeclass
module Text.Pandoc.Class
Internal data files
module Text.Pandoc.Data
Error handling
module Text.Pandoc.Error
Readers: converting to Pandoc format
module Text.Pandoc.Readers
Writers: converting from Pandoc format
module Text.Pandoc.Writers
Rendering templates and default templates
module Text.Pandoc.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.