{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE OverloadedStrings #-}
module Text.Pandoc.Lua.Module.MediaBag
( documentedModule
) where
import Prelude hiding (lookup)
import Data.Maybe (fromMaybe)
import HsLua ( LuaE, DocumentedFunction, Module (..)
, (<#>), (###), (=#>), (=?>), defun, functionResult
, opt, parameter, stringParam, textParam)
import Text.Pandoc.Class.CommonState (CommonState (..))
import Text.Pandoc.Class.PandocMonad (fetchItem, getMediaBag, modifyCommonState,
setMediaBag)
import Text.Pandoc.Error (PandocError)
import Text.Pandoc.Lua.Marshal.List (pushPandocList)
import Text.Pandoc.Lua.Orphans ()
import Text.Pandoc.Lua.PandocLua (unPandocLua)
import Text.Pandoc.MIME (MimeType)
import qualified Data.ByteString.Lazy as BL
import qualified HsLua as Lua
import qualified Text.Pandoc.MediaBag as MB
documentedModule :: Module PandocError
documentedModule :: Module PandocError
documentedModule = $WModule :: forall e.
Name
-> Text
-> [Field e]
-> [DocumentedFunction e]
-> [(Operation, DocumentedFunction e)]
-> Module e
Module
{ moduleName :: Name
moduleName = "pandoc.mediabag"
, moduleDescription :: Text
moduleDescription = "mediabag access"
, moduleFields :: [Field PandocError]
moduleFields = []
, moduleFunctions :: [DocumentedFunction PandocError]
moduleFunctions =
[ DocumentedFunction PandocError
delete
, DocumentedFunction PandocError
empty
, DocumentedFunction PandocError
fetch
, DocumentedFunction PandocError
insert
, DocumentedFunction PandocError
items
, DocumentedFunction PandocError
list
, DocumentedFunction PandocError
lookup
]
, moduleOperations :: [(Operation, DocumentedFunction PandocError)]
moduleOperations = []
}
delete :: DocumentedFunction PandocError
delete :: DocumentedFunction PandocError
delete = Name
-> (FilePath -> LuaE PandocError ())
-> HsFnPrecursor PandocError (FilePath -> LuaE PandocError ())
forall a e. Name -> a -> HsFnPrecursor e a
defun "delete"
### (\fp -> unPandocLua $ modifyCommonState
(\st -> st { stMediaBag = MB.deleteMedia fp (stMediaBag st) }))
HsFnPrecursor PandocError (FilePath -> LuaE PandocError ())
-> Parameter PandocError FilePath
-> HsFnPrecursor PandocError (LuaE PandocError ())
forall e a b.
HsFnPrecursor e (a -> b) -> Parameter e a -> HsFnPrecursor e b
<#> Text -> Text -> Parameter PandocError FilePath
forall e. Text -> Text -> Parameter e FilePath
stringParam "filepath" "filename of item to delete"
HsFnPrecursor PandocError (LuaE PandocError ())
-> FunctionResults PandocError () -> DocumentedFunction PandocError
forall e a.
HsFnPrecursor e (LuaE e a)
-> FunctionResults e a -> DocumentedFunction e
=#> []
empty :: DocumentedFunction PandocError
empty :: DocumentedFunction PandocError
empty = Name
-> LuaE PandocError ()
-> HsFnPrecursor PandocError (LuaE PandocError ())
forall a e. Name -> a -> HsFnPrecursor e a
defun "empty"
### unPandocLua (modifyCommonState (\st -> st { stMediaBag = mempty }))
HsFnPrecursor PandocError (LuaE PandocError ())
-> FunctionResults PandocError () -> DocumentedFunction PandocError
forall e a.
HsFnPrecursor e (LuaE e a)
-> FunctionResults e a -> DocumentedFunction e
=#> []
insert :: DocumentedFunction PandocError
insert :: DocumentedFunction PandocError
insert = Name
-> (FilePath
-> Maybe Text -> ByteString -> LuaE PandocError NumResults)
-> HsFnPrecursor
PandocError
(FilePath
-> Maybe Text -> ByteString -> LuaE PandocError NumResults)
forall a e. Name -> a -> HsFnPrecursor e a
defun "insert"
### (\fp mmime contents -> unPandocLua $ do
mb <- getMediaBag
setMediaBag $ MB.insertMedia fp mmime contents mb
return (Lua.NumResults 0))
HsFnPrecursor
PandocError
(FilePath
-> Maybe Text -> ByteString -> LuaE PandocError NumResults)
-> Parameter PandocError FilePath
-> HsFnPrecursor
PandocError
(Maybe Text -> ByteString -> LuaE PandocError NumResults)
forall e a b.
HsFnPrecursor e (a -> b) -> Parameter e a -> HsFnPrecursor e b
<#> Text -> Text -> Parameter PandocError FilePath
forall e. Text -> Text -> Parameter e FilePath
stringParam "filepath" "item file path"
HsFnPrecursor
PandocError
(Maybe Text -> ByteString -> LuaE PandocError NumResults)
-> Parameter PandocError (Maybe Text)
-> HsFnPrecursor
PandocError (ByteString -> LuaE PandocError NumResults)
forall e a b.
HsFnPrecursor e (a -> b) -> Parameter e a -> HsFnPrecursor e b
<#> Parameter PandocError Text -> Parameter PandocError (Maybe Text)
forall e a. Parameter e a -> Parameter e (Maybe a)
opt (Text -> Text -> Parameter PandocError Text
forall e. Text -> Text -> Parameter e Text
textParam "mimetype" "the item's MIME type")
HsFnPrecursor
PandocError (ByteString -> LuaE PandocError NumResults)
-> Parameter PandocError ByteString
-> HsFnPrecursor PandocError (LuaE PandocError NumResults)
forall e a b.
HsFnPrecursor e (a -> b) -> Parameter e a -> HsFnPrecursor e b
<#> Peeker PandocError ByteString
-> Text -> Text -> Text -> Parameter PandocError ByteString
forall e a. Peeker e a -> Text -> Text -> Text -> Parameter e a
parameter Peeker PandocError ByteString
forall e. Peeker e ByteString
Lua.peekLazyByteString "string" "contents" "binary contents"
HsFnPrecursor PandocError (LuaE PandocError NumResults)
-> FunctionResults PandocError NumResults
-> DocumentedFunction PandocError
forall e a.
HsFnPrecursor e (LuaE e a)
-> FunctionResults e a -> DocumentedFunction e
=#> []
items :: DocumentedFunction PandocError
items :: DocumentedFunction PandocError
items = Name
-> LuaE PandocError NumResults
-> HsFnPrecursor PandocError (LuaE PandocError NumResults)
forall a e. Name -> a -> HsFnPrecursor e a
defun "items"
### (do
mb <-unPandocLua getMediaBag
let pushItem (fp, mimetype, contents) = do
Lua.pushString fp
Lua.pushText mimetype
Lua.pushByteString $ BL.toStrict contents
return (Lua.NumResults 3)
Lua.pushIterator pushItem (MB.mediaItems mb))
HsFnPrecursor PandocError (LuaE PandocError NumResults)
-> Text -> DocumentedFunction PandocError
forall e.
HsFnPrecursor e (LuaE e NumResults) -> Text -> DocumentedFunction e
=?> "Iterator triple"
lookup :: DocumentedFunction PandocError
lookup :: DocumentedFunction PandocError
lookup = Name
-> (FilePath -> LuaE PandocError NumResults)
-> HsFnPrecursor
PandocError (FilePath -> LuaE PandocError NumResults)
forall a e. Name -> a -> HsFnPrecursor e a
defun "lookup"
### (\fp -> unPandocLua (MB.lookupMedia fp <$> getMediaBag) >>= \case
Nothing -> 1 <$ Lua.pushnil
Just item -> 2 <$ do
Lua.pushText $ MB.mediaMimeType item
Lua.pushLazyByteString $ MB.mediaContents item)
HsFnPrecursor PandocError (FilePath -> LuaE PandocError NumResults)
-> Parameter PandocError FilePath
-> HsFnPrecursor PandocError (LuaE PandocError NumResults)
forall e a b.
HsFnPrecursor e (a -> b) -> Parameter e a -> HsFnPrecursor e b
<#> Text -> Text -> Parameter PandocError FilePath
forall e. Text -> Text -> Parameter e FilePath
stringParam "filepath" "path of item to lookup"
HsFnPrecursor PandocError (LuaE PandocError NumResults)
-> Text -> DocumentedFunction PandocError
forall e.
HsFnPrecursor e (LuaE e NumResults) -> Text -> DocumentedFunction e
=?> "MIME type and contents"
list :: DocumentedFunction PandocError
list :: DocumentedFunction PandocError
list = Name
-> LuaE PandocError [(FilePath, Text, Int)]
-> HsFnPrecursor
PandocError (LuaE PandocError [(FilePath, Text, Int)])
forall a e. Name -> a -> HsFnPrecursor e a
defun "list"
### (unPandocLua (MB.mediaDirectory <$> getMediaBag))
HsFnPrecursor
PandocError (LuaE PandocError [(FilePath, Text, Int)])
-> FunctionResults PandocError [(FilePath, Text, Int)]
-> DocumentedFunction PandocError
forall e a.
HsFnPrecursor e (LuaE e a)
-> FunctionResults e a -> DocumentedFunction e
=#> Pusher PandocError [(FilePath, Text, Int)]
-> Text
-> Text
-> FunctionResults PandocError [(FilePath, Text, Int)]
forall e a. Pusher e a -> Text -> Text -> FunctionResults e a
functionResult (Pusher PandocError (FilePath, Text, Int)
-> Pusher PandocError [(FilePath, Text, Int)]
forall e a. LuaError e => Pusher e a -> Pusher e [a]
pushPandocList Pusher PandocError (FilePath, Text, Int)
pushEntry) "table" "list of entry triples"
where
pushEntry :: (FilePath, MimeType, Int) -> LuaE PandocError ()
pushEntry :: Pusher PandocError (FilePath, Text, Int)
pushEntry (fp :: FilePath
fp, mimeType :: Text
mimeType, contentLength :: Int
contentLength) = do
LuaE PandocError ()
forall e. LuaE e ()
Lua.newtable
Name -> LuaE PandocError ()
forall e. Name -> LuaE e ()
Lua.pushName "path" LuaE PandocError () -> LuaE PandocError () -> LuaE PandocError ()
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> FilePath -> LuaE PandocError ()
forall e. FilePath -> LuaE e ()
Lua.pushString FilePath
fp LuaE PandocError () -> LuaE PandocError () -> LuaE PandocError ()
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> StackIndex -> LuaE PandocError ()
forall e. LuaError e => StackIndex -> LuaE e ()
Lua.rawset (-3)
Name -> LuaE PandocError ()
forall e. Name -> LuaE e ()
Lua.pushName "type" LuaE PandocError () -> LuaE PandocError () -> LuaE PandocError ()
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> Pusher PandocError Text
forall e. Pusher e Text
Lua.pushText Text
mimeType LuaE PandocError () -> LuaE PandocError () -> LuaE PandocError ()
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> StackIndex -> LuaE PandocError ()
forall e. LuaError e => StackIndex -> LuaE e ()
Lua.rawset (-3)
Name -> LuaE PandocError ()
forall e. Name -> LuaE e ()
Lua.pushName "length" LuaE PandocError () -> LuaE PandocError () -> LuaE PandocError ()
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> Int -> LuaE PandocError ()
forall a e. (Integral a, Show a) => a -> LuaE e ()
Lua.pushIntegral Int
contentLength LuaE PandocError () -> LuaE PandocError () -> LuaE PandocError ()
forall (f :: * -> *) a b. Applicative f => f a -> f b -> f b
*> StackIndex -> LuaE PandocError ()
forall e. LuaError e => StackIndex -> LuaE e ()
Lua.rawset (-3)
fetch :: DocumentedFunction PandocError
fetch :: DocumentedFunction PandocError
fetch = Name
-> (Text -> LuaE PandocError NumResults)
-> HsFnPrecursor PandocError (Text -> LuaE PandocError NumResults)
forall a e. Name -> a -> HsFnPrecursor e a
defun "fetch"
### (\src -> do
(bs, mimeType) <- unPandocLua $ fetchItem src
Lua.pushText $ fromMaybe "" mimeType
Lua.pushByteString bs
return 2)
HsFnPrecursor PandocError (Text -> LuaE PandocError NumResults)
-> Parameter PandocError Text
-> HsFnPrecursor PandocError (LuaE PandocError NumResults)
forall e a b.
HsFnPrecursor e (a -> b) -> Parameter e a -> HsFnPrecursor e b
<#> Text -> Text -> Parameter PandocError Text
forall e. Text -> Text -> Parameter e Text
textParam "src" "URI to fetch"
HsFnPrecursor PandocError (LuaE PandocError NumResults)
-> Text -> DocumentedFunction PandocError
forall e.
HsFnPrecursor e (LuaE e NumResults) -> Text -> DocumentedFunction e
=?> "Returns two string values: the fetched contents and the mimetype."