Copyright | Copyright (C) 2012-2020 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.Options
Description
Data structures and functions for representing parser and writer options.
Synopsis
- module Text.Pandoc.Extensions
- data ReaderOptions = ReaderOptions {}
- data HTMLMathMethod
- data CiteMethod
- data ObfuscationMethod
- data HTMLSlideVariant
- data EPUBVersion
- data WrapOption
- data TopLevelDivision
- data WriterOptions = WriterOptions {
- writerTemplate :: Maybe (Template Text)
- writerVariables :: Context Text
- writerTabStop :: Int
- writerTableOfContents :: Bool
- writerIncremental :: Bool
- writerHTMLMathMethod :: HTMLMathMethod
- writerNumberSections :: Bool
- writerNumberOffset :: [Int]
- writerSectionDivs :: Bool
- writerExtensions :: Extensions
- writerReferenceLinks :: Bool
- writerDpi :: Int
- writerWrapText :: WrapOption
- writerColumns :: Int
- writerEmailObfuscation :: ObfuscationMethod
- writerIdentifierPrefix :: Text
- writerCiteMethod :: CiteMethod
- writerHtmlQTags :: Bool
- writerSlideLevel :: Maybe Int
- writerTopLevelDivision :: TopLevelDivision
- writerListings :: Bool
- writerHighlightStyle :: Maybe Style
- writerSetextHeaders :: Bool
- writerEpubSubdirectory :: Text
- writerEpubMetadata :: Maybe Text
- writerEpubFonts :: [FilePath]
- writerEpubChapterLevel :: Int
- writerTOCDepth :: Int
- writerReferenceDoc :: Maybe FilePath
- writerReferenceLocation :: ReferenceLocation
- writerSyntaxMap :: SyntaxMap
- writerPreferAscii :: Bool
- data TrackChanges
- data ReferenceLocation
- def :: Default a => a
- isEnabled :: HasSyntaxExtensions a => Extension -> a -> Bool
- defaultMathJaxURL :: Text
- defaultKaTeXURL :: Text
Documentation
module Text.Pandoc.Extensions
data ReaderOptions Source #
Constructors
ReaderOptions | |
Fields
|
Instances
data HTMLMathMethod Source #
Instances
data CiteMethod Source #
Instances
Eq CiteMethod Source # | |
Defined in Text.Pandoc.Options Methods (==) :: CiteMethod -> CiteMethod -> Bool Source # (/=) :: CiteMethod -> CiteMethod -> Bool Source # | |
Data CiteMethod Source # | |
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 # | |
Defined in Text.Pandoc.Options | |
Show CiteMethod Source # | |
Defined in Text.Pandoc.Options | |
Generic CiteMethod Source # | |
Defined in Text.Pandoc.Options | |
FromJSON CiteMethod Source # | |
Defined in Text.Pandoc.Options | |
ToJSON CiteMethod Source # | |
Defined in Text.Pandoc.Options Methods toJSON :: CiteMethod -> Value toEncoding :: CiteMethod -> Encoding toJSONList :: [CiteMethod] -> Value toEncodingList :: [CiteMethod] -> Encoding | |
FromYAML CiteMethod Source # | |
Defined in Text.Pandoc.Options Methods parseYAML :: Node Pos -> Parser CiteMethod | |
type Rep CiteMethod Source # | |
Defined in Text.Pandoc.Options type Rep CiteMethod = D1 ('MetaData "CiteMethod" "Text.Pandoc.Options" "pandoc-2.9.2.1-73CWJ3Z1Rw4AxSiuG7YyRy" '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.
Constructors
NoObfuscation | |
ReferenceObfuscation | |
JavascriptObfuscation |
Instances
data HTMLSlideVariant Source #
Varieties of HTML slide shows.
Constructors
S5Slides | |
SlidySlides | |
SlideousSlides | |
DZSlides | |
RevealJsSlides | |
NoSlides |
Instances
data EPUBVersion Source #
Instances
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 # | |
Defined in Text.Pandoc.Options Methods (==) :: WrapOption -> WrapOption -> Bool Source # (/=) :: WrapOption -> WrapOption -> Bool Source # | |
Data WrapOption Source # | |
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 # | |
Defined in Text.Pandoc.Options | |
Show WrapOption Source # | |
Defined in Text.Pandoc.Options | |
Generic WrapOption Source # | |
Defined in Text.Pandoc.Options | |
FromJSON WrapOption Source # | |
Defined in Text.Pandoc.Options | |
ToJSON WrapOption Source # | |
Defined in Text.Pandoc.Options Methods toJSON :: WrapOption -> Value toEncoding :: WrapOption -> Encoding toJSONList :: [WrapOption] -> Value toEncodingList :: [WrapOption] -> Encoding | |
FromYAML WrapOption Source # | |
Defined in Text.Pandoc.Options Methods parseYAML :: Node Pos -> Parser WrapOption | |
type Rep WrapOption Source # | |
Defined in Text.Pandoc.Options type Rep WrapOption = D1 ('MetaData "WrapOption" "Text.Pandoc.Options" "pandoc-2.9.2.1-73CWJ3Z1Rw4AxSiuG7YyRy" '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
data WriterOptions Source #
Options for writers
Constructors
WriterOptions | |
Fields
|
Instances
data TrackChanges Source #
Options for accepting or rejecting MS Word track-changes.
Constructors
AcceptChanges | |
RejectChanges | |
AllChanges |
Instances
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 |