editable: Interactive editors for Generics

[ bsd2, data, library ] [ Propose Tags ]

Editable can derive editors for data types.

Add deriving Generic and instance Editable Foo to your data type, and you can launch an editor for it with editor :: Editable a => a -> IO a.

module Demo where

import Data.Editable
import GHC.Generics

data Foo = Bar String Int | Baz Int
  deriving (Show, Generic)

instance Editable Foo

Modules

[Index]

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

  • No Candidates
Versions [RSS] 1.0.0.0, 1.0.0.1, 1.0.0.2
Dependencies base (>=4.6 && <4.8), text (>=1.1 && <1.2), vty (==4.7.5), vty-ui (>=1.7 && <1.8) [details]
License BSD-2-Clause
Copyright Copyright (C) 2014 Maxwell Swadling
Author Maxwell Swadling
Maintainer maxwellswadling@gmail.com
Category Data
Home page https://github.com/maxpow4h/editable
Bug tracker https://github.com/maxpow4h/editable/issues
Source repo head: git clone git://github.com/maxpow4h/editable.git
Uploaded by MaxwellSwadling at 2014-10-05T04:00:24Z
Distributions
Reverse Dependencies 1 direct, 0 indirect [details]
Downloads 2412 total (8 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs uploaded by user
Build status unknown [no reports yet]