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

Pandora.Paradigm.Inventory.Some.Optics

Synopsis

Documentation

type Lens = P_Q_T (->) Store Source #

type family Convex lens where ... Source #

Equations

Convex Lens = Lens Exactly 

type family Obscure lens where ... Source #

Equations

Obscure Lens = Lens Maybe 

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

type (@>>>) source target = forall a. Lens target (source a) a infixr 6 Source #

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.Some.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 Exactly Maybe Source # 
Instance details

Defined in Pandora.Paradigm.Inventory.Some.Optics

Associated Types

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

Methods

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

Lensic Maybe Exactly Source # 
Instance details

Defined in Pandora.Paradigm.Inventory.Some.Optics

Associated Types

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

Methods

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

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

replace :: forall i source target. i target -> Lens i source target -> source -> source Source #

mutate :: (i target -> i target) -> Lens i source target -> source -> source Source #

transwrap :: (Covariant (->) (->) u, Liftable (->) t, Lowerable (->) t) => (Lens u < t u e) < e Source #

primary :: Interpreted (->) t => (Lens Exactly < t a) < Primary t a Source #

Orphan instances

Semigroupoid (Lens Exactly) Source # 
Instance details

Methods

(.) :: Lens Exactly b c -> Lens Exactly a b -> Lens Exactly 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 Exactly) Source # 
Instance details

Category (Lens Maybe) Source # 
Instance details

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

Methods

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

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

Associated Types

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

Methods

imply :: Arguments (P_Q_T (->) Store Exactly 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 #

Gettable (Lens Exactly) Source # 
Instance details

Associated Types

type Getting (Lens Exactly) e r Source #

Methods

get :: Getting (Lens Exactly) e r Source #

Gettable (Lens Maybe) Source # 
Instance details

Associated Types

type Getting (Lens Maybe) e r Source #

Methods

get :: Getting (Lens Maybe) e r Source #

Pointable t => Settable (Lens t :: Type -> Type -> Type) Source # 
Instance details

Associated Types

type Setting (Lens t) e r Source #

Methods

set :: Setting (Lens t) e r Source #

(Gettable (Lens t), Covariant ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) t, Pointable t) => Modifiable (Lens t :: Type -> Type -> Type) Source # 
Instance details

Associated Types

type Modification (Lens t) e r Source #

Methods

modify :: Modification (Lens t) e r Source #