enumerate: enumerate all the values in a finite type (automatically)

[ data, library, mit, program ] [ Propose Tags ]

provides

  • (1) a typeclass for enumerating all values in a finite type,

  • (2) a generic instance for automatic deriving, and

  • (3) helpers that reify functions (partial or total, monadic or pure) into a Map.

see the Enumerable module for extensive documentation.


[Skip to Readme]

Modules

[Last Documentation]

  • Enumerate
    • Enumerate.Cardinality
    • Enumerate.Enum
    • Enumerate.Example
    • Enumerate.Extra
    • Enumerate.Main
    • Orphans
      • Enumerate.Orphans.Large
    • Enumerate.Types

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

  • No Candidates
Versions [RSS] 0.0.0, 0.1.0, 0.1.1, 0.2.1, 0.2.2
Dependencies array (>=0.5 && <0.6), base (>=4.7 && <5), containers (>=0.5 && <0.6), deepseq (>=1.3), enumerate, ghc-prim (>=0.3 && <0.5), template-haskell (>=2.9), vinyl (>=0.5 && <0.6) [details]
License MIT
Author Sam Boosalis
Maintainer samboosalis@gmail.com
Category Data
Home page https://github.com/sboosali/enumerate
Source repo head: git clone https://github.com/sboosali/enumerate
Uploaded by sboo at 2016-05-17T20:14:10Z
Distributions
Reverse Dependencies 1 direct, 0 indirect [details]
Executables enumerate-example
Downloads 3842 total (15 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs not available [build log]
All reported builds failed as of 2016-11-25 [all 3 reports]

Readme for enumerate-0.2.1

[back to package description]

enumerate

Hackage Build Status

enumerate all the values in a finite type (automatically)

provides (1) a typeclass for enumerating all values in a finite type, (2) a generic instance for automatic deriving, and (3) helpers that reify functions (partial or total, monadic or pure) into a Map.

example

    {-# LANGUAGE DeriveGeneric, DeriveAnyClass #-}
    import Data.Enumerate (Enumerable(..))
    import Data.Generics (Generics)

    data CrudOp = Add | Edit | Delete | View
     deriving (Eq,Ord,Enum,Bounded,Generic,Enumerable)
    data Route = Home | Person CrudOp | House CrudOp
     deriving (Eq,Ord,Generic,Enumerable)

    >>> enumerated :: [Route]
    [Home, Person Add, Person Edit, Person Delete, Person View, House Add, House Edit, House Delete, House View]

(extensive) documentation:

https://hackage.haskell.org/package/enumerate