Copyright | Copyright (C) 2006-2018 John MacFarlane |
---|---|
License | GNU GPL, version 2 or above |
Maintainer | John MacFarlane <jgm@berkeley@edu> |
Stability | alpha |
Portability | portable |
Safe Haskell | None |
Language | Haskell2010 |
Does a pandoc conversion based on command-line options.
Synopsis
- convertWithOpts :: Opt -> IO ()
- data Opt = Opt {
- optTabStop :: Int
- optPreserveTabs :: Bool
- optStandalone :: Bool
- optReader :: Maybe String
- optWriter :: Maybe String
- optTableOfContents :: Bool
- optBaseHeaderLevel :: Int
- optTemplate :: Maybe FilePath
- optVariables :: [(String, String)]
- optMetadata :: [(String, String)]
- optOutputFile :: Maybe FilePath
- optInputFiles :: [FilePath]
- optNumberSections :: Bool
- optNumberOffset :: [Int]
- optSectionDivs :: Bool
- optIncremental :: Bool
- optSelfContained :: Bool
- optHtmlQTags :: Bool
- optHighlightStyle :: Maybe String
- optSyntaxDefinitions :: [FilePath]
- optTopLevelDivision :: TopLevelDivision
- optHTMLMathMethod :: HTMLMathMethod
- optAbbreviations :: Maybe FilePath
- optReferenceDoc :: Maybe FilePath
- optEpubSubdirectory :: String
- optEpubMetadata :: Maybe FilePath
- optEpubFonts :: [FilePath]
- optEpubChapterLevel :: Int
- optEpubCoverImage :: Maybe FilePath
- optTOCDepth :: Int
- optDumpArgs :: Bool
- optIgnoreArgs :: Bool
- optVerbosity :: Verbosity
- optTrace :: Bool
- optLogFile :: Maybe FilePath
- optFailIfWarnings :: Bool
- optReferenceLinks :: Bool
- optReferenceLocation :: ReferenceLocation
- optDpi :: Int
- optWrapText :: WrapOption
- optColumns :: Int
- optFilters :: [Filter]
- optEmailObfuscation :: ObfuscationMethod
- optIdentifierPrefix :: String
- optStripEmptyParagraphs :: Bool
- optIndentedCodeClasses :: [String]
- optDataDir :: Maybe FilePath
- optCiteMethod :: CiteMethod
- optListings :: Bool
- optPdfEngine :: Maybe String
- optPdfEngineArgs :: [String]
- optSlideLevel :: Maybe Int
- optSetextHeaders :: Bool
- optAscii :: Bool
- optDefaultImageExtension :: String
- optExtractMedia :: Maybe FilePath
- optTrackChanges :: TrackChanges
- optFileScope :: Bool
- optTitlePrefix :: Maybe String
- optCss :: [FilePath]
- optIncludeBeforeBody :: [FilePath]
- optIncludeAfterBody :: [FilePath]
- optIncludeInHeader :: [FilePath]
- optResourcePath :: [FilePath]
- optRequestHeaders :: [(String, String)]
- optEol :: LineEnding
- optStripComments :: Bool
- data LineEnding
- data Filter
- defaultOpts :: Opt
- parseOptions :: [OptDescr (Opt -> IO Opt)] -> Opt -> IO Opt
- options :: [OptDescr (Opt -> IO Opt)]
- applyFilters :: ReaderOptions -> [Filter] -> [String] -> Pandoc -> PandocIO Pandoc
Documentation
convertWithOpts :: Opt -> IO () Source #
Data structure for command line options.
Opt | |
|
Instances
data LineEnding Source #
Instances
Show LineEnding Source # | |
Defined in Text.Pandoc.App showsPrec :: Int -> LineEnding -> ShowS # show :: LineEnding -> String # showList :: [LineEnding] -> ShowS # | |
Generic LineEnding Source # | |
Defined in Text.Pandoc.App type Rep LineEnding :: * -> * # from :: LineEnding -> Rep LineEnding x # to :: Rep LineEnding x -> LineEnding # | |
ToJSON LineEnding Source # | |
Defined in Text.Pandoc.App toJSON :: LineEnding -> Value # toEncoding :: LineEnding -> Encoding # toJSONList :: [LineEnding] -> Value # toEncodingList :: [LineEnding] -> Encoding # | |
FromJSON LineEnding Source # | |
Defined in Text.Pandoc.App parseJSON :: Value -> Parser LineEnding # parseJSONList :: Value -> Parser [LineEnding] # | |
type Rep LineEnding Source # | |
Defined in Text.Pandoc.App |
defaultOpts :: Opt Source #
Defaults for command-line options.
options :: [OptDescr (Opt -> IO Opt)] Source #
A list of functions, each transforming the options data structure in response to a command-line option.
applyFilters :: ReaderOptions -> [Filter] -> [String] -> Pandoc -> PandocIO Pandoc Source #