The haddock module header contains essentially the same information, so the boilerplate is redundant and just one more thing to get out of sync.
26 lines
644 B
Haskell
26 lines
644 B
Haskell
{-# LANGUAGE NoImplicitPrelude #-}
|
||
{- |
|
||
Module : Text.Pandoc.Lua
|
||
Copyright : Copyright © 2017–2019 Albert Krewinkel
|
||
License : GNU GPL, version 2 or above
|
||
|
||
Maintainer : Albert Krewinkel <tarleb+pandoc@moltkeplatz.de>
|
||
Stability : alpha
|
||
|
||
Running pandoc Lua filters.
|
||
-}
|
||
module Text.Pandoc.Lua
|
||
( runLua
|
||
, LuaException (..)
|
||
-- * Lua globals
|
||
, Global (..)
|
||
, setGlobals
|
||
-- * Filters
|
||
, runFilterFile
|
||
) where
|
||
|
||
import Text.Pandoc.Lua.Filter (runFilterFile)
|
||
import Text.Pandoc.Lua.Global (Global (..), setGlobals)
|
||
import Text.Pandoc.Lua.Init (LuaException (..), runLua)
|
||
import Text.Pandoc.Lua.Marshaling ()
|
||
|