| Safe Haskell | None |
|---|
Lens.Family2.TH
Description
Derive lenses for Lens.Family2.
Example usage:
{-# LANGUAGE TemplateHaskell, Rank2Types -#}
import Lens.Family2
import Lens.Family2.TH
data Foo a = Foo { _bar :: Int, _baz :: a }
deriving (Show, Read, Eq, ord)
$(mkLenses ''Foo)