lens-family-th: Generate lens-family style lenses

[ bsd3, data, library ] [ Propose Tags ]

Due to a cabal/hackage defect, curly braces cannot be adequately displayed here. Please see http://github.com/DanBurton/lens-family-th#readme for a proper description of this package.

(See https://github.com/haskell/cabal/issues/968 for the ticket I created regarding the defect.)


[Skip to Readme]

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

Versions [RSS] 0.1.0.0, 0.2.0.0, 0.2.0.1, 0.3.0.0, 0.4.0.0, 0.4.1.0, 0.5.0.0, 0.5.0.1, 0.5.0.2, 0.5.1.0, 0.5.2.0, 0.5.2.1, 0.5.3.0, 0.5.3.1
Dependencies base (>=4.9 && <4.12), template-haskell (>=2.11 && <2.14) [details]
License BSD-3-Clause
Copyright (c) Dan Burton 2012-2017
Author Dan Burton
Maintainer danburton.email@gmail.com
Revised Revision 1 made by DanBurton at 2018-01-05T02:21:26Z
Category Data
Home page http://github.com/DanBurton/lens-family-th#readme
Bug tracker http://github.com/DanBurton/lens-family-th/issues
Source repo head: git clone git://github.com/DanBurton/lens-family-th.git
this: git clone git://github.com/DanBurton/lens-family-th.git(tag lens-family-th-0.5.0.1)
Uploaded by DanBurton at 2017-08-05T18:05:08Z
Distributions NixOS:0.5.3.1, Stackage:0.5.3.1
Reverse Dependencies 8 direct, 60 indirect [details]
Downloads 14877 total (62 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs available [build log]
Last success reported on 2017-08-05 [all 1 reports]

Readme for lens-family-th-0.5.0.1

[back to package description]

lens-family-th

build status

Template Haskell to generate lenses for lens-family and lens-family-core.

Usage:

{-# LANGUAGE TemplateHaskell, Rank2Types #-}

import Lens.Family2
import Lens.Family2.TH

data Foo a = Foo { _bar :: Int, _baz :: a }
         deriving (Show, Read, Eq, Ord)
$(makeLenses ''Foo)

This will create lenses bar and baz.

You can instead create these lenses by hand as explained by documentation at Lens.Family.Unchecked.

makeLenses merely generates the following definition for each field, making use of Haskell's record update syntax:

lensName f a = (\x -> a { fieldName = x }) `fmap` f (fieldName a)

makeLenses will refuse to create lenses for data declarations with more than 1 constructor.


For data types with multiple constructors, you can use makeTraversals. For example:

{-# LANGUAGE TemplateHaskell, Rank2Types #-}

import Lens.Family2
import Lens.Family2.TH

data T a c d = A a | B | CD c d Int
$(makeTraversals ''T)

Will create traversals _A, _B, and _C in this fashion:

_A k (A a) = fmap (\a -> A a) (k a)
_A _  B    = pure B
_A _ (C c d i) = pure (C c d i)

_B _ (A a) = pure (A a)
_B k B = fmap (\() -> B) (k ())
_B _ (C c d i) = pure (C c d i)

_C _ (A a) = pure (A a)
_C _ B = pure B
_C k (C c d i) = fmap (\(c',d',i') -> C c' d' i') (k (c,d,i))