| Portability | rank 2 types, MPTCs, TFs, flexible | 
|---|---|
| Stability | provisional | 
| Maintainer | Edward Kmett <ekmett@gmail.com> | 
| Safe Haskell | Trustworthy | 
Control.Lens.IndexedLens
Description
- type IndexedLens i s t a b = forall f k. (Indexable i k, Functor f) => k (a -> f b) (s -> f t)
- (%%@~) :: Overloaded (Indexed i) f s t a b -> (i -> a -> f b) -> s -> f t
- (<%@~) :: Overloaded (Indexed i) ((,) b) s t a b -> (i -> a -> b) -> s -> (b, t)
- (%%@=) :: MonadState s m => Overloaded (Indexed i) ((,) r) s s a b -> (i -> a -> (r, b)) -> m r
- (<%@=) :: MonadState s m => Overloaded (Indexed i) ((,) b) s s a b -> (i -> a -> b) -> m b
- newtype  ReifiedIndexedLens i s t a b = ReifyIndexedLens {- reflectIndexedLens :: IndexedLens i s t a b
 
- class  Contains k m | m -> k where- contains :: k -> SimpleIndexedLens k m Bool
 
- resultAt :: Eq e => e -> SimpleIndexedLens e (e -> a) a
- type SimpleIndexedLens i s a = IndexedLens i s s a a
- type SimpleReifiedIndexedLens i s a = ReifiedIndexedLens i s s a a
Indexed Lenses
type IndexedLens i s t a b = forall f k. (Indexable i k, Functor f) => k (a -> f b) (s -> f t)Source
Every IndexedLens is a valid Lens and a valid IndexedTraversal.
Indexed Lens Combinators
(%%@~) :: Overloaded (Indexed i) f s t a b -> (i -> a -> f b) -> s -> f tSource
Adjust the target of an IndexedLens returning a supplementary result, or
 adjust all of the targets of an IndexedTraversal and return a monoidal summary
 of the supplementary results and the answer.
(%%@~) ≡withIndex
(%%@~) ::Functorf =>IndexedLensi s t a b -> (i -> a -> f b) -> s -> f t (%%@~) ::Functorf =>IndexedTraversali s t a b -> (i -> a -> f b) -> s -> f t
In particular, it is often useful to think of this function as having one of these even more restrictive type signatures
(%%@~) ::IndexedLensi s t a b -> (i -> a -> (r, b)) -> s -> (r, t) (%%@~) ::Monoidr =>IndexedTraversali s t a b -> (i -> a -> (r, b)) -> s -> (r, t)
(<%@~) :: Overloaded (Indexed i) ((,) b) s t a b -> (i -> a -> b) -> s -> (b, t)Source
Adjust the target of an IndexedLens returning the intermediate result, or
 adjust all of the targets of an IndexedTraversal and return a monoidal summary
 along with the answer.
l<%~f ≡ l<%@~constf
When you do not need access to the index then (<%~) is more liberal in what it can accept.
If you do not need the intermediate result, you can use (%@~) or even (%~).
(<%@~) ::IndexedLensi s t a b -> (i -> a -> b) -> s -> (b, t) (<%@~) ::Monoidb =>IndexedTraversali s t a b -> (i -> a -> b) -> s -> (b, t)
(%%@=) :: MonadState s m => Overloaded (Indexed i) ((,) r) s s a b -> (i -> a -> (r, b)) -> m rSource
Adjust the target of an IndexedLens returning a supplementary result, or
 adjust all of the targets of an IndexedTraversal within the current state, and
 return a monoidal summary of the supplementary results.
l%%@=f ≡state(l%%@~f)
(%%@=) ::MonadStates mIndexedLensi s s a b -> (i -> a -> (r, b)) -> s -> m r (%%@=) :: (MonadStates m,Monoidr) =>IndexedTraversali s s a b -> (i -> a -> (r, b)) -> s -> m r
(<%@=) :: MonadState s m => Overloaded (Indexed i) ((,) b) s s a b -> (i -> a -> b) -> m bSource
Adjust the target of an IndexedLens returning the intermediate result, or
 adjust all of the targets of an IndexedTraversal within the current state, and
 return a monoidal summary of the intermediate results.
(<%@=) ::MonadStates mIndexedLensi s s a b -> (i -> a -> b) -> m b (<%@=) :: (MonadStates m,Monoidb) =>IndexedTraversali s s a b -> (i -> a -> b) -> m b
Storing Indexed Lenses
newtype ReifiedIndexedLens i s t a b Source
Useful for storage.
Constructors
| ReifyIndexedLens | |
| Fields 
 | |
Common Indexed Lenses
class Contains k m | m -> k whereSource
Provides an IndexedLens that can be used to read, write or delete a member of a set-like container
Methods
contains :: k -> SimpleIndexedLens k m BoolSource
>>>contains 3 .~ False $ IntSet.fromList [1,2,3,4]fromList [1,2,4]
resultAt :: Eq e => e -> SimpleIndexedLens e (e -> a) aSource
This lens can be used to change the result of a function but only where the arguments match the key given.
>>>let f = (+1) & resultAt 3 .~ 8 in (f 2, f 3)(3,8)
Simple
type SimpleIndexedLens i s a = IndexedLens i s s a aSource
typeSimpleIndexedLensi =Simple(IndexedLensi)
type SimpleReifiedIndexedLens i s a = ReifiedIndexedLens i s s a aSource
typeSimpleIndexedLensi =Simple(ReifiedIndexedLensi)