{-# LANGUAGE CPP #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE UndecidableInstances #-}
{-# OPTIONS_GHC -fno-warn-orphans #-}
module Data.Wedge.Lens
( 
  _WedgeIso
  
, here
, there
  
, _Nowhere
, _Here
, _There
) where
import Control.Lens
import Data.Wedge
_WedgeIso :: Iso (Wedge a b) (Wedge c d) (Maybe (Either a b)) (Maybe (Either c d))
_WedgeIso :: p (Maybe (Either a b)) (f (Maybe (Either c d)))
-> p (Wedge a b) (f (Wedge c d))
_WedgeIso = (Wedge a b -> Maybe (Either a b))
-> (Maybe (Either c d) -> Wedge c d)
-> Iso
     (Wedge a b) (Wedge c d) (Maybe (Either a b)) (Maybe (Either c d))
forall s a b t. (s -> a) -> (b -> t) -> Iso s t a b
iso Wedge a b -> Maybe (Either a b)
forall a b. Wedge a b -> Maybe (Either a b)
f Maybe (Either c d) -> Wedge c d
forall a b. Maybe (Either a b) -> Wedge a b
g
  where
    f :: Wedge a b -> Maybe (Either a b)
f Wedge a b
Nowhere = Maybe (Either a b)
forall a. Maybe a
Nothing
    f (Here a
a) = Either a b -> Maybe (Either a b)
forall a. a -> Maybe a
Just (a -> Either a b
forall a b. a -> Either a b
Left a
a)
    f (There b
b) = Either a b -> Maybe (Either a b)
forall a. a -> Maybe a
Just (b -> Either a b
forall a b. b -> Either a b
Right b
b)
    g :: Maybe (Either a b) -> Wedge a b
g Maybe (Either a b)
Nothing = Wedge a b
forall a b. Wedge a b
Nowhere
    g (Just (Left a
a)) = a -> Wedge a b
forall a b. a -> Wedge a b
Here a
a
    g (Just (Right b
b)) = b -> Wedge a b
forall a b. b -> Wedge a b
There b
b
here :: Traversal' (Wedge a b) a
here :: (a -> f a) -> Wedge a b -> f (Wedge a b)
here a -> f a
f = \case
  Wedge a b
Nowhere -> Wedge a b -> f (Wedge a b)
forall (f :: * -> *) a. Applicative f => a -> f a
pure Wedge a b
forall a b. Wedge a b
Nowhere
  Here a
a -> a -> Wedge a b
forall a b. a -> Wedge a b
Here (a -> Wedge a b) -> f a -> f (Wedge a b)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> a -> f a
f a
a
  There b
b -> Wedge a b -> f (Wedge a b)
forall (f :: * -> *) a. Applicative f => a -> f a
pure (b -> Wedge a b
forall a b. b -> Wedge a b
There b
b)
there :: Traversal' (Wedge a b) b
there :: (b -> f b) -> Wedge a b -> f (Wedge a b)
there b -> f b
f = \case
  Wedge a b
Nowhere -> Wedge a b -> f (Wedge a b)
forall (f :: * -> *) a. Applicative f => a -> f a
pure Wedge a b
forall a b. Wedge a b
Nowhere
  Here a
a -> Wedge a b -> f (Wedge a b)
forall (f :: * -> *) a. Applicative f => a -> f a
pure (a -> Wedge a b
forall a b. a -> Wedge a b
Here a
a)
  There b
b -> b -> Wedge a b
forall a b. b -> Wedge a b
There (b -> Wedge a b) -> f b -> f (Wedge a b)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> b -> f b
f b
b
_Nowhere :: Prism' (Wedge a b) ()
_Nowhere :: p () (f ()) -> p (Wedge a b) (f (Wedge a b))
_Nowhere = (() -> Wedge a b)
-> (Wedge a b -> Either (Wedge a b) ())
-> Prism (Wedge a b) (Wedge a b) () ()
forall b t s a. (b -> t) -> (s -> Either t a) -> Prism s t a b
prism (Wedge a b -> () -> Wedge a b
forall a b. a -> b -> a
const Wedge a b
forall a b. Wedge a b
Nowhere) ((Wedge a b -> Either (Wedge a b) ())
 -> Prism (Wedge a b) (Wedge a b) () ())
-> (Wedge a b -> Either (Wedge a b) ())
-> Prism (Wedge a b) (Wedge a b) () ()
forall a b. (a -> b) -> a -> b
$ \case
  Wedge a b
Nowhere -> () -> Either (Wedge a b) ()
forall a b. b -> Either a b
Right ()
  Here a
a -> Wedge a b -> Either (Wedge a b) ()
forall a b. a -> Either a b
Left (a -> Wedge a b
forall a b. a -> Wedge a b
Here a
a)
  There b
b -> Wedge a b -> Either (Wedge a b) ()
forall a b. a -> Either a b
Left (b -> Wedge a b
forall a b. b -> Wedge a b
There b
b)
_Here :: Prism (Wedge a b) (Wedge c b) a c
_Here :: p a (f c) -> p (Wedge a b) (f (Wedge c b))
_Here = (c -> Wedge c b)
-> (Wedge a b -> Either (Wedge c b) a)
-> Prism (Wedge a b) (Wedge c b) a c
forall b t s a. (b -> t) -> (s -> Either t a) -> Prism s t a b
prism c -> Wedge c b
forall a b. a -> Wedge a b
Here ((Wedge a b -> Either (Wedge c b) a)
 -> Prism (Wedge a b) (Wedge c b) a c)
-> (Wedge a b -> Either (Wedge c b) a)
-> Prism (Wedge a b) (Wedge c b) a c
forall a b. (a -> b) -> a -> b
$ \case
  Here a
a -> a -> Either (Wedge c b) a
forall a b. b -> Either a b
Right a
a
  There b
b -> Wedge c b -> Either (Wedge c b) a
forall a b. a -> Either a b
Left (b -> Wedge c b
forall a b. b -> Wedge a b
There b
b)
  Wedge a b
Nowhere -> Wedge c b -> Either (Wedge c b) a
forall a b. a -> Either a b
Left Wedge c b
forall a b. Wedge a b
Nowhere
_There :: Prism (Wedge a b) (Wedge a d) b d
_There :: p b (f d) -> p (Wedge a b) (f (Wedge a d))
_There = (d -> Wedge a d)
-> (Wedge a b -> Either (Wedge a d) b)
-> Prism (Wedge a b) (Wedge a d) b d
forall b t s a. (b -> t) -> (s -> Either t a) -> Prism s t a b
prism d -> Wedge a d
forall a b. b -> Wedge a b
There ((Wedge a b -> Either (Wedge a d) b)
 -> Prism (Wedge a b) (Wedge a d) b d)
-> (Wedge a b -> Either (Wedge a d) b)
-> Prism (Wedge a b) (Wedge a d) b d
forall a b. (a -> b) -> a -> b
$ \case
  There b
b -> b -> Either (Wedge a d) b
forall a b. b -> Either a b
Right b
b
  Here a
a -> Wedge a d -> Either (Wedge a d) b
forall a b. a -> Either a b
Left (a -> Wedge a d
forall a b. a -> Wedge a b
Here a
a)
  Wedge a b
Nowhere -> Wedge a d -> Either (Wedge a d) b
forall a b. a -> Either a b
Left Wedge a d
forall a b. Wedge a b
Nowhere
#if ! MIN_VERSION_lens(5,0,0)
instance Swapped Wedge where
  swapped = iso swapWedge swapWedge
#endif
instance (a ~ a', b ~ b') => Each (Wedge a a') (Wedge b b') a b where
  each :: (a -> f b) -> Wedge a a' -> f (Wedge b b')
each a -> f b
_ Wedge a a'
Nowhere = Wedge b b' -> f (Wedge b b')
forall (f :: * -> *) a. Applicative f => a -> f a
pure Wedge b b'
forall a b. Wedge a b
Nowhere
  each a -> f b
f (Here a
a) = b -> Wedge b b'
forall a b. a -> Wedge a b
Here (b -> Wedge b b') -> f b -> f (Wedge b b')
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> a -> f b
f a
a
  each a -> f b
f (There a'
a) = b -> Wedge b b
forall a b. b -> Wedge a b
There (b -> Wedge b b) -> f b -> f (Wedge b b)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> a -> f b
f a
a'
a