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

Text.Pandoc.Options

Description

Data structures and functions for representing parser and writer options.

Synopsis

Documentation

data ReaderOptions Source #

Constructors

ReaderOptions 

Fields

Instances

Instances details
Data ReaderOptions Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ReaderOptions -> c ReaderOptions Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ReaderOptions Source #

toConstr :: ReaderOptions -> Constr Source #

dataTypeOf :: ReaderOptions -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ReaderOptions) Source #

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

gmapT :: (forall b. Data b => b -> b) -> ReaderOptions -> ReaderOptions Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ReaderOptions -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ReaderOptions -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> ReaderOptions -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ReaderOptions -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ReaderOptions -> m ReaderOptions Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ReaderOptions -> m ReaderOptions Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ReaderOptions -> m ReaderOptions Source #

Read ReaderOptions Source # 
Instance details

Defined in Text.Pandoc.Options

Show ReaderOptions Source # 
Instance details

Defined in Text.Pandoc.Options

Generic ReaderOptions Source # 
Instance details

Defined in Text.Pandoc.Options

Associated Types

type Rep ReaderOptions :: Type -> Type Source #

Default ReaderOptions Source # 
Instance details

Defined in Text.Pandoc.Options

FromJSON ReaderOptions Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

parseJSON :: Value -> Parser ReaderOptions

parseJSONList :: Value -> Parser [ReaderOptions]

ToJSON ReaderOptions Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

toJSON :: ReaderOptions -> Value

toEncoding :: ReaderOptions -> Encoding

toJSONList :: [ReaderOptions] -> Value

toEncodingList :: [ReaderOptions] -> Encoding

Pushable ReaderOptions 
Instance details

Defined in Text.Pandoc.Lua.Marshaling.ReaderOptions

Methods

push :: ReaderOptions -> Lua ()

