{-# LANGUAGE OverloadedStrings #-} {-| Module : Foreign.Lua.Core.Auxiliary Copyright : © 2007–2012 Gracjan Polak, 2012–2016 Ömer Sinan Ağacan, 2017-2020 Albert Krewinkel License : MIT Maintainer : Albert Krewinkel Stability : beta Portability : non-portable (depends on GHC) Wrappers for the auxiliary library. -} module Foreign.Lua.Core.Auxiliary ( dostring , dofile , getmetafield , getmetatable' , getsubtable , loadbuffer , loadfile , loadstring , newmetatable , newstate , tostring' , traceback -- * References , getref , ref , unref -- * Registry fields , loadedTableRegistryField , preloadTableRegistryField ) where import Control.Exception (IOException, try) import Data.ByteString (ByteString) import Foreign.C (withCString) import Foreign.Lua.Core.Types (Lua, liftLua) import Foreign.Lua.Raw.Auxiliary import Foreign.Lua.Raw.Constants (multret) import Foreign.Lua.Raw.Types (StackIndex, Status) import Foreign.Marshal.Alloc (alloca) import Foreign.Ptr import qualified Data.ByteString as B import qualified Foreign.Lua.Core.Functions as Lua import qualified Foreign.Lua.Core.Types as Lua import qualified Foreign.Lua.Utf8 as Utf8 import qualified Foreign.Storable as Storable -- * The Auxiliary Library -- | Loads and runs the given string. -- -- Returns 'Lua.OK' on success, or an error if either loading of the -- string or calling of the thunk failed. dostring :: ByteString -> Lua Status dostring s = do loadRes <- loadstring s if loadRes == Lua.OK then Lua.pcall 0 multret Nothing else return loadRes -- | Loads and runs the given file. Note that the filepath is interpreted by -- Haskell, not Lua. The resulting chunk is named using the UTF8 encoded -- filepath. dofile :: FilePath -> Lua Status dofile fp = do loadRes <- loadfile fp if loadRes == Lua.OK then Lua.pcall 0 multret Nothing else return loadRes -- | Pushes onto the stack the field @e@ from the metatable of the object at -- index @obj@ and returns the type of the pushed value. If the object does not -- have a metatable, or if the metatable does not have this field, pushes -- nothing and returns TypeNil. getmetafield :: StackIndex -- ^ obj -> String -- ^ e -> Lua Lua.Type getmetafield obj e = liftLua $ \l -> withCString e $ fmap Lua.toType . luaL_getmetafield l obj -- | Pushes onto the stack the metatable associated with name @tname@ in the -- registry (see @newmetatable@) (@nil@ if there is no metatable associated -- with that name). Returns the type of the pushed value. getmetatable' :: String -- ^ tname -> Lua Lua.Type getmetatable' tname = liftLua $ \l -> withCString tname $ fmap Lua.toType . luaL_getmetatable l -- | Push referenced value from the table at the given index. getref :: StackIndex -> Reference -> Lua () getref idx ref' = Lua.rawgeti idx (fromIntegral (Lua.fromReference ref')) -- | Ensures that the value @t[fname]@, where @t@ is the value at index @idx@, -- is a table, and pushes that table onto the stack. Returns True if it finds a -- previous table there and False if it creates a new table. getsubtable :: StackIndex -> String -> Lua Bool getsubtable idx fname = do -- This is a reimplementation of luaL_getsubtable from lauxlib.c. idx' <- Lua.absindex idx Lua.pushstring (Utf8.fromString fname) Lua.gettable idx' isTbl <- Lua.istable Lua.stackTop if isTbl then return True else do Lua.pop 1 Lua.newtable Lua.pushvalue Lua.stackTop -- copy to be left at top Lua.setfield idx' fname return False -- | Loads a ByteString as a Lua chunk. -- -- This function returns the same results as @'Lua.load'@. @name@ is the -- chunk name, used for debug information and error messages. Note that -- @name@ is used as a C string, so it may not contain null-bytes. -- -- See . loadbuffer :: ByteString -- ^ Program to load -> String -- ^ chunk name -> Lua Status loadbuffer bs name = liftLua $ \l -> B.useAsCStringLen bs $ \(str, len) -> withCString name (fmap Lua.toStatus . luaL_loadbuffer l str (fromIntegral len)) -- | Loads a file as a Lua chunk. This function uses @lua_load@ (see -- @'Lua.load'@) to load the chunk in the file named filename. The first -- line in the file is ignored if it starts with a @#@. -- -- The string mode works as in function @'Lua.load'@. -- -- This function returns the same results as @'Lua.load'@, but it has an -- extra error code @'Lua.ErrFile'@ for file-related errors (e.g., it -- cannot open or read the file). -- -- As @'Lua.load'@, this function only loads the chunk; it does not run -- it. -- -- Note that the file is opened by Haskell, not Lua. -- -- See . loadfile :: FilePath -- ^ filename -> Lua Status loadfile fp = Lua.liftIO contentOrError >>= \case Right script -> loadbuffer script ("@" <> fp) Left e -> do Lua.pushstring (Utf8.fromString (show e)) return Lua.ErrFile where contentOrError :: IO (Either IOException ByteString) contentOrError = try (B.readFile fp) -- | Loads a string as a Lua chunk. This function uses @lua_load@ to -- load the chunk in the given ByteString. The given string may not -- contain any NUL characters. -- -- This function returns the same results as @lua_load@ (see -- @'Lua.load'@). -- -- Also as @'Lua.load'@, this function only loads the chunk; it does not -- run it. -- -- See . loadstring :: ByteString -> Lua Status loadstring s = loadbuffer s (Utf8.toString s) -- | If the registry already has the key tname, returns @False@. Otherwise, -- creates a new table to be used as a metatable for userdata, adds to this new -- table the pair @__name = tname@, adds to the registry the pair @[tname] = new -- table@, and returns @True@. (The entry @__name@ is used by some -- error-reporting functions.) -- -- In both cases pushes onto the stack the final value associated with @tname@ in -- the registry. -- -- The value of @tname@ is used as a C string and hence must not contain null -- bytes. -- -- See also: -- . newmetatable :: String -> Lua Bool newmetatable tname = liftLua $ \l -> Lua.fromLuaBool <$> withCString tname (luaL_newmetatable l) -- | Creates a new Lua state. It calls @lua_newstate@ with an allocator -- based on the standard C @realloc@ function and then sets a panic -- function (see -- of the Lua 5.3 Reference Manual) that prints an error message to the -- standard error output in case of fatal errors. -- -- See also: -- . newstate :: IO Lua.State newstate = hsluaL_newstate -- | Creates and returns a reference, in the table at index @t@, for the object -- at the top of the stack (and pops the object). -- -- A reference is a unique integer key. As long as you do not manually add -- integer keys into table @t@, @ref@ ensures the uniqueness of the key it -- returns. You can retrieve an object referred by reference @r@ by calling -- @rawgeti t r@. Function @'unref'@ frees a reference and its associated -- object. -- -- If the object at the top of the stack is nil, @'ref'@ returns the -- constant @'Lua.refnil'@. The constant @'Lua.noref'@ is guaranteed to -- be different from any reference returned by @'ref'@. -- -- See also: . ref :: StackIndex -> Lua Reference ref t = liftLua $ \l -> Lua.toReference <$> luaL_ref l t -- | Converts any Lua value at the given index to a @'ByteString'@ in a -- reasonable format. The resulting string is pushed onto the stack and also -- returned by the function. -- -- If the value has a metatable with a @__tostring@ field, then @tolstring'@ -- calls the corresponding metamethod with the value as argument, and uses the -- result of the call as its result. tostring' :: StackIndex -> Lua B.ByteString tostring' n = do l <- Lua.state e2e <- Lua.errorToException <$> Lua.errorConversion Lua.liftIO $ alloca $ \lenPtr -> do cstr <- hsluaL_tolstring l n lenPtr if cstr == nullPtr then e2e l else do cstrLen <- Storable.peek lenPtr B.packCStringLen (cstr, fromIntegral cstrLen) -- | Creates and pushes a traceback of the stack L1. If a message is given it -- appended at the beginning of the traceback. The level parameter tells at -- which level to start the traceback. traceback :: Lua.State -> Maybe String -> Int -> Lua () traceback l1 msg level = liftLua $ \l -> case msg of Nothing -> luaL_traceback l l1 nullPtr (fromIntegral level) Just msg' -> withCString msg' $ \cstr -> luaL_traceback l l1 cstr (fromIntegral level) -- | Releases reference @'ref'@ from the table at index @idx@ (see @'ref'@). The -- entry is removed from the table, so that the referred object can be -- collected. The reference @'ref'@ is also freed to be used again. -- -- See also: -- . unref :: StackIndex -- ^ idx -> Reference -- ^ ref -> Lua () unref idx r = liftLua $ \l -> luaL_unref l idx (Lua.fromReference r)