eve-cli

[ bsd3, library, program, unclassified ] [ Propose Tags ]

Please see the README on Github at https://github.com/ChrisPenner/eve-cli#readme


[Skip to Readme]

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

  • No Candidates
Versions [RSS] 0.2.0.0
Change log ChangeLog.md
Dependencies base (>=4.7 && <5), bytestring (>=0.10 && <0.11), eve (>=0.1 && <0.2), eve-cli, lens (>=4.16 && <4.17), mtl (>=2.2 && <2.3), text (>=1.2 && <1.3), vty (>=5.20 && <6) [details]
License BSD-3-Clause
Copyright Chris Penner
Author Chris Penner
Maintainer christopher.penner@gmail.com
Home page https://github.com/ChrisPenner/eve-cli#readme
Bug tracker https://github.com/ChrisPenner/eve-cli/issues
Source repo head: git clone https://github.com/ChrisPenner/eve-cli
Uploaded by ChrisPenner at 2018-04-05T02:47:43Z
Distributions
Executables eve-cli-exe
Downloads 689 total (4 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs available [build log]
Last success reported on 2018-04-14 [all 1 reports]

Readme for eve-cli-0.2.0.0

[back to package description]

Eve.CLI

Eve.CLI provides eve compatible helpers for building CLI apps. It allows you to:

  • Respond to Keyboard, Mouse, and Resize Events
  • Render text/images to your terminal

Here's what it looks like:

module Main where

import Eve (eve_, App, exit)
import Eve.CLI (initCLI, onKeypress_, renderImage, Keypress(..))
import qualified Data.Text.Lazy as T
import qualified Graphics.Vty as V
import Control.Monad (void)

main :: IO ()
main = eve_ $ do
  initCLI
  onKeypress_ showKeypress
    where
      -- | Display the last key combination that you pressed on screen
      showKeypress :: Keypress -> App ()
      showKeypress (Keypress V.KEsc _) = exit
      showKeypress keypress = void . renderImage $ V.text V.defAttr . T.pack . show $ keypress

Events

Eve.CLI is a small wrapper on top of vty; so you'll also need to import Graphics.Vty in order to interact with most events. The following event listeners are provided:

  • onEvent
  • onKeypress
  • onMouseDown
  • onMouseUp
  • onResize
  • onPaste

See the hackage docs for more in depth API documentation.

Rendering

Currently Eve.CLI supports only rendering a Vty.Image; this means you can use any of `Vty`'s image building combinators, then simply call renderImage with the image you've built.