type Rep ReaderOptions Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep ReaderOptions = D1 ('MetaData "ReaderOptions" "Text.Pandoc.Options" "pandoc-2.9.2.1-DFrBDPMZs4vCNncCgIf8kv" 'False) (C1 ('MetaCons "ReaderOptions" 'PrefixI 'True) (((S1 ('MetaSel ('Just "readerExtensions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Extensions) :*: S1 ('MetaSel ('Just "readerStandalone") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "readerColumns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "readerTabStop") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :*: ((S1 ('MetaSel ('Just "readerIndentedCodeClasses") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Text]) :*: S1 ('MetaSel ('Just "readerAbbreviations") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Set Text))) :*: (S1 ('MetaSel ('Just "readerDefaultImageExtension") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "readerTrackChanges") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TrackChanges) :*: S1 ('MetaSel ('Just "readerStripComments") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))))

data HTMLMathMethod Source #

Instances

Instances details
Eq HTMLMathMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Data HTMLMathMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HTMLMathMethod -> c HTMLMathMethod Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HTMLMathMethod Source #

toConstr :: HTMLMathMethod -> Constr Source #

dataTypeOf :: HTMLMathMethod -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HTMLMathMethod) Source #

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

gmapT :: (forall b. Data b => b -> b) -> HTMLMathMethod -> HTMLMathMethod Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HTMLMathMethod -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HTMLMathMethod -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> HTMLMathMethod -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HTMLMathMethod -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HTMLMathMethod -> m HTMLMathMethod Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HTMLMathMethod -> m HTMLMathMethod Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HTMLMathMethod -> m HTMLMathMethod Source #

Read HTMLMathMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Show HTMLMathMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Generic HTMLMathMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Associated Types

type Rep HTMLMathMethod :: Type -> Type Source #

FromJSON HTMLMathMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

parseJSON :: Value -> Parser HTMLMathMethod

parseJSONList :: Value -> Parser [HTMLMathMethod]

ToJSON HTMLMathMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

toJSON :: HTMLMathMethod -> Value

toEncoding :: HTMLMathMethod -> Encoding

toJSONList :: [HTMLMathMethod] -> Value

toEncodingList :: [HTMLMathMethod] -> Encoding

FromYAML HTMLMathMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

parseYAML :: Node Pos -> Parser HTMLMathMethod

type Rep HTMLMathMethod Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep HTMLMathMethod = D1 ('MetaData "HTMLMathMethod" "Text.Pandoc.Options" "pandoc-2.9.2.1-DFrBDPMZs4vCNncCgIf8kv" 'False) ((C1 ('MetaCons "PlainMath" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "WebTeX" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :+: C1 ('MetaCons "GladTeX" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "MathML" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "MathJax" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :+: C1 ('MetaCons "KaTeX" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))))

data CiteMethod Source #

Constructors

Citeproc 
Natbib 
Biblatex 

Instances

Instances details
Eq CiteMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Data CiteMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CiteMethod -> c CiteMethod Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CiteMethod Source #

toConstr :: CiteMethod -> Constr Source #

dataTypeOf :: CiteMethod -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CiteMethod) Source #

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

gmapT :: (forall b. Data b => b -> b) -> CiteMethod -> CiteMethod Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CiteMethod -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CiteMethod -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> CiteMethod -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CiteMethod -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CiteMethod -> m CiteMethod Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CiteMethod -> m CiteMethod Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CiteMethod -> m CiteMethod Source #

Read CiteMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Show CiteMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Generic CiteMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Associated Types

type Rep CiteMethod :: Type -> Type Source #

FromJSON CiteMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

parseJSON :: Value -> Parser CiteMethod

parseJSONList :: Value -> Parser [CiteMethod]

ToJSON CiteMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

toJSON :: CiteMethod -> Value

toEncoding :: CiteMethod -> Encoding

toJSONList :: [CiteMethod] -> Value

toEncodingList :: [CiteMethod] -> Encoding

FromYAML CiteMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

parseYAML :: Node Pos -> Parser CiteMethod

type Rep CiteMethod Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep CiteMethod = D1 ('MetaData "CiteMethod" "Text.Pandoc.Options" "pandoc-2.9.2.1-DFrBDPMZs4vCNncCgIf8kv" 'False) (C1 ('MetaCons "Citeproc" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Natbib" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Biblatex" 'PrefixI 'False) (U1 :: Type -> Type)))

data ObfuscationMethod Source #

Methods for obfuscating email addresses in HTML.

Instances

Instances details
Eq ObfuscationMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Data ObfuscationMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ObfuscationMethod -> c ObfuscationMethod Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ObfuscationMethod Source #

toConstr :: ObfuscationMethod -> Constr Source #

dataTypeOf :: ObfuscationMethod -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ObfuscationMethod) Source #

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

gmapT :: (forall b. Data b => b -> b) -> ObfuscationMethod -> ObfuscationMethod Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ObfuscationMethod -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ObfuscationMethod -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> ObfuscationMethod -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ObfuscationMethod -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ObfuscationMethod -> m ObfuscationMethod Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ObfuscationMethod -> m ObfuscationMethod Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ObfuscationMethod -> m ObfuscationMethod Source #

Read ObfuscationMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Show ObfuscationMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Generic ObfuscationMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Associated Types

type Rep ObfuscationMethod :: Type -> Type Source #

FromJSON ObfuscationMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

parseJSON :: Value -> Parser ObfuscationMethod

parseJSONList :: Value -> Parser [ObfuscationMethod]

ToJSON ObfuscationMethod Source # 
Instance details

Defined in Text.Pandoc.Options

FromYAML ObfuscationMethod Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

parseYAML :: Node Pos -> Parser ObfuscationMethod

type Rep ObfuscationMethod Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep ObfuscationMethod = D1 ('MetaData "ObfuscationMethod" "Text.Pandoc.Options" "pandoc-2.9.2.1-DFrBDPMZs4vCNncCgIf8kv" 'False) (C1 ('MetaCons "NoObfuscation" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ReferenceObfuscation" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "JavascriptObfuscation" 'PrefixI 'False) (U1 :: Type -> Type)))

data HTMLSlideVariant Source #

Varieties of HTML slide shows.

Instances

Instances details
Eq HTMLSlideVariant Source # 
Instance details

Defined in Text.Pandoc.Options

Data HTMLSlideVariant Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HTMLSlideVariant -> c HTMLSlideVariant Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HTMLSlideVariant Source #

toConstr :: HTMLSlideVariant -> Constr Source #

dataTypeOf :: HTMLSlideVariant -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HTMLSlideVariant) Source #

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

gmapT :: (forall b. Data b => b -> b) -> HTMLSlideVariant -> HTMLSlideVariant Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HTMLSlideVariant -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HTMLSlideVariant -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> HTMLSlideVariant -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HTMLSlideVariant -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HTMLSlideVariant -> m HTMLSlideVariant Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HTMLSlideVariant -> m HTMLSlideVariant Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HTMLSlideVariant -> m HTMLSlideVariant Source #

Read HTMLSlideVariant Source # 
Instance details

Defined in Text.Pandoc.Options

Show HTMLSlideVariant Source # 
Instance details

Defined in Text.Pandoc.Options

Generic HTMLSlideVariant Source # 
Instance details

Defined in Text.Pandoc.Options

Associated Types

type Rep HTMLSlideVariant :: Type -> Type Source #

FromJSON HTMLSlideVariant Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

parseJSON :: Value -> Parser HTMLSlideVariant

parseJSONList :: Value -> Parser [HTMLSlideVariant]

ToJSON HTMLSlideVariant Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep HTMLSlideVariant Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep HTMLSlideVariant = D1 ('MetaData "HTMLSlideVariant" "Text.Pandoc.Options" "pandoc-2.9.2.1-DFrBDPMZs4vCNncCgIf8kv" 'False) ((C1 ('MetaCons "S5Slides" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SlidySlides" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SlideousSlides" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "DZSlides" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "RevealJsSlides" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NoSlides" 'PrefixI 'False) (U1 :: Type -> Type))))

data EPUBVersion Source #

Constructors

EPUB2 
EPUB3 

Instances

Instances details
Eq EPUBVersion Source # 
Instance details

Defined in Text.Pandoc.Options

Data EPUBVersion Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EPUBVersion -> c EPUBVersion Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EPUBVersion Source #

toConstr :: EPUBVersion -> Constr Source #

dataTypeOf :: EPUBVersion -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EPUBVersion) Source #

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

gmapT :: (forall b. Data b => b -> b) -> EPUBVersion -> EPUBVersion Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EPUBVersion -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EPUBVersion -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> EPUBVersion -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EPUBVersion -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EPUBVersion -> m EPUBVersion Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EPUBVersion -> m EPUBVersion Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EPUBVersion -> m EPUBVersion Source #

Read EPUBVersion Source # 
Instance details

Defined in Text.Pandoc.Options

Show EPUBVersion Source # 
Instance details

Defined in Text.Pandoc.Options

Generic EPUBVersion Source # 
Instance details

Defined in Text.Pandoc.Options

Associated Types

type Rep EPUBVersion :: Type -> Type Source #

type Rep EPUBVersion Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep EPUBVersion = D1 ('MetaData "EPUBVersion" "Text.Pandoc.Options" "pandoc-2.9.2.1-DFrBDPMZs4vCNncCgIf8kv" 'False) (C1 ('MetaCons "EPUB2" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "EPUB3" 'PrefixI 'False) (U1 :: Type -> Type))

data WrapOption Source #

Options for wrapping text in the output.

Constructors

WrapAuto

Automatically wrap to width

WrapNone

No non-semantic newlines

WrapPreserve

Preserve wrapping of input source

Instances

Instances details
Eq WrapOption Source # 
Instance details

Defined in Text.Pandoc.Options

Data WrapOption Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WrapOption -> c WrapOption Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WrapOption Source #

toConstr :: WrapOption -> Constr Source #

dataTypeOf :: WrapOption -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WrapOption) Source #

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

gmapT :: (forall b. Data b => b -> b) -> WrapOption -> WrapOption Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrapOption -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrapOption -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> WrapOption -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WrapOption -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WrapOption -> m WrapOption Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WrapOption -> m WrapOption Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WrapOption -> m WrapOption Source #

Read WrapOption Source # 
Instance details

Defined in Text.Pandoc.Options

Show WrapOption Source # 
Instance details

Defined in Text.Pandoc.Options

Generic WrapOption Source # 
Instance details

Defined in Text.Pandoc.Options

Associated Types

type Rep WrapOption :: Type -> Type Source #

FromJSON WrapOption Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

parseJSON :: Value -> Parser WrapOption

parseJSONList :: Value -> Parser [WrapOption]

ToJSON WrapOption Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

toJSON :: WrapOption -> Value

toEncoding :: WrapOption -> Encoding

toJSONList :: [WrapOption] -> Value

toEncodingList :: [WrapOption] -> Encoding

FromYAML WrapOption Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

parseYAML :: Node Pos -> Parser WrapOption

type Rep WrapOption Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep WrapOption = D1 ('MetaData "WrapOption" "Text.Pandoc.Options" "pandoc-2.9.2.1-DFrBDPMZs4vCNncCgIf8kv" 'False) (C1 ('MetaCons "WrapAuto" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "WrapNone" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "WrapPreserve" 'PrefixI 'False) (U1 :: Type -> Type)))

data TopLevelDivision Source #

Options defining the type of top-level headers.

Constructors

TopLevelPart

Top-level headers become parts

TopLevelChapter

Top-level headers become chapters

TopLevelSection

Top-level headers become sections

TopLevelDefault

Top-level type is determined via heuristics

Instances

Instances details
Eq TopLevelDivision Source # 
Instance details

Defined in Text.Pandoc.Options

Data TopLevelDivision Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TopLevelDivision -> c TopLevelDivision Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TopLevelDivision Source #

toConstr :: TopLevelDivision -> Constr Source #

dataTypeOf :: TopLevelDivision -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TopLevelDivision) Source #

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

gmapT :: (forall b. Data b => b -> b) -> TopLevelDivision -> TopLevelDivision Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TopLevelDivision -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TopLevelDivision -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> TopLevelDivision -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TopLevelDivision -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TopLevelDivision -> m TopLevelDivision Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TopLevelDivision -> m TopLevelDivision Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TopLevelDivision -> m TopLevelDivision Source #

Read TopLevelDivision Source # 
Instance details

Defined in Text.Pandoc.Options

Show TopLevelDivision Source # 
Instance details

Defined in Text.Pandoc.Options

Generic TopLevelDivision Source # 
Instance details

Defined in Text.Pandoc.Options

Associated Types

type Rep TopLevelDivision :: Type -> Type Source #

FromJSON TopLevelDivision Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

parseJSON :: Value -> Parser TopLevelDivision

parseJSONList :: Value -> Parser [TopLevelDivision]

ToJSON TopLevelDivision Source # 
Instance details

Defined in Text.Pandoc.Options

FromYAML TopLevelDivision Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

parseYAML :: Node Pos -> Parser TopLevelDivision

type Rep TopLevelDivision Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep TopLevelDivision = D1 ('MetaData "TopLevelDivision" "Text.Pandoc.Options" "pandoc-2.9.2.1-DFrBDPMZs4vCNncCgIf8kv" 'False) ((C1 ('MetaCons "TopLevelPart" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TopLevelChapter" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TopLevelSection" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TopLevelDefault" 'PrefixI 'False) (U1 :: Type -> Type)))

data WriterOptions Source #

Options for writers

Constructors

WriterOptions 

Fields

Instances

Instances details
Data WriterOptions Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WriterOptions -> c WriterOptions Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WriterOptions Source #

toConstr :: WriterOptions -> Constr Source #

dataTypeOf :: WriterOptions -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WriterOptions) Source #

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

gmapT :: (forall b. Data b => b -> b) -> WriterOptions -> WriterOptions Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WriterOptions -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WriterOptions -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> WriterOptions -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WriterOptions -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WriterOptions -> m WriterOptions Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WriterOptions -> m WriterOptions Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WriterOptions -> m WriterOptions Source #

Show WriterOptions Source # 
Instance details

Defined in Text.Pandoc.Options

Generic WriterOptions Source # 
Instance details

Defined in Text.Pandoc.Options

Associated Types

type Rep WriterOptions :: Type -> Type Source #

Default WriterOptions Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep WriterOptions Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep WriterOptions = D1 ('MetaData "WriterOptions" "Text.Pandoc.Options" "pandoc-2.9.2.1-DFrBDPMZs4vCNncCgIf8kv" 'False) (C1 ('MetaCons "WriterOptions" 'PrefixI 'True) (((((S1 ('MetaSel ('Just "writerTemplate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Template Text))) :*: S1 ('MetaSel ('Just "writerVariables") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Context Text))) :*: (S1 ('MetaSel ('Just "writerTabStop") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "writerTableOfContents") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :*: ((S1 ('MetaSel ('Just "writerIncremental") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "writerHTMLMathMethod") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 HTMLMathMethod)) :*: (S1 ('MetaSel ('Just "writerNumberSections") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "writerNumberOffset") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Int])))) :*: (((S1 ('MetaSel ('Just "writerSectionDivs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "writerExtensions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Extensions)) :*: (S1 ('MetaSel ('Just "writerReferenceLinks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "writerDpi") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :*: ((S1 ('MetaSel ('Just "writerWrapText") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 WrapOption) :*: S1 ('MetaSel ('Just "writerColumns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :*: (S1 ('MetaSel ('Just "writerEmailObfuscation") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ObfuscationMethod) :*: S1 ('MetaSel ('Just "writerIdentifierPrefix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))) :*: ((((S1 ('MetaSel ('Just "writerCiteMethod") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CiteMethod) :*: S1 ('MetaSel ('Just "writerHtmlQTags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "writerSlideLevel") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int)) :*: S1 ('MetaSel ('Just "writerTopLevelDivision") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TopLevelDivision))) :*: ((S1 ('MetaSel ('Just "writerListings") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "writerHighlightStyle") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Style))) :*: (S1 ('MetaSel ('Just "writerSetextHeaders") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "writerEpubSubdirectory") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))) :*: (((S1 ('MetaSel ('Just "writerEpubMetadata") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "writerEpubFonts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath])) :*: (S1 ('MetaSel ('Just "writerEpubChapterLevel") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "writerTOCDepth") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :*: ((S1 ('MetaSel ('Just "writerReferenceDoc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe FilePath)) :*: S1 ('MetaSel ('Just "writerReferenceLocation") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ReferenceLocation)) :*: (S1 ('MetaSel ('Just "writerSyntaxMap") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SyntaxMap) :*: S1 ('MetaSel ('Just "writerPreferAscii") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))))))

data TrackChanges Source #

Options for accepting or rejecting MS Word track-changes.

Instances

Instances details
Eq TrackChanges Source # 
Instance details

Defined in Text.Pandoc.Options

Data TrackChanges Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TrackChanges -> c TrackChanges Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TrackChanges Source #

toConstr :: TrackChanges -> Constr Source #

dataTypeOf :: TrackChanges -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TrackChanges) Source #

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

gmapT :: (forall b. Data b => b -> b) -> TrackChanges -> TrackChanges Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TrackChanges -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TrackChanges -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> TrackChanges -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TrackChanges -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TrackChanges -> m TrackChanges Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TrackChanges -> m TrackChanges Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TrackChanges -> m TrackChanges Source #

Read TrackChanges Source # 
Instance details

Defined in Text.Pandoc.Options

Show TrackChanges Source # 
Instance details

Defined in Text.Pandoc.Options

Generic TrackChanges Source # 
Instance details

Defined in Text.Pandoc.Options

Associated Types

type Rep TrackChanges :: Type -> Type Source #

FromJSON TrackChanges Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

parseJSON :: Value -> Parser TrackChanges

parseJSONList :: Value -> Parser [TrackChanges]

ToJSON TrackChanges Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

toJSON :: TrackChanges -> Value

toEncoding :: TrackChanges -> Encoding

toJSONList :: [TrackChanges] -> Value

toEncodingList :: [TrackChanges] -> Encoding

FromYAML TrackChanges Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

parseYAML :: Node Pos -> Parser TrackChanges

Pushable TrackChanges 
Instance details

Defined in Text.Pandoc.Lua.Marshaling.ReaderOptions

Methods

push :: TrackChanges -> Lua ()

type Rep TrackChanges Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep TrackChanges = D1 ('MetaData "TrackChanges" "Text.Pandoc.Options" "pandoc-2.9.2.1-DFrBDPMZs4vCNncCgIf8kv" 'False) (C1 ('MetaCons "AcceptChanges" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "RejectChanges" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AllChanges" 'PrefixI 'False) (U1 :: Type -> Type)))

data ReferenceLocation Source #

Locations for footnotes and references in markdown output

Constructors

EndOfBlock

End of block

EndOfSection

prior to next section header (or end of document)

EndOfDocument

at end of document

Instances

Instances details
Eq ReferenceLocation Source # 
Instance details

Defined in Text.Pandoc.Options

Data ReferenceLocation Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ReferenceLocation -> c ReferenceLocation Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ReferenceLocation Source #

toConstr :: ReferenceLocation -> Constr Source #

dataTypeOf :: ReferenceLocation -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ReferenceLocation) Source #

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

gmapT :: (forall b. Data b => b -> b) -> ReferenceLocation -> ReferenceLocation Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ReferenceLocation -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ReferenceLocation -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> ReferenceLocation -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ReferenceLocation -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ReferenceLocation -> m ReferenceLocation Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ReferenceLocation -> m ReferenceLocation Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ReferenceLocation -> m ReferenceLocation Source #

Read ReferenceLocation Source # 
Instance details

Defined in Text.Pandoc.Options

Show ReferenceLocation Source # 
Instance details

Defined in Text.Pandoc.Options

Generic ReferenceLocation Source # 
Instance details

Defined in Text.Pandoc.Options

Associated Types

type Rep ReferenceLocation :: Type -> Type Source #

FromJSON ReferenceLocation Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

parseJSON :: Value -> Parser ReferenceLocation

parseJSONList :: Value -> Parser [ReferenceLocation]

ToJSON ReferenceLocation Source # 
Instance details

Defined in Text.Pandoc.Options

FromYAML ReferenceLocation Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

parseYAML :: Node Pos -> Parser ReferenceLocation

type Rep ReferenceLocation Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep ReferenceLocation = D1 ('MetaData "ReferenceLocation" "Text.Pandoc.Options" "pandoc-2.9.2.1-DFrBDPMZs4vCNncCgIf8kv" 'False) (C1 ('MetaCons "EndOfBlock" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "EndOfSection" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "EndOfDocument" 'PrefixI 'False) (U1 :: Type -> Type)))

def :: Default a => a Source #

The default value for this type.

isEnabled :: HasSyntaxExtensions a => Extension -> a -> Bool Source #

Returns True if the given extension is enabled.