aboutsummaryrefslogtreecommitdiff
path: root/pandoc-lua-engine
diff options
context:
space:
mode:
authorAlbert Krewinkel <[email protected]>2023-03-20 15:21:57 +0100
committerAlbert Krewinkel <[email protected]>2023-03-20 16:06:19 +0100
commit8346cfad4c166483c2af48a1f296535aa6f1715f (patch)
tree457dfe60c3b2b7888617861009d91789cb79bec7 /pandoc-lua-engine
parent0e4b397e7081eb20c55efc051c7caddaffd697f8 (diff)
lua-filters: auto-generate docs for `pandoc.system` module.
Diffstat (limited to 'pandoc-lua-engine')
-rw-r--r--pandoc-lua-engine/src/Text/Pandoc/Lua/Module/System.hs8
1 files changed, 5 insertions, 3 deletions
diff --git a/pandoc-lua-engine/src/Text/Pandoc/Lua/Module/System.hs b/pandoc-lua-engine/src/Text/Pandoc/Lua/Module/System.hs
index 367b74a33..aaed54b48 100644
--- a/pandoc-lua-engine/src/Text/Pandoc/Lua/Module/System.hs
+++ b/pandoc-lua-engine/src/Text/Pandoc/Lua/Module/System.hs
@@ -1,5 +1,6 @@
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE ScopedTypeVariables #-}
+{-# LANGUAGE TypeApplications #-}
{- |
Module : Text.Pandoc.Lua.Module.System
Copyright : © 2019-2023 Albert Krewinkel
@@ -19,18 +20,19 @@ import HsLua
import HsLua.Module.System
( arch, cputime, env, getwd, ls, mkdir, os, rmdir
, with_env, with_tmpdir, with_wd)
+import qualified HsLua.Module.System as MSys
-- | Push the pandoc.system module on the Lua stack.
-documentedModule :: LuaError e => Module e
+documentedModule :: forall e. LuaError e => Module e
documentedModule = Module
{ moduleName = "pandoc.system"
- , moduleDescription = "system functions"
+ , moduleDescription = moduleDescription @e MSys.documentedModule
, moduleFields =
[ arch
, os
]
, moduleFunctions =
- [ cputime `since` makeVersion [3, 1, 1]
+ [ cputime `since` v[3,1,1]
, setName "environment" env `since` v[2,7,3]
, setName "get_working_directory" getwd `since` v[2,8]
, setName "list_directory" ls `since` v[2,19]