{-# LANGUAGE MonoLocalBinds #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE OverloadedStrings #-}
module Text.Pandoc.Readers
(
Reader (..)
, readers
, readDocx
, readOdt
, readMarkdown
, readCommonMark
, readCreole
, readDokuWiki
, readMediaWiki
, readVimwiki
, readRST
, readOrg
, readLaTeX
, readHtml
, readJATS
, readJira
, readTextile
, readDocBook
, readOPML
, readHaddock
, readNative
, readJSON
, readTWiki
, readTikiWiki
, readTxt2Tags
, readEPUB
, readMuse
, readFB2
, readIpynb
, getReader
, getDefaultExtensions
) where
import Prelude
import Control.Monad (unless)
import Control.Monad.Except (throwError)
import Data.Aeson
import qualified Data.ByteString.Lazy as BL
import Data.Text (Text)
import qualified Data.Text as T
import Text.Pandoc.Class
import Text.Pandoc.Definition
import Text.Pandoc.Error
import Text.Pandoc.Extensions
import Text.Pandoc.Options
import Text.Pandoc.Readers.CommonMark
import Text.Pandoc.Readers.Creole
import Text.Pandoc.Readers.DocBook
import Text.Pandoc.Readers.Docx
import Text.Pandoc.Readers.DokuWiki
import Text.Pandoc.Readers.EPUB
import Text.Pandoc.Readers.FB2
import Text.Pandoc.Readers.Ipynb
import Text.Pandoc.Readers.Haddock
import Text.Pandoc.Readers.HTML (readHtml)
import Text.Pandoc.Readers.JATS (readJATS)
import Text.Pandoc.Readers.Jira (readJira)
import Text.Pandoc.Readers.LaTeX
import Text.Pandoc.Readers.Markdown
import Text.Pandoc.Readers.MediaWiki
import Text.Pandoc.Readers.Muse
import Text.Pandoc.Readers.Native
import Text.Pandoc.Readers.Odt
import Text.Pandoc.Readers.OPML
import Text.Pandoc.Readers.Org
import Text.Pandoc.Readers.RST
import Text.Pandoc.Readers.Textile
import Text.Pandoc.Readers.TikiWiki
import Text.Pandoc.Readers.TWiki
import Text.Pandoc.Readers.Txt2Tags
import Text.Pandoc.Readers.Vimwiki
import Text.Pandoc.Readers.Man
import qualified Text.Pandoc.UTF8 as UTF8
import Text.Parsec.Error
data Reader m = TextReader (ReaderOptions -> Text -> m Pandoc)
| ByteStringReader (ReaderOptions -> BL.ByteString -> m Pandoc)
readers :: PandocMonad m => [(Text, Reader m)]
readers :: [(Text, Reader m)]
readers = [ ("native" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readNative)
,("json" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readJSON)
,("markdown" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readMarkdown)
,("markdown_strict" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readMarkdown)
,("markdown_phpextra" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readMarkdown)
,("markdown_github" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readMarkdown)
,("markdown_mmd", (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readMarkdown)
,("commonmark" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readCommonMark)
,("creole" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readCreole)
,("dokuwiki" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readDokuWiki)
,("gfm" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readCommonMark)
,("rst" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readRST)
,("mediawiki" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readMediaWiki)
,("vimwiki" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readVimwiki)
,("docbook" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readDocBook)
,("opml" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readOPML)
,("org" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readOrg)
,("textile" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readTextile)
,("html" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readHtml)
,("jats" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readJATS)
,("jira" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readJira)
,("latex" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readLaTeX)
,("haddock" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readHaddock)
,("twiki" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readTWiki)
,("tikiwiki" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readTikiWiki)
,("docx" , (ReaderOptions -> ByteString -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> ByteString -> m Pandoc) -> Reader m
ByteStringReader ReaderOptions -> ByteString -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> ByteString -> m Pandoc
readDocx)
,("odt" , (ReaderOptions -> ByteString -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> ByteString -> m Pandoc) -> Reader m
ByteStringReader ReaderOptions -> ByteString -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> ByteString -> m Pandoc
readOdt)
,("t2t" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readTxt2Tags)
,("epub" , (ReaderOptions -> ByteString -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> ByteString -> m Pandoc) -> Reader m
ByteStringReader ReaderOptions -> ByteString -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> ByteString -> m Pandoc
readEPUB)
,("muse" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readMuse)
,("man" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readMan)
,("fb2" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readFB2)
,("ipynb" , (ReaderOptions -> Text -> m Pandoc) -> Reader m
forall (m :: * -> *).
(ReaderOptions -> Text -> m Pandoc) -> Reader m
TextReader ReaderOptions -> Text -> m Pandoc
forall (m :: * -> *).
PandocMonad m =>
ReaderOptions -> Text -> m Pandoc
readIpynb)
]
getReader :: PandocMonad m => Text -> m (Reader m, Extensions)
getReader :: Text -> m (Reader m, Extensions)
getReader s :: Text
s =
case Text -> Either ParseError (Text, [Extension], [Extension])
parseFormatSpec Text
s of
Left e :: ParseError
e -> PandocError -> m (Reader m, Extensions)
forall e (m :: * -> *) a. MonadError e m => e -> m a
throwError (PandocError -> m (Reader m, Extensions))
-> PandocError -> m (Reader m, Extensions)
forall a b. (a -> b) -> a -> b
$ Text -> PandocError
PandocAppError
(Text -> PandocError) -> Text -> PandocError
forall a b. (a -> b) -> a -> b
$ Text -> [Text] -> Text
T.intercalate "\n" [String -> Text
T.pack String
m | Message m :: String
m <- ParseError -> [Message]
errorMessages ParseError
e]
Right (readerName :: Text
readerName, extsToEnable :: [Extension]
extsToEnable, extsToDisable :: [Extension]
extsToDisable) ->
case Text -> [(Text, Reader m)] -> Maybe (Reader m)
forall a b. Eq a => a -> [(a, b)] -> Maybe b
lookup Text
readerName [(Text, Reader m)]
forall (m :: * -> *). PandocMonad m => [(Text, Reader m)]
readers of
Nothing -> PandocError -> m (Reader m, Extensions)
forall e (m :: * -> *) a. MonadError e m => e -> m a
throwError (PandocError -> m (Reader m, Extensions))
-> PandocError -> m (Reader m, Extensions)
forall a b. (a -> b) -> a -> b
$ Text -> PandocError
PandocUnknownReaderError
Text
readerName
Just r :: Reader m
r -> do
let allExts :: Extensions
allExts = Text -> Extensions
getAllExtensions Text
readerName
let exts :: Extensions
exts = (Extension -> Extensions -> Extensions)
-> Extensions -> [Extension] -> Extensions
forall (t :: * -> *) a b.
Foldable t =>
(a -> b -> b) -> b -> t a -> b
foldr Extension -> Extensions -> Extensions
disableExtension
((Extension -> Extensions -> Extensions)
-> Extensions -> [Extension] -> Extensions
forall (t :: * -> *) a b.
Foldable t =>
(a -> b -> b) -> b -> t a -> b
foldr Extension -> Extensions -> Extensions
enableExtension
(Text -> Extensions
getDefaultExtensions Text
readerName)
[Extension]
extsToEnable) [Extension]
extsToDisable
(Extension -> m ()) -> [Extension] -> m ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (\ext :: Extension
ext ->
Bool -> m () -> m ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
unless (Extension -> Extensions -> Bool
extensionEnabled Extension
ext Extensions
allExts) (m () -> m ()) -> m () -> m ()
forall a b. (a -> b) -> a -> b
$
PandocError -> m ()
forall e (m :: * -> *) a. MonadError e m => e -> m a
throwError (PandocError -> m ()) -> PandocError -> m ()
forall a b. (a -> b) -> a -> b
$
Text -> Text -> PandocError
PandocUnsupportedExtensionError
(Int -> Text -> Text
T.drop 4 (Text -> Text) -> Text -> Text
forall a b. (a -> b) -> a -> b
$ String -> Text
T.pack (String -> Text) -> String -> Text
forall a b. (a -> b) -> a -> b
$ Extension -> String
forall a. Show a => a -> String
show Extension
ext) Text
readerName)
([Extension]
extsToEnable [Extension] -> [Extension] -> [Extension]
forall a. [a] -> [a] -> [a]
++ [Extension]
extsToDisable)
(Reader m, Extensions) -> m (Reader m, Extensions)
forall (m :: * -> *) a. Monad m => a -> m a
return (Reader m
r, Extensions
exts)
readJSON :: PandocMonad m
=> ReaderOptions -> Text -> m Pandoc
readJSON :: ReaderOptions -> Text -> m Pandoc
readJSON _ t :: Text
t =
case ByteString -> Either String Pandoc
forall a. FromJSON a => ByteString -> Either String a
eitherDecode' (ByteString -> Either String Pandoc)
-> (Text -> ByteString) -> Text -> Either String Pandoc
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ByteString -> ByteString
BL.fromStrict (ByteString -> ByteString)
-> (Text -> ByteString) -> Text -> ByteString
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> ByteString
UTF8.fromText (Text -> Either String Pandoc) -> Text -> Either String Pandoc
forall a b. (a -> b) -> a -> b
$ Text
t of
Right doc :: Pandoc
doc -> Pandoc -> m Pandoc
forall (m :: * -> *) a. Monad m => a -> m a
return Pandoc
doc
Left e :: String
e -> PandocError -> m Pandoc
forall e (m :: * -> *) a. MonadError e m => e -> m a
throwError (PandocError -> m Pandoc) -> PandocError -> m Pandoc
forall a b. (a -> b) -> a -> b
$ Text -> PandocError
PandocParseError ("JSON parse error: " Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> String -> Text
T.pack String
e)