module Lens.Labels (
    
    LensFn(..),
    LensLike,
    LensLike',
    (&),
    (Category..),
    Lens,
    
    HasLens(..),
    Proxy#,
    proxy#,
    
    ASetter,
    (.~),
    (%~),
    set,
    over,
    
    Const(..),
    Getting,
    (^.),
    view,
    ) where
import qualified Control.Category as Category
import GHC.Prim (Proxy#, proxy#)
#if __GLASGOW_HASKELL__ >= 800
import GHC.OverloadedLabels (IsLabel(..))
#endif
import GHC.TypeLits (Symbol)
import Data.Function ((&))
#if __GLASGOW_HASKELL__ >= 800
import Data.Functor.Const (Const(..))
#else
import Control.Applicative (Const(..))
#endif
import Data.Functor.Identity(Identity(..))
newtype LensFn a b = LensFn {runLens :: a -> b}
                        deriving Category.Category
type LensLike f s t a b = LensFn (a -> f b) (s -> f t)
type LensLike' f s a = LensLike f s s a a
type Lens s t a b = forall f . Functor f => LensLike f s t a b
class HasLens (x :: Symbol) f s t a b
        | x s -> a, x t -> b, x s b -> t, x t a -> s where
    lensOf :: Proxy# x -> (a -> f b) -> s -> f t
#if __GLASGOW_HASKELL__ >= 800
instance
    (p ~ (a -> f b), q ~ (s -> f t), HasLens x f s t a b)
    => IsLabel x (LensFn p q) where
    fromLabel p = LensFn $ lensOf p
#endif
type ASetter s t a b = LensLike Identity s t a b
(.~), set :: ASetter s t a b -> b -> s -> t
f .~ x = f %~ const x
set = (.~)
infixr 4 .~
(%~), over :: ASetter s t a b -> (a -> b) -> s -> t
f %~ g = \s -> runIdentity $ runLens f (Identity . g) s
over = (%~)
infixr 4 %~
type Getting r s t a b = LensLike (Const r) s t a b
(^.), view :: s -> Getting a s t a b -> a
s ^. f = getConst $ runLens f Const s
view = (^.)
infixl 8 ^.