hslua-repl: Isocline-based Lua REPL

[ foreign, library, mit ] [ Propose Tags ]

An embeddable Lua REPL built with Isocline and HsLua.


[Skip to Readme]

Modules

[Index] [Quick Jump]

Flags

Automatic Flags
NameDescriptionDefault
executable

Compile luarepl standalone executable.

Disabled

Use -f <flag> to enable a flag, or -f -<flag> to disable that flag. More info

Downloads

Note: This package has metadata revisions in the cabal description newer than included in the tarball. To unpack the package including the revisions, use 'cabal get'.

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

  • No Candidates
Versions [RSS] 0.1.0, 0.1.1, 0.1.2
Change log CHANGELOG.md
Dependencies base (>=4.11 && <5), bytestring (>=0.10 && <0.12), hslua-core (>=2.3 && <2.4), hslua-repl, isocline (>=1.0 && <1.1), lua (>=2.3 && <2.4), text (>=1.2 && <2.1) [details]
License MIT
Copyright © 2023 Albert Krewinkel
Author Albert Krewinkel
Maintainer Albert Krewinkel <tarleb@hslua.org>
Revised Revision 1 made by tarleb at 2023-03-17T08:00:44Z
Category Foreign
Home page https://hslua.org/
Bug tracker https://github.com/hslua/hslua/issues
Source repo head: git clone https://github.com/hslua/hslua(hslua-repl)
Uploaded by tarleb at 2023-03-16T21:37:40Z
Distributions Arch:0.1.2, Fedora:0.1.1, LTSHaskell:0.1.2, NixOS:0.1.2, Stackage:0.1.2, openSUSE:0.1.2
Reverse Dependencies 2 direct, 1 indirect [details]
Executables luarepl
Downloads 1658 total (141 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs available [build log]
Last success reported on 2023-03-17 [all 1 reports]

Readme for hslua-repl-0.1.0

[back to package description]

hslua-repl

An embeddable, isocline-based Lua REPL.

Example

{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TypeApplications  #-}
import HsLua.Core  as Lua (Exception, openlibs, run)
import HsLua.REPL (defaultREPLConfig, startREPL)

-- | Run a default Lua interpreter.
main :: IO ()
main = run @Lua.Exception $ do
  startREPL defaultREPLConfig