module Proton.Telescope where

import Proton.Types
import Data.Profunctor.Expansive

-- Foldy optic for expanding structure.
cat :: Expansive p => Optic p [a] b a b
cat :: Optic p [a] b a b
cat = Optic p [a] b a b
forall (p :: * -> * -> *) (f :: * -> *) a b.
(Expansive p, Foldable f) =>
p a b -> p (f a) b
expand