proton-0.0.4
Safe HaskellNone
LanguageHaskell2010

Proton.Traversal

Documentation

type Traversal s t a b = forall p. Traversing p => p a b -> p s t Source #

type Traversal' s a = forall p. Traversing p => p a a -> p s s Source #

traversed :: Traversable f => Traversal (f a) (f b) a b Source #

filtered :: (a -> Bool) -> Traversal' a a Source #

traverseOf :: Optic (Star f) s t a b -> (a -> f b) -> s -> f t Source #

(%%~) :: Optic (Star f) s t a b -> (a -> f b) -> s -> f t infixr 4 Source #

beside :: forall s t a b s' t' p r. (Representable p, Bitraversable r, Applicative (Rep p)) => Optic p s t a b -> Optic p s' t' a b -> Optic p (r s s') (r t t') a b Source #

unsafePartsOf :: forall s t a b. (forall p. Traversing p => p a b -> p s t) -> Lens s t [a] [b] Source #

partsOf :: forall s a. (forall p. Traversing p => p a a -> p s s) -> Lens' s [a] Source #

taking :: forall q s a. Traversing q => Int -> (forall p. Traversing p => p a a -> p s s) -> Optic' q s a Source #

dropping :: forall s a. Int -> Traversal' s a -> Traversal' s a Source #