| Copyright | Copyright (C) 2006-2021 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
Description
This helper module exports the main writers, readers, and data structure definitions from the Pandoc libraries.
A typical application will chain together a reader and a writer to convert strings from one format to another. For example, the following simple program will act as a filter converting markdown fragments to reStructuredText, using reference-style links instead of inline links:
module Main where
import Text.Pandoc
import Data.Text (Text)
import qualified Data.Text.IO as T
mdToRST :: Text -> IO Text
mdToRST txt = runIOorExplode $
  readMarkdown def txt
  >>= writeRST def{ writerReferenceLinks = True }
main :: IO ()
main = do
  T.getContents >>= mdToRST >>= T.putStrLnSynopsis
- module Text.Pandoc.Definition
 - module Text.Pandoc.Generic
 - module Text.Pandoc.Options
 - module Text.Pandoc.Logging
 - module Text.Pandoc.Class
 - module Text.Pandoc.Error
 - module Text.Pandoc.Readers
 - module Text.Pandoc.Writers
 - module Text.Pandoc.Templates
 - pandocVersion :: Text
 
Definitions
module Text.Pandoc.Definition
Generics
module Text.Pandoc.Generic
Options
module Text.Pandoc.Options
Logging
module Text.Pandoc.Logging
Typeclass
module Text.Pandoc.Class
Error handling
module Text.Pandoc.Error
Readers: converting to Pandoc format
module Text.Pandoc.Readers
Writers: converting from Pandoc format
module Text.Pandoc.Writers
Rendering templates and default templates
module Text.Pandoc.Templates
Miscellaneous
pandocVersion :: Text Source #
Version number of pandoc library.