| Copyright | Copyright (C) 2006-2023 John MacFarlane | 
|---|---|
| License | GNU GPL, version 2 or above | 
| Maintainer | John MacFarlane <jgm@berkeley@edu> | 
| Stability | alpha | 
| Portability | portable | 
| Safe Haskell | Safe-Inferred | 
| Language | Haskell2010 | 
Text.Pandoc.App
Description
Does a pandoc conversion based on command-line options.
Synopsis
- convertWithOpts :: ScriptingEngine -> Opt -> IO ()
- handleOptInfo :: ScriptingEngine -> OptInfo -> IO ()
- data Opt = Opt {- optTabStop :: Int
- optPreserveTabs :: Bool
- optStandalone :: Bool
- optFrom :: Maybe Text
- optTo :: Maybe Text
- optTableOfContents :: Bool
- optShiftHeadingLevelBy :: Int
- optTemplate :: Maybe FilePath
- optVariables :: Context Text
- optMetadata :: Meta
- optMetadataFiles :: [FilePath]
- optOutputFile :: Maybe FilePath
- optInputFiles :: Maybe [FilePath]
- optNumberSections :: Bool
- optNumberOffset :: [Int]
- optSectionDivs :: Bool
- optIncremental :: Bool
- optSelfContained :: Bool
- optEmbedResources :: Bool
- optHtmlQTags :: Bool
- optHighlightStyle :: Maybe Text
- optSyntaxDefinitions :: [FilePath]
- optTopLevelDivision :: TopLevelDivision
- optHTMLMathMethod :: HTMLMathMethod
- optAbbreviations :: Maybe FilePath
- optReferenceDoc :: Maybe FilePath
- optSplitLevel :: Int
- optChunkTemplate :: Maybe Text
- optEpubSubdirectory :: String
- optEpubMetadata :: Maybe FilePath
- optEpubFonts :: [FilePath]
- optEpubCoverImage :: Maybe FilePath
- optEpubTitlePage :: Bool
- optTOCDepth :: Int
- optDumpArgs :: Bool
- optIgnoreArgs :: Bool
- optVerbosity :: Verbosity
- optTrace :: Bool
- optLogFile :: Maybe FilePath
- optFailIfWarnings :: Bool
- optReferenceLinks :: Bool
- optReferenceLocation :: ReferenceLocation
- optDpi :: Int
- optWrap :: WrapOption
- optColumns :: Int
- optFilters :: [Filter]
- optEmailObfuscation :: ObfuscationMethod
- optIdentifierPrefix :: Text
- optIndentedCodeClasses :: [Text]
- optDataDir :: Maybe FilePath
- optCiteMethod :: CiteMethod
- optListings :: Bool
- optPdfEngine :: Maybe String
- optPdfEngineOpts :: [String]
- optSlideLevel :: Maybe Int
- optSetextHeaders :: Bool
- optListTables :: Bool
- optAscii :: Bool
- optDefaultImageExtension :: Text
- optExtractMedia :: Maybe FilePath
- optTrackChanges :: TrackChanges
- optFileScope :: Bool
- optTitlePrefix :: Maybe Text
- optCss :: [FilePath]
- optIpynbOutput :: IpynbOutput
- optIncludeBeforeBody :: [FilePath]
- optIncludeAfterBody :: [FilePath]
- optIncludeInHeader :: [FilePath]
- optResourcePath :: [FilePath]
- optRequestHeaders :: [(Text, Text)]
- optNoCheckCertificate :: Bool
- optEol :: LineEnding
- optStripComments :: Bool
- optCSL :: Maybe FilePath
- optBibliography :: [FilePath]
- optCitationAbbreviations :: Maybe FilePath
- optSandbox :: Bool
 
- data OptInfo
- data LineEnding
- data IpynbOutput
- data Filter
- defaultOpts :: Opt
- parseOptions :: [OptDescr (Opt -> ExceptT OptInfo IO Opt)] -> Opt -> IO (Either OptInfo Opt)
- parseOptionsFromArgs :: [OptDescr (Opt -> ExceptT OptInfo IO Opt)] -> Opt -> String -> [String] -> IO (Either OptInfo Opt)
- options :: [OptDescr (Opt -> ExceptT OptInfo IO Opt)]
- applyFilters :: (PandocMonad m, MonadIO m) => ScriptingEngine -> Environment -> [Filter] -> [String] -> Pandoc -> m Pandoc
Documentation
convertWithOpts :: ScriptingEngine -> Opt -> IO () Source #
handleOptInfo :: ScriptingEngine -> OptInfo -> IO () Source #
React to an OptInfo by printing the requested information
 and exiting or (if there was a parsing error) raising an error.
Data structure for command line options.
Constructors
| Opt | |
| Fields 
 | |
Instances
Option parser results requesting informational output.
Constructors
Instances
data LineEnding Source #
The type of line-endings to be used when writing plain-text.
Instances
| Generic LineEnding Source # | |
| Defined in Text.Pandoc.App.Opt Associated Types type Rep LineEnding :: Type -> Type # | |
| Show LineEnding Source # | |
| Defined in Text.Pandoc.App.Opt Methods showsPrec :: Int -> LineEnding -> ShowS # show :: LineEnding -> String # showList :: [LineEnding] -> ShowS # | |
| FromJSON LineEnding Source # | |
| Defined in Text.Pandoc.App.Opt | |
| ToJSON LineEnding Source # | |
| Defined in Text.Pandoc.App.Opt Methods toJSON :: LineEnding -> Value # toEncoding :: LineEnding -> Encoding # toJSONList :: [LineEnding] -> Value # toEncodingList :: [LineEnding] -> Encoding # | |
| type Rep LineEnding Source # | |
| Defined in Text.Pandoc.App.Opt | |
data IpynbOutput Source #
How to handle output blocks in ipynb.
Constructors
| IpynbOutputAll | |
| IpynbOutputNone | |
| IpynbOutputBest | 
Instances
| Generic IpynbOutput Source # | |
| Defined in Text.Pandoc.App.Opt Associated Types type Rep IpynbOutput :: Type -> Type # | |
| Show IpynbOutput Source # | |
| Defined in Text.Pandoc.App.Opt Methods showsPrec :: Int -> IpynbOutput -> ShowS # show :: IpynbOutput -> String # showList :: [IpynbOutput] -> ShowS # | |
| FromJSON IpynbOutput Source # | |
| Defined in Text.Pandoc.App.Opt | |
| ToJSON IpynbOutput Source # | |
| Defined in Text.Pandoc.App.Opt Methods toJSON :: IpynbOutput -> Value # toEncoding :: IpynbOutput -> Encoding # toJSONList :: [IpynbOutput] -> Value # toEncodingList :: [IpynbOutput] -> Encoding # | |
| type Rep IpynbOutput Source # | |
| Defined in Text.Pandoc.App.Opt type Rep IpynbOutput = D1 ('MetaData "IpynbOutput" "Text.Pandoc.App.Opt" "pandoc-3.1.5-inplace" 'False) (C1 ('MetaCons "IpynbOutputAll" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "IpynbOutputNone" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IpynbOutputBest" 'PrefixI 'False) (U1 :: Type -> Type))) | |
Type of filter and path to filter file.
Constructors
| LuaFilter FilePath | |
| JSONFilter FilePath | 
Instances
| Generic Filter Source # | |
| Show Filter Source # | |
| FromJSON Filter Source # | |
| ToJSON Filter Source # | |
| Defined in Text.Pandoc.Filter | |
| type Rep Filter Source # | |
| Defined in Text.Pandoc.Filter type Rep Filter = D1 ('MetaData "Filter" "Text.Pandoc.Filter" "pandoc-3.1.5-inplace" 'False) (C1 ('MetaCons "LuaFilter" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)) :+: (C1 ('MetaCons "JSONFilter" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)) :+: C1 ('MetaCons "CiteprocFilter" 'PrefixI 'False) (U1 :: Type -> Type))) | |
defaultOpts :: Opt Source #
Defaults for command-line options.
parseOptions :: [OptDescr (Opt -> ExceptT OptInfo IO Opt)] -> Opt -> IO (Either OptInfo Opt) Source #
parseOptionsFromArgs :: [OptDescr (Opt -> ExceptT OptInfo IO Opt)] -> Opt -> String -> [String] -> IO (Either OptInfo Opt) Source #
options :: [OptDescr (Opt -> ExceptT OptInfo IO Opt)] Source #
A list of functions, each transforming the options data structure in response to a command-line option.
applyFilters :: (PandocMonad m, MonadIO m) => ScriptingEngine -> Environment -> [Filter] -> [String] -> Pandoc -> m Pandoc Source #
Modify the given document using a filter.