pandora-0.4.9: A box of patterns and paradigms
Safe HaskellSafe-Inferred
LanguageHaskell2010

Pandora.Paradigm.Inventory.Optics

Synopsis

Documentation

type Lens = P_Q_T (->) Store Source #

type family Convex lens where ... Source #

Equations

Convex Lens = Lens Identity 

type family Obscure lens where ... Source #

Equations

Obscure Lens = Lens Maybe 

type (#=@) source target available = forall a. Lens available (source a) (target a) infixl 2 Source #

view :: Lens available source target -> source -> available target Source #

Get focused target value

set :: Lens available source target -> available target -> source -> source Source #

over :: Lens available source target -> (available target -> available target) -> source -> source Source #

Modify focused target value

represent :: forall t a. (Representable t, Setoid (Representation t)) => Representation t -> Convex Lens (t a) a Source #

Representable based lens

class Lensic previous next where Source #

Associated Types

type Lensally previous next :: * -> * Source #

Methods

(>>>) :: Lens previous source between -> Lens next between target -> Lens (Lensally previous next) source target Source #

Instances

Instances details
Semigroupoid (Lens t) => Lensic t t Source # 
Instance details

Defined in Pandora.Paradigm.Inventory.Optics

Associated Types

type Lensally t t :: Type -> Type Source #

Methods

(>>>) :: Lens t source between -> Lens t between target -> Lens (Lensally t t) source target Source #

Lensic Identity Maybe Source # 
Instance details

Defined in Pandora.Paradigm.Inventory.Optics

Associated Types

type Lensally Identity Maybe :: Type -> Type Source #

Methods

(>>>) :: Lens Identity source between -> Lens Maybe between target -> Lens (Lensally Identity Maybe) source target Source #

Lensic Maybe Identity Source # 
Instance details

Defined in Pandora.Paradigm.Inventory.Optics

Associated Types

type Lensally Maybe Identity :: Type -> Type Source #

Methods

(>>>) :: Lens Maybe source between -> Lens Identity between target -> Lens (Lensally Maybe Identity) source target Source #

Orphan instances

Semigroupoid (Lens Identity) Source # 
Instance details

Methods

(.) :: Lens Identity b c -> Lens Identity a b -> Lens Identity a c Source #

Semigroupoid (Lens Maybe) Source # 
Instance details

Methods

(.) :: Lens Maybe b c -> Lens Maybe a b -> Lens Maybe a c Source #

Category (Lens Identity) Source # 
Instance details

Category (Lens Maybe) Source # 
Instance details

Methods

identity :: Lens Maybe a a Source #

(#) :: Lens Maybe (Lens Maybe a b) (Lens Maybe a b) Source #

Semimonoidal (-->) (:*:) (:*:) (Lens Identity source :: Type -> Type) Source # 
Instance details

Methods

mult :: forall (a :: k) (b :: k). (Lens Identity source a :*: Lens Identity source b) --> Lens Identity source (a :*: b) Source #

Impliable (P_Q_T ((->) :: Type -> Type -> Type) Store Identity source target :: Type) Source # 
Instance details

Associated Types

type Arguments (P_Q_T (->) Store Identity source target) = (args :: Type) Source #

Methods

imply :: Arguments (P_Q_T (->) Store Identity source target) Source #

Impliable (P_Q_T ((->) :: Type -> Type -> Type) Store Maybe source target :: Type) Source # 
Instance details

Associated Types

type Arguments (P_Q_T (->) Store Maybe source target) = (args :: Type) Source #

Methods

imply :: Arguments (P_Q_T (->) Store Maybe source target) Source #

Invariant (Flip (Lens available) tgt) Source # 
Instance details

Methods

(<!<) :: (a -> b) -> (b -> a) -> Flip (Lens available) tgt a -> Flip (Lens available) tgt b Source #

invmap :: (a -> b) -> (b -> a) -> Flip (Lens available) tgt a -> Flip (Lens available) tgt b Source #