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