pandoc-2.2.1: Conversion between markup formats

CopyrightCopyright (C) 2012-2018 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
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 #

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

toConstr :: ReaderOptions -> Constr #

dataTypeOf :: ReaderOptions -> DataType #

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

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

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

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

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

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

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

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

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

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

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 :: * -> * #

Default ReaderOptions Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

def :: ReaderOptions #

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

ToLuaStack ReaderOptions 
Instance details

Defined in Text.Pandoc.Lua.StackInstances

Methods

push :: ReaderOptions -> Lua ()

type Rep ReaderOptions Source # 
Instance details

Defined in Text.Pandoc.Options

data HTMLMathMethod Source #

Instances
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 #

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

toConstr :: HTMLMathMethod -> Constr #

dataTypeOf :: HTMLMathMethod -> DataType #

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

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

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

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

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

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

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

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

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

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

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 :: * -> * #

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

type Rep HTMLMathMethod Source # 
Instance details

Defined in Text.Pandoc.Options

data CiteMethod Source #

Constructors

Citeproc 
Natbib 
Biblatex 
Instances
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 #

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

toConstr :: CiteMethod -> Constr #

dataTypeOf :: CiteMethod -> DataType #

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

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

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

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

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

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

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

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

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

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

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 :: * -> * #

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

type Rep CiteMethod Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep CiteMethod = D1 (MetaData "CiteMethod" "Text.Pandoc.Options" "pandoc-2.2.1-ELk6Pm9tHG3H2D3xaQHKQ8" False) (C1 (MetaCons "Citeproc" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "Natbib" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "Biblatex" PrefixI False) (U1 :: * -> *)))

data ObfuscationMethod Source #

Methods for obfuscating email addresses in HTML.

Instances
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 #

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

toConstr :: ObfuscationMethod -> Constr #

dataTypeOf :: ObfuscationMethod -> DataType #

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

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

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

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

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

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

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

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

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

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

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 :: * -> * #

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

type Rep ObfuscationMethod Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep ObfuscationMethod = D1 (MetaData "ObfuscationMethod" "Text.Pandoc.Options" "pandoc-2.2.1-ELk6Pm9tHG3H2D3xaQHKQ8" False) (C1 (MetaCons "NoObfuscation" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "ReferenceObfuscation" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "JavascriptObfuscation" PrefixI False) (U1 :: * -> *)))

data HTMLSlideVariant Source #

Varieties of HTML slide shows.

Instances
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 #

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

toConstr :: HTMLSlideVariant -> Constr #

dataTypeOf :: HTMLSlideVariant -> DataType #

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

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

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

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

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

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

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

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

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

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

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 :: * -> * #

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.2.1-ELk6Pm9tHG3H2D3xaQHKQ8" False) ((C1 (MetaCons "S5Slides" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "SlidySlides" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "SlideousSlides" PrefixI False) (U1 :: * -> *))) :+: (C1 (MetaCons "DZSlides" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "RevealJsSlides" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "NoSlides" PrefixI False) (U1 :: * -> *))))

data EPUBVersion Source #

Constructors

EPUB2 
EPUB3 
Instances
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 #

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

toConstr :: EPUBVersion -> Constr #

dataTypeOf :: EPUBVersion -> DataType #

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

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

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

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

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

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

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

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

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

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

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 Rep EPUBVersion Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep EPUBVersion = D1 (MetaData "EPUBVersion" "Text.Pandoc.Options" "pandoc-2.2.1-ELk6Pm9tHG3H2D3xaQHKQ8" False) (C1 (MetaCons "EPUB2" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "EPUB3" PrefixI False) (U1 :: * -> *))

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
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 #

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

toConstr :: WrapOption -> Constr #

dataTypeOf :: WrapOption -> DataType #

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

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

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

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

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

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

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

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

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

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

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 :: * -> * #

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

type Rep WrapOption Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep WrapOption = D1 (MetaData "WrapOption" "Text.Pandoc.Options" "pandoc-2.2.1-ELk6Pm9tHG3H2D3xaQHKQ8" False) (C1 (MetaCons "WrapAuto" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "WrapNone" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "WrapPreserve" PrefixI False) (U1 :: * -> *)))

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
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 #

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

toConstr :: TopLevelDivision -> Constr #

dataTypeOf :: TopLevelDivision -> DataType #

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

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

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

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

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

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

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

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

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

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

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 :: * -> * #

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

type Rep TopLevelDivision Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep TopLevelDivision = D1 (MetaData "TopLevelDivision" "Text.Pandoc.Options" "pandoc-2.2.1-ELk6Pm9tHG3H2D3xaQHKQ8" False) ((C1 (MetaCons "TopLevelPart" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "TopLevelChapter" PrefixI False) (U1 :: * -> *)) :+: (C1 (MetaCons "TopLevelSection" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "TopLevelDefault" PrefixI False) (U1 :: * -> *)))

data WriterOptions Source #

Options for writers

Constructors

WriterOptions 

Fields

Instances
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 #

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

toConstr :: WriterOptions -> Constr #

dataTypeOf :: WriterOptions -> DataType #

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

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

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

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

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

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

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

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

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

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

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 :: * -> * #

Default WriterOptions Source # 
Instance details

Defined in Text.Pandoc.Options

Methods

def :: WriterOptions #

type Rep WriterOptions Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep WriterOptions = D1 (MetaData "WriterOptions" "Text.Pandoc.Options" "pandoc-2.2.1-ELk6Pm9tHG3H2D3xaQHKQ8" False) (C1 (MetaCons "WriterOptions" PrefixI True) ((((S1 (MetaSel (Just "writerTemplate") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe String)) :*: (S1 (MetaSel (Just "writerVariables") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [(String, String)]) :*: 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 String) :*: 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 String) :*: S1 (MetaSel (Just "writerEpubMetadata") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe String))) :*: (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)))))))

data TrackChanges Source #

Options for accepting or rejecting MS Word track-changes.

Instances
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 #

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

toConstr :: TrackChanges -> Constr #

dataTypeOf :: TrackChanges -> DataType #

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

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

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

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

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

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

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

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

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

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

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 :: * -> * #

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

ToLuaStack TrackChanges 
Instance details

Defined in Text.Pandoc.Lua.StackInstances

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.2.1-ELk6Pm9tHG3H2D3xaQHKQ8" False) (C1 (MetaCons "AcceptChanges" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "RejectChanges" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "AllChanges" PrefixI False) (U1 :: * -> *)))

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
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 #

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

toConstr :: ReferenceLocation -> Constr #

dataTypeOf :: ReferenceLocation -> DataType #

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

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

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

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

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

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

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

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

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

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

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 :: * -> * #

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

type Rep ReferenceLocation Source # 
Instance details

Defined in Text.Pandoc.Options

type Rep ReferenceLocation = D1 (MetaData "ReferenceLocation" "Text.Pandoc.Options" "pandoc-2.2.1-ELk6Pm9tHG3H2D3xaQHKQ8" False) (C1 (MetaCons "EndOfBlock" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "EndOfSection" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "EndOfDocument" PrefixI False) (U1 :: * -> *)))

def :: Default a => a #

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

Returns True if the given extension is enabled.