stochaskell-1.0.0: A probabilistic programming language

Copyright(c) David A Roberts 2015-2021
LicenseGPL-3
Maintainerd@vidr.cc
Stabilityexperimental
Safe HaskellNone
LanguageHaskell2010

Language.Stochaskell.Plot

Contents

Description

 
Synopsis

Documentation

class PlotP t where #

Minimal complete definition

plotP

Methods

plotP :: P (Expression t) -> Int -> String -> IO ChartPlot #

plotP' :: P (Expression t) -> Int -> String -> IO ChartPlot #

restricted to positive domain

Instances
PlotP Double # 
Instance details

Defined in Language.Stochaskell.Plot

Methods

plotP :: P (Expression Double) -> Int -> String -> IO ChartPlot #

plotP' :: P (Expression Double) -> Int -> String -> IO ChartPlot #

PlotP Integer # 
Instance details

Defined in Language.Stochaskell.Plot

Methods

plotP :: P (Expression Integer) -> Int -> String -> IO ChartPlot #

plotP' :: P (Expression Integer) -> Int -> String -> IO ChartPlot #

class ToImage a where #

Methods

toPNG :: String -> a -> IO () #

toSVG :: String -> a -> IO () #

Instances
ToImage (Renderable a) # 
Instance details

Defined in Language.Stochaskell.Plot

Methods

toPNG :: String -> Renderable a -> IO () #

toSVG :: String -> Renderable a -> IO () #

ToImage (QDiagram Cairo V2 Double Any) # 
Instance details

Defined in Language.Stochaskell.Plot

Methods

toPNG :: String -> QDiagram Cairo V2 Double Any -> IO () #

toSVG :: String -> QDiagram Cairo V2 Double Any -> IO () #

kde :: Double -> [Double] -> [(Double, Double)] #

kde' :: [Double] -> [(Double, Double)] #

kdeplot :: String -> Double -> [Double] -> ChartPlot #

kdeplot' :: String -> [Double] -> ChartPlot #

plotHist :: String -> [Double] -> (Double, Double) -> Double -> ChartPlot #

plotUnder :: String -> [(Double, Double)] -> ChartPlot #

plotpdf :: String -> P R -> (Double, Double) -> ChartPlot #

plotStep :: String -> (Double, Double) -> [Double] -> ChartPlot #

renderAxis2 :: State (Axis Cairo V2 Double) () -> QDiagram Cairo V2 Double Any #

xlabel :: MonadState (Layout x y) m => String -> m () #

xlim :: (MonadState (Layout x y) m, RealFloat x, Show x) => (x, x) -> m () #

ylabel :: MonadState (Layout x y) m => String -> m () #

ylim :: (MonadState (Layout x y) m, RealFloat y, Show y) => (y, y) -> m () #

Re-exports

Graphics.Rendering.Chart.Easy

class (Functor t, Foldable t) => Traversable (t :: Type -> Type) where #

Functors representing data structures that can be traversed from left to right.

A definition of traverse must satisfy the following laws:

naturality
t . traverse f = traverse (t . f) for every applicative transformation t
identity
traverse Identity = Identity
composition
traverse (Compose . fmap g . f) = Compose . fmap (traverse g) . traverse f

A definition of sequenceA must satisfy the following laws:

naturality
t . sequenceA = sequenceA . fmap t for every applicative transformation t
identity
sequenceA . fmap Identity = Identity
composition
sequenceA . fmap Compose = Compose . fmap sequenceA . sequenceA

where an applicative transformation is a function

t :: (Applicative f, Applicative g) => f a -> g a

preserving the Applicative operations, i.e.

and the identity functor Identity and composition of functors Compose are defined as

  newtype Identity a = Identity a

  instance Functor Identity where
    fmap f (Identity x) = Identity (f x)

  instance Applicative Identity where
    pure x = Identity x
    Identity f <*> Identity x = Identity (f x)

  newtype Compose f g a = Compose (f (g a))

  instance (Functor f, Functor g) => Functor (Compose f g) where
    fmap f (Compose x) = Compose (fmap (fmap f) x)

  instance (Applicative f, Applicative g) => Applicative (Compose f g) where
    pure x = Compose (pure (pure x))
    Compose f <*> Compose x = Compose ((<*>) <$> f <*> x)

(The naturality law is implied by parametricity.)

Instances are similar to Functor, e.g. given a data type

data Tree a = Empty | Leaf a | Node (Tree a) a (Tree a)

a suitable instance would be

instance Traversable Tree where
   traverse f Empty = pure Empty
   traverse f (Leaf x) = Leaf <$> f x
   traverse f (Node l k r) = Node <$> traverse f l <*> f k <*> traverse f r

This is suitable even for abstract types, as the laws for <*> imply a form of associativity.

The superclass instances should satisfy the following:

Minimal complete definition

traverse | sequenceA

Methods

traverse :: Applicative f => (a -> f b) -> t a -> f (t b) #

Map each element of a structure to an action, evaluate these actions from left to right, and collect the results. For a version that ignores the results see traverse_.

Instances
Traversable []

Since: base-2.1

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> [a] -> f [b] #

sequenceA :: Applicative f => [f a] -> f [a] #

mapM :: Monad m => (a -> m b) -> [a] -> m [b] #

sequence :: Monad m => [m a] -> m [a] #

Traversable Maybe

Since: base-2.1

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Maybe a -> f (Maybe b) #

sequenceA :: Applicative f => Maybe (f a) -> f (Maybe a) #

mapM :: Monad m => (a -> m b) -> Maybe a -> m (Maybe b) #

sequence :: Monad m => Maybe (m a) -> m (Maybe a) #

Traversable Par1

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Par1 a -> f (Par1 b) #

sequenceA :: Applicative f => Par1 (f a) -> f (Par1 a) #

mapM :: Monad m => (a -> m b) -> Par1 a -> m (Par1 b) #

sequence :: Monad m => Par1 (m a) -> m (Par1 a) #

Traversable IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IResult a -> f (IResult b) #

sequenceA :: Applicative f => IResult (f a) -> f (IResult a) #

mapM :: Monad m => (a -> m b) -> IResult a -> m (IResult b) #

sequence :: Monad m => IResult (m a) -> m (IResult a) #

Traversable Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Result a -> f (Result b) #

sequenceA :: Applicative f => Result (f a) -> f (Result a) #

mapM :: Monad m => (a -> m b) -> Result a -> m (Result b) #

sequence :: Monad m => Result (m a) -> m (Result a) #

Traversable Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

traverse :: Applicative f => (a -> f b) -> Complex a -> f (Complex b) #

sequenceA :: Applicative f => Complex (f a) -> f (Complex a) #

mapM :: Monad m => (a -> m b) -> Complex a -> m (Complex b) #

sequence :: Monad m => Complex (m a) -> m (Complex a) #

Traversable Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Min a -> f (Min b) #

sequenceA :: Applicative f => Min (f a) -> f (Min a) #

mapM :: Monad m => (a -> m b) -> Min a -> m (Min b) #

sequence :: Monad m => Min (m a) -> m (Min a) #

Traversable Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Max a -> f (Max b) #

sequenceA :: Applicative f => Max (f a) -> f (Max a) #

mapM :: Monad m => (a -> m b) -> Max a -> m (Max b) #

sequence :: Monad m => Max (m a) -> m (Max a) #

Traversable First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> First a -> f (First b) #

sequenceA :: Applicative f => First (f a) -> f (First a) #

mapM :: Monad m => (a -> m b) -> First a -> m (First b) #

sequence :: Monad m => First (m a) -> m (First a) #

Traversable Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Last a -> f (Last b) #

sequenceA :: Applicative f => Last (f a) -> f (Last a) #

mapM :: Monad m => (a -> m b) -> Last a -> m (Last b) #

sequence :: Monad m => Last (m a) -> m (Last a) #

Traversable Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Option a -> f (Option b) #

sequenceA :: Applicative f => Option (f a) -> f (Option a) #

mapM :: Monad m => (a -> m b) -> Option a -> m (Option b) #

sequence :: Monad m => Option (m a) -> m (Option a) #

Traversable ZipList

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> ZipList a -> f (ZipList b) #

sequenceA :: Applicative f => ZipList (f a) -> f (ZipList a) #

mapM :: Monad m => (a -> m b) -> ZipList a -> m (ZipList b) #

sequence :: Monad m => ZipList (m a) -> m (ZipList a) #

Traversable Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Identity a -> f (Identity b) #

sequenceA :: Applicative f => Identity (f a) -> f (Identity a) #

mapM :: Monad m => (a -> m b) -> Identity a -> m (Identity b) #

sequence :: Monad m => Identity (m a) -> m (Identity a) #

Traversable First

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> First a -> f (First b) #

sequenceA :: Applicative f => First (f a) -> f (First a) #

mapM :: Monad m => (a -> m b) -> First a -> m (First b) #

sequence :: Monad m => First (m a) -> m (First a) #

Traversable Last

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Last a -> f (Last b) #

sequenceA :: Applicative f => Last (f a) -> f (Last a) #

mapM :: Monad m => (a -> m b) -> Last a -> m (Last b) #

sequence :: Monad m => Last (m a) -> m (Last a) #

Traversable Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Dual a -> f (Dual b) #

sequenceA :: Applicative f => Dual (f a) -> f (Dual a) #

mapM :: Monad m => (a -> m b) -> Dual a -> m (Dual b) #

sequence :: Monad m => Dual (m a) -> m (Dual a) #

Traversable Sum

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Sum a -> f (Sum b) #

sequenceA :: Applicative f => Sum (f a) -> f (Sum a) #

mapM :: Monad m => (a -> m b) -> Sum a -> m (Sum b) #

sequence :: Monad m => Sum (m a) -> m (Sum a) #

Traversable Product

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Product a -> f (Product b) #

sequenceA :: Applicative f => Product (f a) -> f (Product a) #

mapM :: Monad m => (a -> m b) -> Product a -> m (Product b) #

sequence :: Monad m => Product (m a) -> m (Product a) #

Traversable Down

Since: base-4.12.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Down a -> f (Down b) #

sequenceA :: Applicative f => Down (f a) -> f (Down a) #

mapM :: Monad m => (a -> m b) -> Down a -> m (Down b) #

sequence :: Monad m => Down (m a) -> m (Down a) #

Traversable NonEmpty

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> NonEmpty a -> f (NonEmpty b) #

sequenceA :: Applicative f => NonEmpty (f a) -> f (NonEmpty a) #

mapM :: Monad m => (a -> m b) -> NonEmpty a -> m (NonEmpty b) #

sequence :: Monad m => NonEmpty (m a) -> m (NonEmpty a) #

Traversable IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IntMap a -> f (IntMap b) #

sequenceA :: Applicative f => IntMap (f a) -> f (IntMap a) #

mapM :: Monad m => (a -> m b) -> IntMap a -> m (IntMap b) #

sequence :: Monad m => IntMap (m a) -> m (IntMap a) #

Traversable Tree 
Instance details

Defined in Data.Tree

Methods

traverse :: Applicative f => (a -> f b) -> Tree a -> f (Tree b) #

sequenceA :: Applicative f => Tree (f a) -> f (Tree a) #

mapM :: Monad m => (a -> m b) -> Tree a -> m (Tree b) #

sequence :: Monad m => Tree (m a) -> m (Tree a) #

Traversable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Seq a -> f (Seq b) #

sequenceA :: Applicative f => Seq (f a) -> f (Seq a) #

mapM :: Monad m => (a -> m b) -> Seq a -> m (Seq b) #

sequence :: Monad m => Seq (m a) -> m (Seq a) #

Traversable FingerTree 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> FingerTree a -> f (FingerTree b) #

sequenceA :: Applicative f => FingerTree (f a) -> f (FingerTree a) #

mapM :: Monad m => (a -> m b) -> FingerTree a -> m (FingerTree b) #

sequence :: Monad m => FingerTree (m a) -> m (FingerTree a) #

Traversable Digit 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Digit a -> f (Digit b) #

sequenceA :: Applicative f => Digit (f a) -> f (Digit a) #

mapM :: Monad m => (a -> m b) -> Digit a -> m (Digit b) #

sequence :: Monad m => Digit (m a) -> m (Digit a) #

Traversable Node 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Node a -> f (Node b) #

sequenceA :: Applicative f => Node (f a) -> f (Node a) #

mapM :: Monad m => (a -> m b) -> Node a -> m (Node b) #

sequence :: Monad m => Node (m a) -> m (Node a) #

Traversable Elem 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Elem a -> f (Elem b) #

sequenceA :: Applicative f => Elem (f a) -> f (Elem a) #

mapM :: Monad m => (a -> m b) -> Elem a -> m (Elem b) #

sequence :: Monad m => Elem (m a) -> m (Elem a) #

Traversable ViewL 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> ViewL a -> f (ViewL b) #

sequenceA :: Applicative f => ViewL (f a) -> f (ViewL a) #

mapM :: Monad m => (a -> m b) -> ViewL a -> m (ViewL b) #

sequence :: Monad m => ViewL (m a) -> m (ViewL a) #

Traversable ViewR 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> ViewR a -> f (ViewR b) #

sequenceA :: Applicative f => ViewR (f a) -> f (ViewR a) #

mapM :: Monad m => (a -> m b) -> ViewR a -> m (ViewR b) #

sequence :: Monad m => ViewR (m a) -> m (ViewR a) #

Traversable Interval 
Instance details

Defined in Numeric.Interval.Kaucher

Methods

traverse :: Applicative f => (a -> f b) -> Interval a -> f (Interval b) #

sequenceA :: Applicative f => Interval (f a) -> f (Interval a) #

mapM :: Monad m => (a -> m b) -> Interval a -> m (Interval b) #

sequence :: Monad m => Interval (m a) -> m (Interval a) #

Traversable SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

traverse :: Applicative f => (a -> f b) -> SmallArray a -> f (SmallArray b) #

sequenceA :: Applicative f => SmallArray (f a) -> f (SmallArray a) #

mapM :: Monad m => (a -> m b) -> SmallArray a -> m (SmallArray b) #

sequence :: Monad m => SmallArray (m a) -> m (SmallArray a) #

Traversable Array 
Instance details

Defined in Data.Primitive.Array

Methods

traverse :: Applicative f => (a -> f b) -> Array a -> f (Array b) #

sequenceA :: Applicative f => Array (f a) -> f (Array a) #

mapM :: Monad m => (a -> m b) -> Array a -> m (Array b) #

sequence :: Monad m => Array (m a) -> m (Array a) #

Traversable Vector 
Instance details

Defined in Data.Vector

Methods

traverse :: Applicative f => (a -> f b) -> Vector a -> f (Vector b) #

sequenceA :: Applicative f => Vector (f a) -> f (Vector a) #

mapM :: Monad m => (a -> m b) -> Vector a -> m (Vector b) #

sequence :: Monad m => Vector (m a) -> m (Vector a) #

Traversable Root 
Instance details

Defined in Numeric.RootFinding

Methods

traverse :: Applicative f => (a -> f b) -> Root a -> f (Root b) #

sequenceA :: Applicative f => Root (f a) -> f (Root a) #

mapM :: Monad m => (a -> m b) -> Root a -> m (Root b) #

sequence :: Monad m => Root (m a) -> m (Root a) #

Traversable Log 
Instance details

Defined in Numeric.Log

Methods

traverse :: Applicative f => (a -> f b) -> Log a -> f (Log b) #

sequenceA :: Applicative f => Log (f a) -> f (Log a) #

mapM :: Monad m => (a -> m b) -> Log a -> m (Log b) #

sequence :: Monad m => Log (m a) -> m (Log a) #

Traversable V2 
Instance details

Defined in Linear.V2

Methods

traverse :: Applicative f => (a -> f b) -> V2 a -> f (V2 b) #

sequenceA :: Applicative f => V2 (f a) -> f (V2 a) #

mapM :: Monad m => (a -> m b) -> V2 a -> m (V2 b) #

sequence :: Monad m => V2 (m a) -> m (V2 a) #

Traversable Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

traverse :: Applicative f => (a -> f b) -> Polar a -> f (Polar b) #

sequenceA :: Applicative f => Polar (f a) -> f (Polar a) #

mapM :: Monad m => (a -> m b) -> Polar a -> m (Polar b) #

sequence :: Monad m => Polar (m a) -> m (Polar a) #

Traversable V3 
Instance details

Defined in Linear.V3

Methods

traverse :: Applicative f => (a -> f b) -> V3 a -> f (V3 b) #

sequenceA :: Applicative f => V3 (f a) -> f (V3 a) #

mapM :: Monad m => (a -> m b) -> V3 a -> m (V3 b) #

sequence :: Monad m => V3 (m a) -> m (V3 a) #

Traversable V1 
Instance details

Defined in Linear.V1

Methods

traverse :: Applicative f => (a -> f b) -> V1 a -> f (V1 b) #

sequenceA :: Applicative f => V1 (f a) -> f (V1 a) #

mapM :: Monad m => (a -> m b) -> V1 a -> m (V1 b) #

sequence :: Monad m => V1 (m a) -> m (V1 a) #

Traversable Plucker 
Instance details

Defined in Linear.Plucker

Methods

traverse :: Applicative f => (a -> f b) -> Plucker a -> f (Plucker b) #

sequenceA :: Applicative f => Plucker (f a) -> f (Plucker a) #

mapM :: Monad m => (a -> m b) -> Plucker a -> m (Plucker b) #

sequence :: Monad m => Plucker (m a) -> m (Plucker a) #

Traversable Quaternion 
Instance details

Defined in Linear.Quaternion

Methods

traverse :: Applicative f => (a -> f b) -> Quaternion a -> f (Quaternion b) #

sequenceA :: Applicative f => Quaternion (f a) -> f (Quaternion a) #

mapM :: Monad m => (a -> m b) -> Quaternion a -> m (Quaternion b) #

sequence :: Monad m => Quaternion (m a) -> m (Quaternion a) #

Traversable V0 
Instance details

Defined in Linear.V0

Methods

traverse :: Applicative f => (a -> f b) -> V0 a -> f (V0 b) #

sequenceA :: Applicative f => V0 (f a) -> f (V0 a) #

mapM :: Monad m => (a -> m b) -> V0 a -> m (V0 b) #

sequence :: Monad m => V0 (m a) -> m (V0 a) #

Traversable V4 
Instance details

Defined in Linear.V4

Methods

traverse :: Applicative f => (a -> f b) -> V4 a -> f (V4 b) #

sequenceA :: Applicative f => V4 (f a) -> f (V4 a) #

mapM :: Monad m => (a -> m b) -> V4 a -> m (V4 b) #

sequence :: Monad m => V4 (m a) -> m (V4 a) #

Traversable (Either a)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a0 -> f b) -> Either a a0 -> f (Either a b) #

sequenceA :: Applicative f => Either a (f a0) -> f (Either a a0) #

mapM :: Monad m => (a0 -> m b) -> Either a a0 -> m (Either a b) #

sequence :: Monad m => Either a (m a0) -> m (Either a a0) #

Traversable (V1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> V1 a -> f (V1 b) #

sequenceA :: Applicative f => V1 (f a) -> f (V1 a) #

mapM :: Monad m => (a -> m b) -> V1 a -> m (V1 b) #

sequence :: Monad m => V1 (m a) -> m (V1 a) #

Traversable (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> U1 a -> f (U1 b) #

sequenceA :: Applicative f => U1 (f a) -> f (U1 a) #

mapM :: Monad m => (a -> m b) -> U1 a -> m (U1 b) #

sequence :: Monad m => U1 (m a) -> m (U1 a) #

Traversable ((,) a)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a0 -> f b) -> (a, a0) -> f (a, b) #

sequenceA :: Applicative f => (a, f a0) -> f (a, a0) #

mapM :: Monad m => (a0 -> m b) -> (a, a0) -> m (a, b) #

sequence :: Monad m => (a, m a0) -> m (a, a0) #

Traversable (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

traverse :: Applicative f => (a -> f b) -> HashMap k a -> f (HashMap k b) #

sequenceA :: Applicative f => HashMap k (f a) -> f (HashMap k a) #

mapM :: Monad m => (a -> m b) -> HashMap k a -> m (HashMap k b) #

sequence :: Monad m => HashMap k (m a) -> m (HashMap k a) #

Traversable (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Map k a -> f (Map k b) #

sequenceA :: Applicative f => Map k (f a) -> f (Map k a) #

mapM :: Monad m => (a -> m b) -> Map k a -> m (Map k b) #

sequence :: Monad m => Map k (m a) -> m (Map k a) #

Ix i => Traversable (Array i)

Since: base-2.1

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Array i a -> f (Array i b) #

sequenceA :: Applicative f => Array i (f a) -> f (Array i a) #

mapM :: Monad m => (a -> m b) -> Array i a -> m (Array i b) #

sequence :: Monad m => Array i (m a) -> m (Array i a) #

Traversable (Arg a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a0 -> f b) -> Arg a a0 -> f (Arg a b) #

sequenceA :: Applicative f => Arg a (f a0) -> f (Arg a a0) #

mapM :: Monad m => (a0 -> m b) -> Arg a a0 -> m (Arg a b) #

sequence :: Monad m => Arg a (m a0) -> m (Arg a a0) #

Traversable (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Proxy a -> f (Proxy b) #

sequenceA :: Applicative f => Proxy (f a) -> f (Proxy a) #

mapM :: Monad m => (a -> m b) -> Proxy a -> m (Proxy b) #

sequence :: Monad m => Proxy (m a) -> m (Proxy a) #

Traversable f => Traversable (MaybeT f) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

traverse :: Applicative f0 => (a -> f0 b) -> MaybeT f a -> f0 (MaybeT f b) #

sequenceA :: Applicative f0 => MaybeT f (f0 a) -> f0 (MaybeT f a) #

mapM :: Monad m => (a -> m b) -> MaybeT f a -> m (MaybeT f b) #

sequence :: Monad m => MaybeT f (m a) -> m (MaybeT f a) #

(Generic1 f, Traversable (Rep1 f)) => Traversable (Generically1 f) 
Instance details

Defined in Generic.Data.Internal.Generically

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Generically1 f a -> f0 (Generically1 f b) #

sequenceA :: Applicative f0 => Generically1 f (f0 a) -> f0 (Generically1 f a) #

mapM :: Monad m => (a -> m b) -> Generically1 f a -> m (Generically1 f b) #

sequence :: Monad m => Generically1 f (m a) -> m (Generically1 f a) #

Traversable f => Traversable (ListT f) 
Instance details

Defined in Control.Monad.Trans.List

Methods

traverse :: Applicative f0 => (a -> f0 b) -> ListT f a -> f0 (ListT f b) #

sequenceA :: Applicative f0 => ListT f (f0 a) -> f0 (ListT f a) #

mapM :: Monad m => (a -> m b) -> ListT f a -> m (ListT f b) #

sequence :: Monad m => ListT f (m a) -> m (ListT f a) #

Traversable (Categorical p) 
Instance details

Defined in Data.Random.Distribution.Categorical

Methods

traverse :: Applicative f => (a -> f b) -> Categorical p a -> f (Categorical p b) #

sequenceA :: Applicative f => Categorical p (f a) -> f (Categorical p a) #

mapM :: Monad m => (a -> m b) -> Categorical p a -> m (Categorical p b) #

sequence :: Monad m => Categorical p (m a) -> m (Categorical p a) #

Traversable (ListF a) 
Instance details

Defined in Data.Functor.Foldable

Methods

traverse :: Applicative f => (a0 -> f b) -> ListF a a0 -> f (ListF a b) #

sequenceA :: Applicative f => ListF a (f a0) -> f (ListF a a0) #

mapM :: Monad m => (a0 -> m b) -> ListF a a0 -> m (ListF a b) #

sequence :: Monad m => ListF a (m a0) -> m (ListF a a0) #

Traversable f => Traversable (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Cofree f a -> f0 (Cofree f b) #

sequenceA :: Applicative f0 => Cofree f (f0 a) -> f0 (Cofree f a) #

mapM :: Monad m => (a -> m b) -> Cofree f a -> m (Cofree f b) #

sequence :: Monad m => Cofree f (m a) -> m (Cofree f a) #

Traversable f => Traversable (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Free f a -> f0 (Free f b) #

sequenceA :: Applicative f0 => Free f (f0 a) -> f0 (Free f a) #

mapM :: Monad m => (a -> m b) -> Free f a -> m (Free f b) #

sequence :: Monad m => Free f (m a) -> m (Free f a) #

Traversable (NonEmptyF a) 
Instance details

Defined in Data.Functor.Base

Methods

traverse :: Applicative f => (a0 -> f b) -> NonEmptyF a a0 -> f (NonEmptyF a b) #

sequenceA :: Applicative f => NonEmptyF a (f a0) -> f (NonEmptyF a a0) #

mapM :: Monad m => (a0 -> m b) -> NonEmptyF a a0 -> m (NonEmptyF a b) #

sequence :: Monad m => NonEmptyF a (m a0) -> m (NonEmptyF a a0) #

Traversable f => Traversable (Point f) 
Instance details

Defined in Linear.Affine

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Point f a -> f0 (Point f b) #

sequenceA :: Applicative f0 => Point f (f0 a) -> f0 (Point f a) #

mapM :: Monad m => (a -> m b) -> Point f a -> m (Point f b) #

sequence :: Monad m => Point f (m a) -> m (Point f a) #

Traversable (Level i) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

traverse :: Applicative f => (a -> f b) -> Level i a -> f (Level i b) #

sequenceA :: Applicative f => Level i (f a) -> f (Level i a) #

mapM :: Monad m => (a -> m b) -> Level i a -> m (Level i b) #

sequence :: Monad m => Level i (m a) -> m (Level i a) #

Traversable f => Traversable (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Yoneda f a -> f0 (Yoneda f b) #

sequenceA :: Applicative f0 => Yoneda f (f0 a) -> f0 (Yoneda f a) #

mapM :: Monad m => (a -> m b) -> Yoneda f a -> m (Yoneda f b) #

sequence :: Monad m => Yoneda f (m a) -> m (Yoneda f a) #

Traversable f => Traversable (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Rec1 f a -> f0 (Rec1 f b) #

sequenceA :: Applicative f0 => Rec1 f (f0 a) -> f0 (Rec1 f a) #

mapM :: Monad m => (a -> m b) -> Rec1 f a -> m (Rec1 f b) #

sequence :: Monad m => Rec1 f (m a) -> m (Rec1 f a) #

Traversable (URec Char :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Char a -> f (URec Char b) #

sequenceA :: Applicative f => URec Char (f a) -> f (URec Char a) #

mapM :: Monad m => (a -> m b) -> URec Char a -> m (URec Char b) #

sequence :: Monad m => URec Char (m a) -> m (URec Char a) #

Traversable (URec Double :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Double a -> f (URec Double b) #

sequenceA :: Applicative f => URec Double (f a) -> f (URec Double a) #

mapM :: Monad m => (a -> m b) -> URec Double a -> m (URec Double b) #

sequence :: Monad m => URec Double (m a) -> m (URec Double a) #

Traversable (URec Float :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Float a -> f (URec Float b) #

sequenceA :: Applicative f => URec Float (f a) -> f (URec Float a) #

mapM :: Monad m => (a -> m b) -> URec Float a -> m (URec Float b) #

sequence :: Monad m => URec Float (m a) -> m (URec Float a) #

Traversable (URec Int :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Int a -> f (URec Int b) #

sequenceA :: Applicative f => URec Int (f a) -> f (URec Int a) #

mapM :: Monad m => (a -> m b) -> URec Int a -> m (URec Int b) #

sequence :: Monad m => URec Int (m a) -> m (URec Int a) #

Traversable (URec Word :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Word a -> f (URec Word b) #

sequenceA :: Applicative f => URec Word (f a) -> f (URec Word a) #

mapM :: Monad m => (a -> m b) -> URec Word a -> m (URec Word b) #

sequence :: Monad m => URec Word (m a) -> m (URec Word a) #

Traversable (URec (Ptr ()) :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec (Ptr ()) a -> f (URec (Ptr ()) b) #

sequenceA :: Applicative f => URec (Ptr ()) (f a) -> f (URec (Ptr ()) a) #

mapM :: Monad m => (a -> m b) -> URec (Ptr ()) a -> m (URec (Ptr ()) b) #

sequence :: Monad m => URec (Ptr ()) (m a) -> m (URec (Ptr ()) a) #

Traversable (Const m :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Const m a -> f (Const m b) #

sequenceA :: Applicative f => Const m (f a) -> f (Const m a) #

mapM :: Monad m0 => (a -> m0 b) -> Const m a -> m0 (Const m b) #

sequence :: Monad m0 => Const m (m0 a) -> m0 (Const m a) #

Traversable f => Traversable (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Ap f a -> f0 (Ap f b) #

sequenceA :: Applicative f0 => Ap f (f0 a) -> f0 (Ap f a) #

mapM :: Monad m => (a -> m b) -> Ap f a -> m (Ap f b) #

sequence :: Monad m => Ap f (m a) -> m (Ap f a) #

Traversable f => Traversable (Alt f)

Since: base-4.12.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Alt f a -> f0 (Alt f b) #

sequenceA :: Applicative f0 => Alt f (f0 a) -> f0 (Alt f a) #

mapM :: Monad m => (a -> m b) -> Alt f a -> m (Alt f b) #

sequence :: Monad m => Alt f (m a) -> m (Alt f a) #

Bitraversable p => Traversable (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

traverse :: Applicative f => (a -> f b) -> Join p a -> f (Join p b) #

sequenceA :: Applicative f => Join p (f a) -> f (Join p a) #

mapM :: Monad m => (a -> m b) -> Join p a -> m (Join p b) #

sequence :: Monad m => Join p (m a) -> m (Join p a) #

Bitraversable p => Traversable (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

traverse :: Applicative f => (a -> f b) -> Fix p a -> f (Fix p b) #

sequenceA :: Applicative f => Fix p (f a) -> f (Fix p a) #

mapM :: Monad m => (a -> m b) -> Fix p a -> m (Fix p b) #

sequence :: Monad m => Fix p (m a) -> m (Fix p a) #

Traversable f => Traversable (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

traverse :: Applicative f0 => (a -> f0 b) -> IdentityT f a -> f0 (IdentityT f b) #

sequenceA :: Applicative f0 => IdentityT f (f0 a) -> f0 (IdentityT f a) #

mapM :: Monad m => (a -> m b) -> IdentityT f a -> m (IdentityT f b) #

sequence :: Monad m => IdentityT f (m a) -> m (IdentityT f a) #

Traversable f => Traversable (ExceptT e f) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

traverse :: Applicative f0 => (a -> f0 b) -> ExceptT e f a -> f0 (ExceptT e f b) #

sequenceA :: Applicative f0 => ExceptT e f (f0 a) -> f0 (ExceptT e f a) #

mapM :: Monad m => (a -> m b) -> ExceptT e f a -> m (ExceptT e f b) #

sequence :: Monad m => ExceptT e f (m a) -> m (ExceptT e f a) #

Traversable f => Traversable (WriterT w f) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

traverse :: Applicative f0 => (a -> f0 b) -> WriterT w f a -> f0 (WriterT w f b) #

sequenceA :: Applicative f0 => WriterT w f (f0 a) -> f0 (WriterT w f a) #

mapM :: Monad m => (a -> m b) -> WriterT w f a -> m (WriterT w f b) #

sequence :: Monad m => WriterT w f (m a) -> m (WriterT w f a) #

Traversable f => Traversable (ErrorT e f) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

traverse :: Applicative f0 => (a -> f0 b) -> ErrorT e f a -> f0 (ErrorT e f b) #

sequenceA :: Applicative f0 => ErrorT e f (f0 a) -> f0 (ErrorT e f a) #

mapM :: Monad m => (a -> m b) -> ErrorT e f a -> m (ErrorT e f b) #

sequence :: Monad m => ErrorT e f (m a) -> m (ErrorT e f a) #

Traversable f => Traversable (WriterT w f) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

traverse :: Applicative f0 => (a -> f0 b) -> WriterT w f a -> f0 (WriterT w f b) #

sequenceA :: Applicative f0 => WriterT w f (f0 a) -> f0 (WriterT w f a) #

mapM :: Monad m => (a -> m b) -> WriterT w f a -> m (WriterT w f b) #

sequence :: Monad m => WriterT w f (m a) -> m (WriterT w f a) #

Traversable (Forget r a) 
Instance details

Defined in Data.Profunctor.Types

Methods

traverse :: Applicative f => (a0 -> f b) -> Forget r a a0 -> f (Forget r a b) #

sequenceA :: Applicative f => Forget r a (f a0) -> f (Forget r a a0) #

mapM :: Monad m => (a0 -> m b) -> Forget r a a0 -> m (Forget r a b) #

sequence :: Monad m => Forget r a (m a0) -> m (Forget r a a0) #

Traversable (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

traverse :: Applicative f => (a -> f b) -> Tagged s a -> f (Tagged s b) #

sequenceA :: Applicative f => Tagged s (f a) -> f (Tagged s a) #

mapM :: Monad m => (a -> m b) -> Tagged s a -> m (Tagged s b) #

sequence :: Monad m => Tagged s (m a) -> m (Tagged s a) #

Traversable f => Traversable (Backwards f)

Derived instance.

Instance details

Defined in Control.Applicative.Backwards

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Backwards f a -> f0 (Backwards f b) #

sequenceA :: Applicative f0 => Backwards f (f0 a) -> f0 (Backwards f a) #

mapM :: Monad m => (a -> m b) -> Backwards f a -> m (Backwards f b) #

sequence :: Monad m => Backwards f (m a) -> m (Backwards f a) #

(Traversable f, Traversable w) => Traversable (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

traverse :: Applicative f0 => (a -> f0 b) -> CofreeT f w a -> f0 (CofreeT f w b) #

sequenceA :: Applicative f0 => CofreeT f w (f0 a) -> f0 (CofreeT f w a) #

mapM :: Monad m => (a -> m b) -> CofreeT f w a -> m (CofreeT f w b) #

sequence :: Monad m => CofreeT f w (m a) -> m (CofreeT f w a) #

Traversable f => Traversable (CofreeF f a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> CofreeF f a a0 -> f0 (CofreeF f a b) #

sequenceA :: Applicative f0 => CofreeF f a (f0 a0) -> f0 (CofreeF f a a0) #

mapM :: Monad m => (a0 -> m b) -> CofreeF f a a0 -> m (CofreeF f a b) #

sequence :: Monad m => CofreeF f a (m a0) -> m (CofreeF f a a0) #

(Monad m, Traversable m, Traversable f) => Traversable (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

traverse :: Applicative f0 => (a -> f0 b) -> FreeT f m a -> f0 (FreeT f m b) #

sequenceA :: Applicative f0 => FreeT f m (f0 a) -> f0 (FreeT f m a) #

mapM :: Monad m0 => (a -> m0 b) -> FreeT f m a -> m0 (FreeT f m b) #

sequence :: Monad m0 => FreeT f m (m0 a) -> m0 (FreeT f m a) #

Traversable f => Traversable (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> FreeF f a a0 -> f0 (FreeF f a b) #

sequenceA :: Applicative f0 => FreeF f a (f0 a0) -> f0 (FreeF f a a0) #

mapM :: Monad m => (a0 -> m b) -> FreeF f a a0 -> m (FreeF f a b) #

sequence :: Monad m => FreeF f a (m a0) -> m (FreeF f a a0) #

Traversable (V n) 
Instance details

Defined in Linear.V

Methods

traverse :: Applicative f => (a -> f b) -> V n a -> f (V n b) #

sequenceA :: Applicative f => V n (f a) -> f (V n a) #

mapM :: Monad m => (a -> m b) -> V n a -> m (V n b) #

sequence :: Monad m => V n (m a) -> m (V n a) #

Traversable f => Traversable (AlongsideLeft f b) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

traverse :: Applicative f0 => (a -> f0 b0) -> AlongsideLeft f b a -> f0 (AlongsideLeft f b b0) #

sequenceA :: Applicative f0 => AlongsideLeft f b (f0 a) -> f0 (AlongsideLeft f b a) #

mapM :: Monad m => (a -> m b0) -> AlongsideLeft f b a -> m (AlongsideLeft f b b0) #

sequence :: Monad m => AlongsideLeft f b (m a) -> m (AlongsideLeft f b a) #

Traversable f => Traversable (AlongsideRight f a) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> AlongsideRight f a a0 -> f0 (AlongsideRight f a b) #

sequenceA :: Applicative f0 => AlongsideRight f a (f0 a0) -> f0 (AlongsideRight f a a0) #

mapM :: Monad m => (a0 -> m b) -> AlongsideRight f a a0 -> m (AlongsideRight f a b) #

sequence :: Monad m => AlongsideRight f a (m a0) -> m (AlongsideRight f a a0) #

Traversable (K1 i c :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> K1 i c a -> f (K1 i c b) #

sequenceA :: Applicative f => K1 i c (f a) -> f (K1 i c a) #

mapM :: Monad m => (a -> m b) -> K1 i c a -> m (K1 i c b) #

sequence :: Monad m => K1 i c (m a) -> m (K1 i c a) #

(Traversable f, Traversable g) => Traversable (f :+: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> (f :+: g) a -> f0 ((f :+: g) b) #

sequenceA :: Applicative f0 => (f :+: g) (f0 a) -> f0 ((f :+: g) a) #

mapM :: Monad m => (a -> m b) -> (f :+: g) a -> m ((f :+: g) b) #

sequence :: Monad m => (f :+: g) (m a) -> m ((f :+: g) a) #

(Traversable f, Traversable g) => Traversable (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> (f :*: g) a -> f0 ((f :*: g) b) #

sequenceA :: Applicative f0 => (f :*: g) (f0 a) -> f0 ((f :*: g) a) #

mapM :: Monad m => (a -> m b) -> (f :*: g) a -> m ((f :*: g) b) #

sequence :: Monad m => (f :*: g) (m a) -> m ((f :*: g) a) #

(Traversable f, Traversable g) => Traversable (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Product f g a -> f0 (Product f g b) #

sequenceA :: Applicative f0 => Product f g (f0 a) -> f0 (Product f g a) #

mapM :: Monad m => (a -> m b) -> Product f g a -> m (Product f g b) #

sequence :: Monad m => Product f g (m a) -> m (Product f g a) #

(Traversable f, Traversable g) => Traversable (Sum f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Sum f g a -> f0 (Sum f g b) #

sequenceA :: Applicative f0 => Sum f g (f0 a) -> f0 (Sum f g a) #

mapM :: Monad m => (a -> m b) -> Sum f g a -> m (Sum f g b) #

sequence :: Monad m => Sum f g (m a) -> m (Sum f g a) #

Traversable (Magma i t b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

traverse :: Applicative f => (a -> f b0) -> Magma i t b a -> f (Magma i t b b0) #

sequenceA :: Applicative f => Magma i t b (f a) -> f (Magma i t b a) #

mapM :: Monad m => (a -> m b0) -> Magma i t b a -> m (Magma i t b b0) #

sequence :: Monad m => Magma i t b (m a) -> m (Magma i t b a) #

Traversable f => Traversable (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> M1 i c f a -> f0 (M1 i c f b) #

sequenceA :: Applicative f0 => M1 i c f (f0 a) -> f0 (M1 i c f a) #

mapM :: Monad m => (a -> m b) -> M1 i c f a -> m (M1 i c f b) #

sequence :: Monad m => M1 i c f (m a) -> m (M1 i c f a) #

(Traversable f, Traversable g) => Traversable (f :.: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> (f :.: g) a -> f0 ((f :.: g) b) #

sequenceA :: Applicative f0 => (f :.: g) (f0 a) -> f0 ((f :.: g) a) #

mapM :: Monad m => (a -> m b) -> (f :.: g) a -> m ((f :.: g) b) #

sequence :: Monad m => (f :.: g) (m a) -> m ((f :.: g) a) #

(Traversable f, Traversable g) => Traversable (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Compose f g a -> f0 (Compose f g b) #

sequenceA :: Applicative f0 => Compose f g (f0 a) -> f0 (Compose f g a) #

mapM :: Monad m => (a -> m b) -> Compose f g a -> m (Compose f g b) #

sequence :: Monad m => Compose f g (m a) -> m (Compose f g a) #

Bitraversable p => Traversable (WrappedBifunctor p a) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

traverse :: Applicative f => (a0 -> f b) -> WrappedBifunctor p a a0 -> f (WrappedBifunctor p a b) #

sequenceA :: Applicative f => WrappedBifunctor p a (f a0) -> f (WrappedBifunctor p a a0) #

mapM :: Monad m => (a0 -> m b) -> WrappedBifunctor p a a0 -> m (WrappedBifunctor p a b) #

sequence :: Monad m => WrappedBifunctor p a (m a0) -> m (WrappedBifunctor p a a0) #

Traversable g => Traversable (Joker g a) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

traverse :: Applicative f => (a0 -> f b) -> Joker g a a0 -> f (Joker g a b) #

sequenceA :: Applicative f => Joker g a (f a0) -> f (Joker g a a0) #

mapM :: Monad m => (a0 -> m b) -> Joker g a a0 -> m (Joker g a b) #

sequence :: Monad m => Joker g a (m a0) -> m (Joker g a a0) #

Bitraversable p => Traversable (Flip p a) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

traverse :: Applicative f => (a0 -> f b) -> Flip p a a0 -> f (Flip p a b) #

sequenceA :: Applicative f => Flip p a (f a0) -> f (Flip p a a0) #

mapM :: Monad m => (a0 -> m b) -> Flip p a a0 -> m (Flip p a b) #

sequence :: Monad m => Flip p a (m a0) -> m (Flip p a a0) #

Traversable (Clown f a :: Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Clown f a a0 -> f0 (Clown f a b) #

sequenceA :: Applicative f0 => Clown f a (f0 a0) -> f0 (Clown f a a0) #

mapM :: Monad m => (a0 -> m b) -> Clown f a a0 -> m (Clown f a b) #

sequence :: Monad m => Clown f a (m a0) -> m (Clown f a a0) #

(Traversable f, Bitraversable p) => Traversable (Tannen f p a) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Tannen f p a a0 -> f0 (Tannen f p a b) #

sequenceA :: Applicative f0 => Tannen f p a (f0 a0) -> f0 (Tannen f p a a0) #

mapM :: Monad m => (a0 -> m b) -> Tannen f p a a0 -> m (Tannen f p a b) #

sequence :: Monad m => Tannen f p a (m a0) -> m (Tannen f p a a0) #

(Bitraversable p, Traversable g) => Traversable (Biff p f g a) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Biff p f g a a0 -> f0 (Biff p f g a b) #

sequenceA :: Applicative f0 => Biff p f g a (f0 a0) -> f0 (Biff p f g a a0) #

mapM :: Monad m => (a0 -> m b) -> Biff p f g a a0 -> m (Biff p f g a b) #

sequence :: Monad m => Biff p f g a (m a0) -> m (Biff p f g a a0) #

class Contravariant (f :: Type -> Type) where #

The class of contravariant functors.

Whereas in Haskell, one can think of a Functor as containing or producing values, a contravariant functor is a functor that can be thought of as consuming values.

As an example, consider the type of predicate functions a -> Bool. One such predicate might be negative x = x < 0, which classifies integers as to whether they are negative. However, given this predicate, we can re-use it in other situations, providing we have a way to map values to integers. For instance, we can use the negative predicate on a person's bank balance to work out if they are currently overdrawn:

newtype Predicate a = Predicate { getPredicate :: a -> Bool }

instance Contravariant Predicate where
  contramap f (Predicate p) = Predicate (p . f)
                                         |   `- First, map the input...
                                         `----- then apply the predicate.

overdrawn :: Predicate Person
overdrawn = contramap personBankBalance negative

Any instance should be subject to the following laws:

contramap id = id
contramap f . contramap g = contramap (g . f)

Note, that the second law follows from the free theorem of the type of contramap and the first law, so you need only check that the former condition holds.

Minimal complete definition

contramap

Methods

contramap :: (a -> b) -> f b -> f a #

(>$) :: b -> f b -> f a infixl 4 #

Replace all locations in the output with the same value. The default definition is contramap . const, but this may be overridden with a more efficient version.

Instances
Contravariant Predicate

A Predicate is a Contravariant Functor, because contramap can apply its function argument to the input of the predicate.

Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> Predicate b -> Predicate a #

(>$) :: b -> Predicate b -> Predicate a #

Contravariant Comparison

A Comparison is a Contravariant Functor, because contramap can apply its function argument to each input of the comparison function.

Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> Comparison b -> Comparison a #

(>$) :: b -> Comparison b -> Comparison a #

Contravariant Equivalence

Equivalence relations are Contravariant, because you can apply the contramapped function to each input to the equivalence relation.

Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> Equivalence b -> Equivalence a #

(>$) :: b -> Equivalence b -> Equivalence a #

Contravariant (V1 :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> V1 b -> V1 a #

(>$) :: b -> V1 b -> V1 a #

Contravariant (U1 :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> U1 b -> U1 a #

(>$) :: b -> U1 b -> U1 a #

Contravariant (Op a) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a0 -> b) -> Op a b -> Op a a0 #

(>$) :: b -> Op a b -> Op a a0 #

Contravariant (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> Proxy b -> Proxy a #

(>$) :: b -> Proxy b -> Proxy a #

Contravariant m => Contravariant (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

contramap :: (a -> b) -> MaybeT m b -> MaybeT m a #

(>$) :: b -> MaybeT m b -> MaybeT m a #

Contravariant m => Contravariant (ListT m) 
Instance details

Defined in Control.Monad.Trans.List

Methods

contramap :: (a -> b) -> ListT m b -> ListT m a #

(>$) :: b -> ListT m b -> ListT m a #

Contravariant f => Contravariant (Indexing f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

contramap :: (a -> b) -> Indexing f b -> Indexing f a #

(>$) :: b -> Indexing f b -> Indexing f a #

Contravariant f => Contravariant (Indexing64 f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

contramap :: (a -> b) -> Indexing64 f b -> Indexing64 f a #

(>$) :: b -> Indexing64 f b -> Indexing64 f a #

Contravariant f => Contravariant (Rec1 f) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> Rec1 f b -> Rec1 f a #

(>$) :: b -> Rec1 f b -> Rec1 f a #

Contravariant (Const a :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a0 -> b) -> Const a b -> Const a a0 #

(>$) :: b -> Const a b -> Const a a0 #

Contravariant f => Contravariant (Alt f) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> Alt f b -> Alt f a #

(>$) :: b -> Alt f b -> Alt f a #

Contravariant f => Contravariant (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

contramap :: (a -> b) -> IdentityT f b -> IdentityT f a #

(>$) :: b -> IdentityT f b -> IdentityT f a #

Contravariant m => Contravariant (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

contramap :: (a -> b) -> ExceptT e m b -> ExceptT e m a #

(>$) :: b -> ExceptT e m b -> ExceptT e m a #

Contravariant m => Contravariant (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

contramap :: (a -> b) -> WriterT w m b -> WriterT w m a #

(>$) :: b -> WriterT w m b -> WriterT w m a #

Contravariant m => Contravariant (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

contramap :: (a -> b) -> StateT s m b -> StateT s m a #

(>$) :: b -> StateT s m b -> StateT s m a #

Contravariant m => Contravariant (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

contramap :: (a -> b) -> ReaderT r m b -> ReaderT r m a #

(>$) :: b -> ReaderT r m b -> ReaderT r m a #

Contravariant m => Contravariant (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

contramap :: (a -> b) -> ErrorT e m b -> ErrorT e m a #

(>$) :: b -> ErrorT e m b -> ErrorT e m a #

Contravariant m => Contravariant (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

contramap :: (a -> b) -> StateT s m b -> StateT s m a #

(>$) :: b -> StateT s m b -> StateT s m a #

Contravariant m => Contravariant (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

contramap :: (a -> b) -> WriterT w m b -> WriterT w m a #

(>$) :: b -> WriterT w m b -> WriterT w m a #

Contravariant f => Contravariant (Backwards f)

Derived instance.

Instance details

Defined in Control.Applicative.Backwards

Methods

contramap :: (a -> b) -> Backwards f b -> Backwards f a #

(>$) :: b -> Backwards f b -> Backwards f a #

Contravariant f => Contravariant (AlongsideLeft f b) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

contramap :: (a -> b0) -> AlongsideLeft f b b0 -> AlongsideLeft f b a #

(>$) :: b0 -> AlongsideLeft f b b0 -> AlongsideLeft f b a #

Contravariant f => Contravariant (AlongsideRight f a) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

contramap :: (a0 -> b) -> AlongsideRight f a b -> AlongsideRight f a a0 #

(>$) :: b -> AlongsideRight f a b -> AlongsideRight f a a0 #

Contravariant (K1 i c :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> K1 i c b -> K1 i c a #

(>$) :: b -> K1 i c b -> K1 i c a #

(Contravariant f, Contravariant g) => Contravariant (f :+: g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> (f :+: g) b -> (f :+: g) a #

(>$) :: b -> (f :+: g) b -> (f :+: g) a #

(Contravariant f, Contravariant g) => Contravariant (f :*: g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> (f :*: g) b -> (f :*: g) a #

(>$) :: b -> (f :*: g) b -> (f :*: g) a #

(Contravariant f, Contravariant g) => Contravariant (Product f g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> Product f g b -> Product f g a #

(>$) :: b -> Product f g b -> Product f g a #

(Contravariant f, Contravariant g) => Contravariant (Sum f g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> Sum f g b -> Sum f g a #

(>$) :: b -> Sum f g b -> Sum f g a #

Contravariant f => Contravariant (M1 i c f) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> M1 i c f b -> M1 i c f a #

(>$) :: b -> M1 i c f b -> M1 i c f a #

(Functor f, Contravariant g) => Contravariant (f :.: g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> (f :.: g) b -> (f :.: g) a #

(>$) :: b -> (f :.: g) b -> (f :.: g) a #

(Functor f, Contravariant g) => Contravariant (Compose f g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> Compose f g b -> Compose f g a #

(>$) :: b -> Compose f g b -> Compose f g a #

Contravariant m => Contravariant (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

contramap :: (a -> b) -> RWST r w s m b -> RWST r w s m a #

(>$) :: b -> RWST r w s m b -> RWST r w s m a #

Contravariant m => Contravariant (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

contramap :: (a -> b) -> RWST r w s m b -> RWST r w s m a #

(>$) :: b -> RWST r w s m b -> RWST r w s m a #

Contravariant f => Contravariant (TakingWhile p f a b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

contramap :: (a0 -> b0) -> TakingWhile p f a b b0 -> TakingWhile p f a b a0 #

(>$) :: b0 -> TakingWhile p f a b b0 -> TakingWhile p f a b a0 #

(Profunctor p, Contravariant g) => Contravariant (PretextT p g a b) 
Instance details

Defined in Control.Lens.Internal.Context

Methods

contramap :: (a0 -> b0) -> PretextT p g a b b0 -> PretextT p g a b a0 #

(>$) :: b0 -> PretextT p g a b b0 -> PretextT p g a b a0 #

(Profunctor p, Contravariant g) => Contravariant (BazaarT p g a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

contramap :: (a0 -> b0) -> BazaarT p g a b b0 -> BazaarT p g a b a0 #

(>$) :: b0 -> BazaarT p g a b b0 -> BazaarT p g a b a0 #

(Profunctor p, Contravariant g) => Contravariant (BazaarT1 p g a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

contramap :: (a0 -> b0) -> BazaarT1 p g a b b0 -> BazaarT1 p g a b a0 #

(>$) :: b0 -> BazaarT1 p g a b b0 -> BazaarT1 p g a b a0 #

class Bifunctor (p :: Type -> Type -> Type) where #

A bifunctor is a type constructor that takes two type arguments and is a functor in both arguments. That is, unlike with Functor, a type constructor such as Either does not need to be partially applied for a Bifunctor instance, and the methods in this class permit mapping functions over the Left value or the Right value, or both at the same time.

Formally, the class Bifunctor represents a bifunctor from Hask -> Hask.

Intuitively it is a bifunctor where both the first and second arguments are covariant.

You can define a Bifunctor by either defining bimap or by defining both first and second.

If you supply bimap, you should ensure that:

bimap id idid

If you supply first and second, ensure:

first idid
second idid

If you supply both, you should also ensure:

bimap f g ≡ first f . second g

These ensure by parametricity:

bimap  (f . g) (h . i) ≡ bimap f h . bimap g i
first  (f . g) ≡ first  f . first  g
second (f . g) ≡ second f . second g

Since: base-4.8.0.0

Minimal complete definition

bimap | first, second

Methods

bimap :: (a -> b) -> (c -> d) -> p a c -> p b d #

Map over both arguments at the same time.

bimap f g ≡ first f . second g

Examples

Expand
>>> bimap toUpper (+1) ('j', 3)
('J',4)
>>> bimap toUpper (+1) (Left 'j')
Left 'J'
>>> bimap toUpper (+1) (Right 3)
Right 4
Instances
Bifunctor Either

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Either a c -> Either b d #

first :: (a -> b) -> Either a c -> Either b c #

second :: (b -> c) -> Either a b -> Either a c #

Bifunctor (,)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (a, c) -> (b, d) #

first :: (a -> b) -> (a, c) -> (b, c) #

second :: (b -> c) -> (a, b) -> (a, c) #

Bifunctor Arg

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

bimap :: (a -> b) -> (c -> d) -> Arg a c -> Arg b d #

first :: (a -> b) -> Arg a c -> Arg b c #

second :: (b -> c) -> Arg a b -> Arg a c #

Bifunctor ListF 
Instance details

Defined in Data.Functor.Foldable

Methods

bimap :: (a -> b) -> (c -> d) -> ListF a c -> ListF b d #

first :: (a -> b) -> ListF a c -> ListF b c #

second :: (b -> c) -> ListF a b -> ListF a c #

Bifunctor NonEmptyF 
Instance details

Defined in Data.Functor.Base

Methods

bimap :: (a -> b) -> (c -> d) -> NonEmptyF a c -> NonEmptyF b d #

first :: (a -> b) -> NonEmptyF a c -> NonEmptyF b c #

second :: (b -> c) -> NonEmptyF a b -> NonEmptyF a c #

Bifunctor ((,,) x1)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, a, c) -> (x1, b, d) #

first :: (a -> b) -> (x1, a, c) -> (x1, b, c) #

second :: (b -> c) -> (x1, a, b) -> (x1, a, c) #

Bifunctor (Const :: Type -> Type -> Type)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Const a c -> Const b d #

first :: (a -> b) -> Const a c -> Const b c #

second :: (b -> c) -> Const a b -> Const a c #

Bifunctor (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

bimap :: (a -> b) -> (c -> d) -> Tagged a c -> Tagged b d #

first :: (a -> b) -> Tagged a c -> Tagged b c #

second :: (b -> c) -> Tagged a b -> Tagged a c #

Functor f => Bifunctor (CofreeF f) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

bimap :: (a -> b) -> (c -> d) -> CofreeF f a c -> CofreeF f b d #

first :: (a -> b) -> CofreeF f a c -> CofreeF f b c #

second :: (b -> c) -> CofreeF f a b -> CofreeF f a c #

Functor f => Bifunctor (FreeF f) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

bimap :: (a -> b) -> (c -> d) -> FreeF f a c -> FreeF f b d #

first :: (a -> b) -> FreeF f a c -> FreeF f b c #

second :: (b -> c) -> FreeF f a b -> FreeF f a c #

Functor f => Bifunctor (AlongsideLeft f) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

bimap :: (a -> b) -> (c -> d) -> AlongsideLeft f a c -> AlongsideLeft f b d #

first :: (a -> b) -> AlongsideLeft f a c -> AlongsideLeft f b c #

second :: (b -> c) -> AlongsideLeft f a b -> AlongsideLeft f a c #

Functor f => Bifunctor (AlongsideRight f) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

bimap :: (a -> b) -> (c -> d) -> AlongsideRight f a c -> AlongsideRight f b d #

first :: (a -> b) -> AlongsideRight f a c -> AlongsideRight f b c #

second :: (b -> c) -> AlongsideRight f a b -> AlongsideRight f a c #

Bifunctor (K1 i :: Type -> Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> K1 i a c -> K1 i b d #

first :: (a -> b) -> K1 i a c -> K1 i b c #

second :: (b -> c) -> K1 i a b -> K1 i a c #

Bifunctor ((,,,) x1 x2)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, a, c) -> (x1, x2, b, d) #

first :: (a -> b) -> (x1, x2, a, c) -> (x1, x2, b, c) #

second :: (b -> c) -> (x1, x2, a, b) -> (x1, x2, a, c) #

Bifunctor ((,,,,) x1 x2 x3)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, a, c) -> (x1, x2, x3, b, d) #

first :: (a -> b) -> (x1, x2, x3, a, c) -> (x1, x2, x3, b, c) #

second :: (b -> c) -> (x1, x2, x3, a, b) -> (x1, x2, x3, a, c) #

Bifunctor p => Bifunctor (WrappedBifunctor p) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

bimap :: (a -> b) -> (c -> d) -> WrappedBifunctor p a c -> WrappedBifunctor p b d #

first :: (a -> b) -> WrappedBifunctor p a c -> WrappedBifunctor p b c #

second :: (b -> c) -> WrappedBifunctor p a b -> WrappedBifunctor p a c #

Functor g => Bifunctor (Joker g :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

bimap :: (a -> b) -> (c -> d) -> Joker g a c -> Joker g b d #

first :: (a -> b) -> Joker g a c -> Joker g b c #

second :: (b -> c) -> Joker g a b -> Joker g a c #

Bifunctor p => Bifunctor (Flip p) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

bimap :: (a -> b) -> (c -> d) -> Flip p a c -> Flip p b d #

first :: (a -> b) -> Flip p a c -> Flip p b c #

second :: (b -> c) -> Flip p a b -> Flip p a c #

Functor f => Bifunctor (Clown f :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

bimap :: (a -> b) -> (c -> d) -> Clown f a c -> Clown f b d #

first :: (a -> b) -> Clown f a c -> Clown f b c #

second :: (b -> c) -> Clown f a b -> Clown f a c #

Bifunctor ((,,,,,) x1 x2 x3 x4)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, x4, a, c) -> (x1, x2, x3, x4, b, d) #

first :: (a -> b) -> (x1, x2, x3, x4, a, c) -> (x1, x2, x3, x4, b, c) #

second :: (b -> c) -> (x1, x2, x3, x4, a, b) -> (x1, x2, x3, x4, a, c) #

(Bifunctor p, Bifunctor q) => Bifunctor (Sum p q) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

bimap :: (a -> b) -> (c -> d) -> Sum p q a c -> Sum p q b d #

first :: (a -> b) -> Sum p q a c -> Sum p q b c #

second :: (b -> c) -> Sum p q a b -> Sum p q a c #

(Bifunctor f, Bifunctor g) => Bifunctor (Product f g) 
Instance details

Defined in Data.Bifunctor.Product

Methods

bimap :: (a -> b) -> (c -> d) -> Product f g a c -> Product f g b d #

first :: (a -> b) -> Product f g a c -> Product f g b c #

second :: (b -> c) -> Product f g a b -> Product f g a c #

Bifunctor ((,,,,,,) x1 x2 x3 x4 x5)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, x4, x5, a, c) -> (x1, x2, x3, x4, x5, b, d) #

first :: (a -> b) -> (x1, x2, x3, x4, x5, a, c) -> (x1, x2, x3, x4, x5, b, c) #

second :: (b -> c) -> (x1, x2, x3, x4, x5, a, b) -> (x1, x2, x3, x4, x5, a, c) #

(Functor f, Bifunctor p) => Bifunctor (Tannen f p) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

bimap :: (a -> b) -> (c -> d) -> Tannen f p a c -> Tannen f p b d #

first :: (a -> b) -> Tannen f p a c -> Tannen f p b c #

second :: (b -> c) -> Tannen f p a b -> Tannen f p a c #

(Bifunctor p, Functor f, Functor g) => Bifunctor (Biff p f g) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

bimap :: (a -> b) -> (c -> d) -> Biff p f g a c -> Biff p f g b d #

first :: (a -> b) -> Biff p f g a c -> Biff p f g b c #

second :: (b -> c) -> Biff p f g a b -> Biff p f g a c #

newtype Identity a #

Identity functor and monad. (a non-strict monad)

Since: base-4.8.0.0

Constructors

Identity 

Fields

Instances
Monad Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(>>=) :: Identity a -> (a -> Identity b) -> Identity b #

(>>) :: Identity a -> Identity b -> Identity b #

return :: a -> Identity a #

fail :: String -> Identity a #

Functor Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

fmap :: (a -> b) -> Identity a -> Identity b #

(<$) :: a -> Identity b -> Identity a #

MonadFix Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

mfix :: (a -> Identity a) -> Identity a #

Applicative Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

pure :: a -> Identity a #

(<*>) :: Identity (a -> b) -> Identity a -> Identity b #

liftA2 :: (a -> b -> c) -> Identity a -> Identity b -> Identity c #

(*>) :: Identity a -> Identity b -> Identity b #

(<*) :: Identity a -> Identity b -> Identity a #

Foldable Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

fold :: Monoid m => Identity m -> m #

foldMap :: Monoid m => (a -> m) -> Identity a -> m #

foldr :: (a -> b -> b) -> b -> Identity a -> b #

foldr' :: (a -> b -> b) -> b -> Identity a -> b #

foldl :: (b -> a -> b) -> b -> Identity a -> b #

foldl' :: (b -> a -> b) -> b -> Identity a -> b #

foldr1 :: (a -> a -> a) -> Identity a -> a #

foldl1 :: (a -> a -> a) -> Identity a -> a #

toList :: Identity a -> [a] #

null :: Identity a -> Bool #

length :: Identity a -> Int #

elem :: Eq a => a -> Identity a -> Bool #

maximum :: Ord a => Identity a -> a #

minimum :: Ord a => Identity a -> a #

sum :: Num a => Identity a -> a #

product :: Num a => Identity a -> a #

Traversable Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Identity a -> f (Identity b) #

sequenceA :: Applicative f => Identity (f a) -> f (Identity a) #

mapM :: Monad m => (a -> m b) -> Identity a -> m (Identity b) #

sequence :: Monad m => Identity (m a) -> m (Identity a) #

Eq1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Identity a -> Identity b -> Bool #

Ord1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Identity a -> Identity b -> Ordering #

Read1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Identity a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Identity a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Identity a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Identity a] #

Show1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Identity a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Identity a] -> ShowS #

NFData1 Identity

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Identity a -> () #

Hashable1 Identity 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Identity a -> Int #

Traversable1 Identity 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a -> f b) -> Identity a -> f (Identity b) #

sequence1 :: Apply f => Identity (f b) -> f (Identity b) #

Apply Identity 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Identity (a -> b) -> Identity a -> Identity b #

(.>) :: Identity a -> Identity b -> Identity b #

(<.) :: Identity a -> Identity b -> Identity a #

liftF2 :: (a -> b -> c) -> Identity a -> Identity b -> Identity c #

Bind Identity 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Identity a -> (a -> Identity b) -> Identity b #

join :: Identity (Identity a) -> Identity a #

Metric Identity 
Instance details

Defined in Linear.Metric

Methods

dot :: Num a => Identity a -> Identity a -> a

quadrance :: Num a => Identity a -> a

qd :: Num a => Identity a -> Identity a -> a

distance :: Floating a => Identity a -> Identity a -> a

norm :: Floating a => Identity a -> a

signorm :: Floating a => Identity a -> Identity a

Additive Identity 
Instance details

Defined in Linear.Vector

Methods

zero :: Num a => Identity a

(^+^) :: Num a => Identity a -> Identity a -> Identity a

(^-^) :: Num a => Identity a -> Identity a -> Identity a

lerp :: Num a => a -> Identity a -> Identity a -> Identity a

liftU2 :: (a -> a -> a) -> Identity a -> Identity a -> Identity a

liftI2 :: (a -> b -> c) -> Identity a -> Identity b -> Identity c

Representable Identity 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Identity :: Type

Methods

tabulate :: (Rep Identity -> a) -> Identity a

index :: Identity a -> Rep Identity -> a

R1 Identity 
Instance details

Defined in Linear.V1

Methods

_x :: Lens' (Identity a) a

Settable Identity 
Instance details

Defined in Control.Lens.Internal.Setter

Methods

untainted :: Identity a -> a

untaintedDot :: Profunctor p => p a (Identity b) -> p a b

taintedDot :: Profunctor p => p a b -> p a (Identity b)

Affine Identity 
Instance details

Defined in Linear.Affine

Associated Types

type Diff Identity :: Type -> Type

Methods

(.-.) :: Num a => Identity a -> Identity a -> Diff Identity a

(.+^) :: Num a => Identity a -> Diff Identity a -> Identity a

(.-^) :: Num a => Identity a -> Diff Identity a -> Identity a

GShowSingle Identity Par1 
Instance details

Defined in Generic.Data.Internal.Show

MonadBaseControl Identity Identity 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM Identity a :: Type #

Sieve ReifiedGetter Identity 
Instance details

Defined in Control.Lens.Reified

Methods

sieve :: ReifiedGetter a b -> a -> Identity b #

Cosieve ReifiedGetter Identity 
Instance details

Defined in Control.Lens.Reified

Methods

cosieve :: ReifiedGetter a b -> Identity a -> b #

FoldableWithIndex () Identity 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (() -> a -> m) -> Identity a -> m #

ifolded :: IndexedFold () (Identity a) a #

ifoldr :: (() -> a -> b -> b) -> b -> Identity a -> b #

ifoldl :: (() -> b -> a -> b) -> b -> Identity a -> b #

ifoldr' :: (() -> a -> b -> b) -> b -> Identity a -> b #

ifoldl' :: (() -> b -> a -> b) -> b -> Identity a -> b #

FunctorWithIndex () Identity 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (() -> a -> b) -> Identity a -> Identity b #

imapped :: IndexedSetter () (Identity a) (Identity b) a b #

TraversableWithIndex () Identity 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (() -> a -> f b) -> Identity a -> f (Identity b) #

itraversed :: IndexedTraversal () (Identity a) (Identity b) a b #

Show1 f => GShowSingle Identity (Rec1 f) 
Instance details

Defined in Generic.Data.Internal.Show

Bounded a => Bounded (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Enum a => Enum (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Eq a => Eq (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(==) :: Identity a -> Identity a -> Bool #

(/=) :: Identity a -> Identity a -> Bool #

Floating a => Floating (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Fractional a => Fractional (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Integral a => Integral (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Num a => Num (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Ord a => Ord (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

compare :: Identity a -> Identity a -> Ordering #

(<) :: Identity a -> Identity a -> Bool #

(<=) :: Identity a -> Identity a -> Bool #

(>) :: Identity a -> Identity a -> Bool #

(>=) :: Identity a -> Identity a -> Bool #

max :: Identity a -> Identity a -> Identity a #

min :: Identity a -> Identity a -> Identity a #

Read a => Read (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Real a => Real (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

toRational :: Identity a -> Rational #

RealFloat a => RealFloat (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

RealFrac a => RealFrac (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

properFraction :: Integral b => Identity a -> (b, Identity a) #

truncate :: Integral b => Identity a -> b #

round :: Integral b => Identity a -> b #

ceiling :: Integral b => Identity a -> b #

floor :: Integral b => Identity a -> b #

Show a => Show (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

showsPrec :: Int -> Identity a -> ShowS #

show :: Identity a -> String #

showList :: [Identity a] -> ShowS #

Ix a => Ix (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

IsString a => IsString (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromString :: String -> Identity a #

Generic (Identity a) 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep (Identity a) :: Type -> Type #

Methods

from :: Identity a -> Rep (Identity a) x #

to :: Rep (Identity a) x -> Identity a #

Semigroup a => Semigroup (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(<>) :: Identity a -> Identity a -> Identity a #

sconcat :: NonEmpty (Identity a) -> Identity a #

stimes :: Integral b => b -> Identity a -> Identity a #

Monoid a => Monoid (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

mempty :: Identity a #

mappend :: Identity a -> Identity a -> Identity a #

mconcat :: [Identity a] -> Identity a #

NFData a => NFData (Identity a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Identity a -> () #

Hashable a => Hashable (Identity a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Identity a -> Int #

hash :: Identity a -> Int #

Storable a => Storable (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

sizeOf :: Identity a -> Int #

alignment :: Identity a -> Int #

peekElemOff :: Ptr (Identity a) -> Int -> IO (Identity a) #

pokeElemOff :: Ptr (Identity a) -> Int -> Identity a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Identity a) #

pokeByteOff :: Ptr b -> Int -> Identity a -> IO () #

peek :: Ptr (Identity a) -> IO (Identity a) #

poke :: Ptr (Identity a) -> Identity a -> IO () #

Bits a => Bits (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

FiniteBits a => FiniteBits (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Binary a => Binary (Identity a) 
Instance details

Defined in Data.Binary.Class

Methods

put :: Identity a -> Put #

get :: Get (Identity a) #

putList :: [Identity a] -> Put #

Newtype (Identity a)

Since: newtype-generics-0.5.1

Instance details

Defined in Control.Newtype.Generics

Associated Types

type O (Identity a) :: Type #

Methods

pack :: O (Identity a) -> Identity a #

unpack :: Identity a -> O (Identity a) #

Wrapped (Identity a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Identity a) :: Type #

Ixed (Identity a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Identity a) -> Traversal' (Identity a) (IxValue (Identity a)) #

Generic1 Identity 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep1 Identity :: k -> Type #

Methods

from1 :: Identity a -> Rep1 Identity a #

to1 :: Rep1 Identity a -> Identity a #

t ~ Identity b => Rewrapped (Identity a) t 
Instance details

Defined in Control.Lens.Wrapped

Each (Identity a) (Identity b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Identity a) (Identity b) a b #

Field1 (Identity a) (Identity b) a b 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (Identity a) (Identity b) a b #

(Default a, ToRenderable a) => ToRenderable (EC a b) 
Instance details

Defined in Graphics.Rendering.Chart.State

Methods

toRenderable :: EC a b -> Renderable () #

type Rep Identity 
Instance details

Defined in Data.Functor.Rep

type Rep Identity = ()
type Diff Identity 
Instance details

Defined in Linear.Affine

type Diff Identity = Identity
type StM Identity a 
Instance details

Defined in Control.Monad.Trans.Control

type StM Identity a = a
type Rep (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

type Rep (Identity a) = D1 (MetaData "Identity" "Data.Functor.Identity" "base" True) (C1 (MetaCons "Identity" PrefixI True) (S1 (MetaSel (Just "runIdentity") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type O (Identity a) 
Instance details

Defined in Control.Newtype.Generics

type O (Identity a) = a
type Unwrapped (Identity a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Identity a) = a
type Index (Identity a) 
Instance details

Defined in Control.Lens.At

type Index (Identity a) = ()
type IxValue (Identity a) 
Instance details

Defined in Control.Lens.At

type IxValue (Identity a) = a
type Rep1 Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

type Rep1 Identity = D1 (MetaData "Identity" "Data.Functor.Identity" "base" True) (C1 (MetaCons "Identity" PrefixI True) (S1 (MetaSel (Just "runIdentity") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype Const a (b :: k) :: forall k. Type -> k -> Type #

The Const functor.

Constructors

Const 

Fields

Instances
Generic1 (Const a :: k -> Type) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep1 (Const a) :: k -> Type #

Methods

from1 :: Const a a0 -> Rep1 (Const a) a0 #

to1 :: Rep1 (Const a) a0 -> Const a a0 #

Bitraversable (Const :: Type -> Type -> Type)

Since: base-4.10.0.0

Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Const a b -> f (Const c d) #

Bifoldable (Const :: Type -> Type -> Type)

Since: base-4.10.0.0

Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => Const m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Const a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Const a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Const a b -> c #

Bifunctor (Const :: Type -> Type -> Type)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Const a c -> Const b d #

first :: (a -> b) -> Const a c -> Const b c #

second :: (b -> c) -> Const a b -> Const a c #

Eq2 (Const :: Type -> Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> Const a c -> Const b d -> Bool #

Ord2 (Const :: Type -> Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> Const a c -> Const b d -> Ordering #

Read2 (Const :: Type -> Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> Int -> ReadS (Const a b) #

liftReadList2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> ReadS [Const a b] #

liftReadPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec (Const a b) #

liftReadListPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec [Const a b] #

Show2 (Const :: Type -> Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> Const a b -> ShowS #

liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [Const a b] -> ShowS #

Biapplicative (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Biapplicative

Methods

bipure :: a -> b -> Const a b #

(<<*>>) :: Const (a -> b) (c -> d) -> Const a c -> Const b d #

biliftA2 :: (a -> b -> c) -> (d -> e -> f) -> Const a d -> Const b e -> Const c f #

(*>>) :: Const a b -> Const c d -> Const c d #

(<<*) :: Const a b -> Const c d -> Const a b #

NFData2 (Const :: Type -> Type -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> Const a b -> () #

Hashable2 (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> Const a b -> Int #

Bitraversable1 (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

bitraverse1 :: Apply f => (a -> f b) -> (c -> f d) -> Const a c -> f (Const b d) #

bisequence1 :: Apply f => Const (f a) (f b) -> f (Const a b) #

Biapply (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<<.>>) :: Const (a -> b) (c -> d) -> Const a c -> Const b d #

(.>>) :: Const a b -> Const c d -> Const c d #

(<<.) :: Const a b -> Const c d -> Const a b #

Functor (Const m :: Type -> Type)

Since: base-2.1

Instance details

Defined in Data.Functor.Const

Methods

fmap :: (a -> b) -> Const m a -> Const m b #

(<$) :: a -> Const m b -> Const m a #

Monoid m => Applicative (Const m :: Type -> Type)

Since: base-2.0.1

Instance details

Defined in Data.Functor.Const

Methods

pure :: a -> Const m a #

(<*>) :: Const m (a -> b) -> Const m a -> Const m b #

liftA2 :: (a -> b -> c) -> Const m a -> Const m b -> Const m c #

(*>) :: Const m a -> Const m b -> Const m b #

(<*) :: Const m a -> Const m b -> Const m a #

Foldable (Const m :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Functor.Const

Methods

fold :: Monoid m0 => Const m m0 -> m0 #

foldMap :: Monoid m0 => (a -> m0) -> Const m a -> m0 #

foldr :: (a -> b -> b) -> b -> Const m a -> b #

foldr' :: (a -> b -> b) -> b -> Const m a -> b #

foldl :: (b -> a -> b) -> b -> Const m a -> b #

foldl' :: (b -> a -> b) -> b -> Const m a -> b #

foldr1 :: (a -> a -> a) -> Const m a -> a #

foldl1 :: (a -> a -> a) -> Const m a -> a #

toList :: Const m a -> [a] #

null :: Const m a -> Bool #

length :: Const m a -> Int #

elem :: Eq a => a -> Const m a -> Bool #

maximum :: Ord a => Const m a -> a #

minimum :: Ord a => Const m a -> a #

sum :: Num a => Const m a -> a #

product :: Num a => Const m a -> a #

Traversable (Const m :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Const m a -> f (Const m b) #

sequenceA :: Applicative f => Const m (f a) -> f (Const m a) #

mapM :: Monad m0 => (a -> m0 b) -> Const m a -> m0 (Const m b) #

sequence :: Monad m0 => Const m (m0 a) -> m0 (Const m a) #

Contravariant (Const a :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a0 -> b) -> Const a b -> Const a a0 #

(>$) :: b -> Const a b -> Const a a0 #

Eq a => Eq1 (Const a :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a0 -> b -> Bool) -> Const a a0 -> Const a b -> Bool #

Ord a => Ord1 (Const a :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a0 -> b -> Ordering) -> Const a a0 -> Const a b -> Ordering #

Read a => Read1 (Const a :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a0) -> ReadS [a0] -> Int -> ReadS (Const a a0) #

liftReadList :: (Int -> ReadS a0) -> ReadS [a0] -> ReadS [Const a a0] #

liftReadPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec (Const a a0) #

liftReadListPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec [Const a a0] #

Show a => Show1 (Const a :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> Int -> Const a a0 -> ShowS #

liftShowList :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> [Const a a0] -> ShowS #

NFData a => NFData1 (Const a :: Type -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a0 -> ()) -> Const a a0 -> () #

Hashable a => Hashable1 (Const a :: Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> Const a a0 -> Int #

Semigroup m => Apply (Const m :: Type -> Type) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Const m (a -> b) -> Const m a -> Const m b #

(.>) :: Const m a -> Const m b -> Const m b #

(<.) :: Const m a -> Const m b -> Const m a #

liftF2 :: (a -> b -> c) -> Const m a -> Const m b -> Const m c #

Bounded a => Bounded (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

minBound :: Const a b #

maxBound :: Const a b #

Enum a => Enum (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

succ :: Const a b -> Const a b #

pred :: Const a b -> Const a b #

toEnum :: Int -> Const a b #

fromEnum :: Const a b -> Int #

enumFrom :: Const a b -> [Const a b] #

enumFromThen :: Const a b -> Const a b -> [Const a b] #

enumFromTo :: Const a b -> Const a b -> [Const a b] #

enumFromThenTo :: Const a b -> Const a b -> Const a b -> [Const a b] #

Eq a => Eq (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(==) :: Const a b -> Const a b -> Bool #

(/=) :: Const a b -> Const a b -> Bool #

Floating a => Floating (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

pi :: Const a b #

exp :: Const a b -> Const a b #

log :: Const a b -> Const a b #

sqrt :: Const a b -> Const a b #

(**) :: Const a b -> Const a b -> Const a b #

logBase :: Const a b -> Const a b -> Const a b #

sin :: Const a b -> Const a b #

cos :: Const a b -> Const a b #

tan :: Const a b -> Const a b #

asin :: Const a b -> Const a b #

acos :: Const a b -> Const a b #

atan :: Const a b -> Const a b #

sinh :: Const a b -> Const a b #

cosh :: Const a b -> Const a b #

tanh :: Const a b -> Const a b #

asinh :: Const a b -> Const a b #

acosh :: Const a b -> Const a b #

atanh :: Const a b -> Const a b #

log1p :: Const a b -> Const a b #

expm1 :: Const a b -> Const a b #

log1pexp :: Const a b -> Const a b #

log1mexp :: Const a b -> Const a b #

Fractional a => Fractional (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(/) :: Const a b -> Const a b -> Const a b #

recip :: Const a b -> Const a b #

fromRational :: Rational -> Const a b #

Integral a => Integral (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

quot :: Const a b -> Const a b -> Const a b #

rem :: Const a b -> Const a b -> Const a b #

div :: Const a b -> Const a b -> Const a b #

mod :: Const a b -> Const a b -> Const a b #

quotRem :: Const a b -> Const a b -> (Const a b, Const a b) #

divMod :: Const a b -> Const a b -> (Const a b, Const a b) #

toInteger :: Const a b -> Integer #

Num a => Num (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(+) :: Const a b -> Const a b -> Const a b #

(-) :: Const a b -> Const a b -> Const a b #

(*) :: Const a b -> Const a b -> Const a b #

negate :: Const a b -> Const a b #

abs :: Const a b -> Const a b #

signum :: Const a b -> Const a b #

fromInteger :: Integer -> Const a b #

Ord a => Ord (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

compare :: Const a b -> Const a b -> Ordering #

(<) :: Const a b -> Const a b -> Bool #

(<=) :: Const a b -> Const a b -> Bool #

(>) :: Const a b -> Const a b -> Bool #

(>=) :: Const a b -> Const a b -> Bool #

max :: Const a b -> Const a b -> Const a b #

min :: Const a b -> Const a b -> Const a b #

Read a => Read (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the runConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

Real a => Real (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

toRational :: Const a b -> Rational #

RealFloat a => RealFloat (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

floatRadix :: Const a b -> Integer #

floatDigits :: Const a b -> Int #

floatRange :: Const a b -> (Int, Int) #

decodeFloat :: Const a b -> (Integer, Int) #

encodeFloat :: Integer -> Int -> Const a b #

exponent :: Const a b -> Int #

significand :: Const a b -> Const a b #

scaleFloat :: Int -> Const a b -> Const a b #

isNaN :: Const a b -> Bool #

isInfinite :: Const a b -> Bool #

isDenormalized :: Const a b -> Bool #

isNegativeZero :: Const a b -> Bool #

isIEEE :: Const a b -> Bool #

atan2 :: Const a b -> Const a b -> Const a b #

RealFrac a => RealFrac (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

properFraction :: Integral b0 => Const a b -> (b0, Const a b) #

truncate :: Integral b0 => Const a b -> b0 #

round :: Integral b0 => Const a b -> b0 #

ceiling :: Integral b0 => Const a b -> b0 #

floor :: Integral b0 => Const a b -> b0 #

Show a => Show (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the runConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

Methods

showsPrec :: Int -> Const a b -> ShowS #

show :: Const a b -> String #

showList :: [Const a b] -> ShowS #

Ix a => Ix (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

range :: (Const a b, Const a b) -> [Const a b] #

index :: (Const a b, Const a b) -> Const a b -> Int #

unsafeIndex :: (Const a b, Const a b) -> Const a b -> Int

inRange :: (Const a b, Const a b) -> Const a b -> Bool #

rangeSize :: (Const a b, Const a b) -> Int #

unsafeRangeSize :: (Const a b, Const a b) -> Int

IsString a => IsString (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromString :: String -> Const a b #

Generic (Const a b) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep (Const a b) :: Type -> Type #

Methods

from :: Const a b -> Rep (Const a b) x #

to :: Rep (Const a b) x -> Const a b #

Semigroup a => Semigroup (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(<>) :: Const a b -> Const a b -> Const a b #

sconcat :: NonEmpty (Const a b) -> Const a b #

stimes :: Integral b0 => b0 -> Const a b -> Const a b #

Monoid a => Monoid (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

mempty :: Const a b #

mappend :: Const a b -> Const a b -> Const a b #

mconcat :: [Const a b] -> Const a b #

NFData a => NFData (Const a b)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Const a b -> () #

Hashable a => Hashable (Const a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Const a b -> Int #

hash :: Const a b -> Int #

Storable a => Storable (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

sizeOf :: Const a b -> Int #

alignment :: Const a b -> Int #

peekElemOff :: Ptr (Const a b) -> Int -> IO (Const a b) #

pokeElemOff :: Ptr (Const a b) -> Int -> Const a b -> IO () #

peekByteOff :: Ptr b0 -> Int -> IO (Const a b) #

pokeByteOff :: Ptr b0 -> Int -> Const a b -> IO () #

peek :: Ptr (Const a b) -> IO (Const a b) #

poke :: Ptr (Const a b) -> Const a b -> IO () #

Bits a => Bits (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(.&.) :: Const a b -> Const a b -> Const a b #

(.|.) :: Const a b -> Const a b -> Const a b #

xor :: Const a b -> Const a b -> Const a b #

complement :: Const a b -> Const a b #

shift :: Const a b -> Int -> Const a b #

rotate :: Const a b -> Int -> Const a b #

zeroBits :: Const a b #

bit :: Int -> Const a b #

setBit :: Const a b -> Int -> Const a b #

clearBit :: Const a b -> Int -> Const a b #

complementBit :: Const a b -> Int -> Const a b #

testBit :: Const a b -> Int -> Bool #

bitSizeMaybe :: Const a b -> Maybe Int #

bitSize :: Const a b -> Int #

isSigned :: Const a b -> Bool #

shiftL :: Const a b -> Int -> Const a b #

unsafeShiftL :: Const a b -> Int -> Const a b #

shiftR :: Const a b -> Int -> Const a b #

unsafeShiftR :: Const a b -> Int -> Const a b #

rotateL :: Const a b -> Int -> Const a b #

rotateR :: Const a b -> Int -> Const a b #

popCount :: Const a b -> Int #

FiniteBits a => FiniteBits (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Newtype (Const a x) 
Instance details

Defined in Control.Newtype.Generics

Associated Types

type O (Const a x) :: Type #

Methods

pack :: O (Const a x) -> Const a x #

unpack :: Const a x -> O (Const a x) #

Wrapped (Const a x) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Const a x) :: Type #

Methods

_Wrapped' :: Iso' (Const a x) (Unwrapped (Const a x)) #

t ~ Const a' x' => Rewrapped (Const a x) t 
Instance details

Defined in Control.Lens.Wrapped

type Rep1 (Const a :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

type Rep1 (Const a :: k -> Type) = D1 (MetaData "Const" "Data.Functor.Const" "base" True) (C1 (MetaCons "Const" PrefixI True) (S1 (MetaSel (Just "getConst") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

type Rep (Const a b) = D1 (MetaData "Const" "Data.Functor.Const" "base" True) (C1 (MetaCons "Const" PrefixI True) (S1 (MetaSel (Just "getConst") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type O (Const a x) 
Instance details

Defined in Control.Newtype.Generics

type O (Const a x) = a
type Unwrapped (Const a x) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Const a x) = a

(&) :: a -> (a -> b) -> b infixl 1 #

& is a reverse application operator. This provides notational convenience. Its precedence is one higher than that of the forward application operator $, which allows & to be nested in $.

>>> 5 & (+1) & show
"6"

Since: base-4.8.0.0

(<&>) :: Functor f => f a -> (a -> b) -> f b infixl 1 #

Flipped version of <$>.

(<&>) = flip fmap

Examples

Expand

Apply (+1) to a list, a Just and a Right:

>>> Just 2 <&> (+1)
Just 3
>>> [1,2,3] <&> (+1)
[2,3,4]
>>> Right 3 <&> (+1)
Right 4

Since: base-4.11.0.0

yellow :: (Ord a, Floating a) => Colour a #

whitesmoke :: (Ord a, Floating a) => Colour a #

white :: (Ord a, Floating a) => Colour a #

wheat :: (Ord a, Floating a) => Colour a #

violet :: (Ord a, Floating a) => Colour a #

turquoise :: (Ord a, Floating a) => Colour a #

tomato :: (Ord a, Floating a) => Colour a #

thistle :: (Ord a, Floating a) => Colour a #

teal :: (Ord a, Floating a) => Colour a #

steelblue :: (Ord a, Floating a) => Colour a #

snow :: (Ord a, Floating a) => Colour a #

slategrey :: (Ord a, Floating a) => Colour a #

slategray :: (Ord a, Floating a) => Colour a #

slateblue :: (Ord a, Floating a) => Colour a #

skyblue :: (Ord a, Floating a) => Colour a #

silver :: (Ord a, Floating a) => Colour a #

sienna :: (Ord a, Floating a) => Colour a #

seashell :: (Ord a, Floating a) => Colour a #

seagreen :: (Ord a, Floating a) => Colour a #

sandybrown :: (Ord a, Floating a) => Colour a #

salmon :: (Ord a, Floating a) => Colour a #

royalblue :: (Ord a, Floating a) => Colour a #

rosybrown :: (Ord a, Floating a) => Colour a #

red :: (Ord a, Floating a) => Colour a #

purple :: (Ord a, Floating a) => Colour a #

powderblue :: (Ord a, Floating a) => Colour a #

plum :: (Ord a, Floating a) => Colour a #

pink :: (Ord a, Floating a) => Colour a #

peru :: (Ord a, Floating a) => Colour a #

peachpuff :: (Ord a, Floating a) => Colour a #

papayawhip :: (Ord a, Floating a) => Colour a #

palegreen :: (Ord a, Floating a) => Colour a #

orchid :: (Ord a, Floating a) => Colour a #

orangered :: (Ord a, Floating a) => Colour a #

orange :: (Ord a, Floating a) => Colour a #

olivedrab :: (Ord a, Floating a) => Colour a #

olive :: (Ord a, Floating a) => Colour a #

oldlace :: (Ord a, Floating a) => Colour a #

navy :: (Ord a, Floating a) => Colour a #

moccasin :: (Ord a, Floating a) => Colour a #

mistyrose :: (Ord a, Floating a) => Colour a #

mintcream :: (Ord a, Floating a) => Colour a #

mediumblue :: (Ord a, Floating a) => Colour a #

maroon :: (Ord a, Floating a) => Colour a #

magenta :: (Ord a, Floating a) => Colour a #

linen :: (Ord a, Floating a) => Colour a #

limegreen :: (Ord a, Floating a) => Colour a #

lime :: (Ord a, Floating a) => Colour a #

lightpink :: (Ord a, Floating a) => Colour a #

lightgrey :: (Ord a, Floating a) => Colour a #

lightgreen :: (Ord a, Floating a) => Colour a #

lightgray :: (Ord a, Floating a) => Colour a #

lightcyan :: (Ord a, Floating a) => Colour a #

lightcoral :: (Ord a, Floating a) => Colour a #

lightblue :: (Ord a, Floating a) => Colour a #

lawngreen :: (Ord a, Floating a) => Colour a #

lavender :: (Ord a, Floating a) => Colour a #

khaki :: (Ord a, Floating a) => Colour a #

ivory :: (Ord a, Floating a) => Colour a #

indigo :: (Ord a, Floating a) => Colour a #

indianred :: (Ord a, Floating a) => Colour a #

hotpink :: (Ord a, Floating a) => Colour a #

honeydew :: (Ord a, Floating a) => Colour a #

green :: (Ord a, Floating a) => Colour a #

grey :: (Ord a, Floating a) => Colour a #

gray :: (Ord a, Floating a) => Colour a #

goldenrod :: (Ord a, Floating a) => Colour a #

gold :: (Ord a, Floating a) => Colour a #

ghostwhite :: (Ord a, Floating a) => Colour a #

gainsboro :: (Ord a, Floating a) => Colour a #

fuchsia :: (Ord a, Floating a) => Colour a #

firebrick :: (Ord a, Floating a) => Colour a #

dodgerblue :: (Ord a, Floating a) => Colour a #

dimgrey :: (Ord a, Floating a) => Colour a #

dimgray :: (Ord a, Floating a) => Colour a #

deeppink :: (Ord a, Floating a) => Colour a #

darkviolet :: (Ord a, Floating a) => Colour a #

darksalmon :: (Ord a, Floating a) => Colour a #

darkred :: (Ord a, Floating a) => Colour a #

darkorchid :: (Ord a, Floating a) => Colour a #

darkorange :: (Ord a, Floating a) => Colour a #

darkkhaki :: (Ord a, Floating a) => Colour a #

darkgrey :: (Ord a, Floating a) => Colour a #

darkgreen :: (Ord a, Floating a) => Colour a #

darkgray :: (Ord a, Floating a) => Colour a #

darkcyan :: (Ord a, Floating a) => Colour a #

darkblue :: (Ord a, Floating a) => Colour a #

cyan :: (Ord a, Floating a) => Colour a #

crimson :: (Ord a, Floating a) => Colour a #

cornsilk :: (Ord a, Floating a) => Colour a #

coral :: (Ord a, Floating a) => Colour a #

chocolate :: (Ord a, Floating a) => Colour a #

chartreuse :: (Ord a, Floating a) => Colour a #

cadetblue :: (Ord a, Floating a) => Colour a #

burlywood :: (Ord a, Floating a) => Colour a #

brown :: (Ord a, Floating a) => Colour a #

blueviolet :: (Ord a, Floating a) => Colour a #

blue :: (Ord a, Floating a) => Colour a #

bisque :: (Ord a, Floating a) => Colour a #

beige :: (Ord a, Floating a) => Colour a #

azure :: (Ord a, Floating a) => Colour a #

aquamarine :: (Ord a, Floating a) => Colour a #

aqua :: (Ord a, Floating a) => Colour a #

aliceblue :: (Ord a, Floating a) => Colour a #

readColourName :: (MonadFail m, Monad m, Ord a, Floating a) => String -> m (Colour a) #

alphaChannel :: AlphaColour a -> a #

Returns the opacity of an AlphaColour.

atop :: Fractional a => AlphaColour a -> AlphaColour a -> AlphaColour a #

c1 `atop` c2 returns the AlphaColour produced by covering the portion of c2 visible by c1. The resulting alpha channel is always the same as the alpha channel of c2.

c1 `atop` (opaque c2) == c1 `over` (opaque c2)
AlphaChannel (c1 `atop` c2) == AlphaChannel c2

blend :: (Num a, AffineSpace f) => a -> f a -> f a -> f a #

Compute the weighted average of two points. e.g.

blend 0.4 a b = 0.4*a + 0.6*b

The weight can be negative, or greater than 1.0; however, be aware that non-convex combinations may lead to out of gamut colours.

withOpacity :: Num a => Colour a -> a -> AlphaColour a #

Creates an AlphaColour from a Colour with a given opacity.

c `withOpacity` o == dissolve o (opaque c)

dissolve :: Num a => a -> AlphaColour a -> AlphaColour a #

Returns an AlphaColour more transparent by a factor of o.

opaque :: Num a => Colour a -> AlphaColour a #

Creates an opaque AlphaColour from a Colour.

alphaColourConvert :: (Fractional b, Real a) => AlphaColour a -> AlphaColour b #

Change the type used to represent the colour coordinates.

transparent :: Num a => AlphaColour a #

This AlphaColour is entirely transparent and has no associated colour channel.

black :: Num a => Colour a #

colourConvert :: (Fractional b, Real a) => Colour a -> Colour b #

Change the type used to represent the colour coordinates.

data Colour a #

This type represents the human preception of colour. The a parameter is a numeric type used internally for the representation.

The Monoid instance allows one to add colours, but beware that adding colours can take you out of gamut. Consider using blend whenever possible.

Instances
AffineSpace Colour 
Instance details

Defined in Data.Colour.Internal

Methods

affineCombo :: Num a => [(a, Colour a)] -> Colour a -> Colour a #

ColourOps Colour 
Instance details

Defined in Data.Colour.Internal

Methods

over :: Num a => AlphaColour a -> Colour a -> Colour a #

darken :: Num a => a -> Colour a -> Colour a #

Each ColourMap ColourMap (Colour Double) (Colour Double) 
Instance details

Defined in Plots.Style

Eq a => Eq (Colour a) 
Instance details

Defined in Data.Colour.Internal

Methods

(==) :: Colour a -> Colour a -> Bool #

(/=) :: Colour a -> Colour a -> Bool #

Num a => Semigroup (Colour a) 
Instance details

Defined in Data.Colour.Internal

Methods

(<>) :: Colour a -> Colour a -> Colour a #

sconcat :: NonEmpty (Colour a) -> Colour a #

stimes :: Integral b => b -> Colour a -> Colour a #

Num a => Monoid (Colour a) 
Instance details

Defined in Data.Colour.Internal

Methods

mempty :: Colour a #

mappend :: Colour a -> Colour a -> Colour a #

mconcat :: [Colour a] -> Colour a #

Parseable (Colour Double) 
Instance details

Defined in Diagrams.Backend.CmdLine

data AlphaColour a #

This type represents a Colour that may be semi-transparent.

The Monoid instance allows you to composite colours.

x `mappend` y == x `over` y

To get the (pre-multiplied) colour channel of an AlphaColour c, simply composite c over black.

c `over` black
Instances
AffineSpace AlphaColour 
Instance details

Defined in Data.Colour.Internal

Methods

affineCombo :: Num a => [(a, AlphaColour a)] -> AlphaColour a -> AlphaColour a #

ColourOps AlphaColour 
Instance details

Defined in Data.Colour.Internal

Methods

over :: Num a => AlphaColour a -> AlphaColour a -> AlphaColour a #

darken :: Num a => a -> AlphaColour a -> AlphaColour a #

Eq a => Eq (AlphaColour a) 
Instance details

Defined in Data.Colour.Internal

Num a => Semigroup (AlphaColour a)

AlphaColour forms a monoid with over and transparent.

Instance details

Defined in Data.Colour.Internal

Num a => Monoid (AlphaColour a) 
Instance details

Defined in Data.Colour.Internal

Parseable (AlphaColour Double) 
Instance details

Defined in Diagrams.Backend.CmdLine

class AffineSpace (f :: Type -> Type) where #

Methods

affineCombo :: Num a => [(a, f a)] -> f a -> f a #

Compute a affine Combination (weighted-average) of points. The last parameter will get the remaining weight. e.g.

affineCombo [(0.2,a), (0.3,b)] c == 0.2*a + 0.3*b + 0.5*c

Weights can be negative, or greater than 1.0; however, be aware that non-convex combinations may lead to out of gamut colours.

Instances
AffineSpace Colour 
Instance details

Defined in Data.Colour.Internal

Methods

affineCombo :: Num a => [(a, Colour a)] -> Colour a -> Colour a #

AffineSpace AlphaColour 
Instance details

Defined in Data.Colour.Internal

Methods

affineCombo :: Num a => [(a, AlphaColour a)] -> AlphaColour a -> AlphaColour a #

class ColourOps (f :: Type -> Type) where #

Minimal complete definition

over, darken

Methods

darken :: Num a => a -> f a -> f a #

darken s c blends a colour with black without changing it's opacity.

For Colour, darken s c = blend s c mempty

Instances
ColourOps Colour 
Instance details

Defined in Data.Colour.Internal

Methods

over :: Num a => AlphaColour a -> Colour a -> Colour a #

darken :: Num a => a -> Colour a -> Colour a #

ColourOps AlphaColour 
Instance details

Defined in Data.Colour.Internal

Methods

over :: Num a => AlphaColour a -> AlphaColour a -> AlphaColour a #

darken :: Num a => a -> AlphaColour a -> AlphaColour a #

class Default a where #

A class for types with a default value.

Minimal complete definition

Nothing

Methods

def :: a #

The default value for this type.

Instances
Default Double 
Instance details

Defined in Data.Default.Class

Methods

def :: Double #

Default Float 
Instance details

Defined in Data.Default.Class

Methods

def :: Float #

Default Int 
Instance details

Defined in Data.Default.Class

Methods

def :: Int #

Default Int8 
Instance details

Defined in Data.Default.Class

Methods

def :: Int8 #

Default Int16 
Instance details

Defined in Data.Default.Class

Methods

def :: Int16 #

Default Int32 
Instance details

Defined in Data.Default.Class

Methods

def :: Int32 #

Default Int64 
Instance details

Defined in Data.Default.Class

Methods

def :: Int64 #

Default Integer 
Instance details

Defined in Data.Default.Class

Methods

def :: Integer #

Default Ordering 
Instance details

Defined in Data.Default.Class

Methods

def :: Ordering #

Default Word 
Instance details

Defined in Data.Default.Class

Methods

def :: Word #

Default Word8 
Instance details

Defined in Data.Default.Class

Methods

def :: Word8 #

Default Word16 
Instance details

Defined in Data.Default.Class

Methods

def :: Word16 #

Default Word32 
Instance details

Defined in Data.Default.Class

Methods

def :: Word32 #

Default Word64 
Instance details

Defined in Data.Default.Class

Methods

def :: Word64 #

Default () 
Instance details

Defined in Data.Default.Class

Methods

def :: () #

Default All 
Instance details

Defined in Data.Default.Class

Methods

def :: All #

Default Any 
Instance details

Defined in Data.Default.Class

Methods

def :: Any #

Default CShort 
Instance details

Defined in Data.Default.Class

Methods

def :: CShort #

Default CUShort 
Instance details

Defined in Data.Default.Class

Methods

def :: CUShort #

Default CInt 
Instance details

Defined in Data.Default.Class

Methods

def :: CInt #

Default CUInt 
Instance details

Defined in Data.Default.Class

Methods

def :: CUInt #

Default CLong 
Instance details

Defined in Data.Default.Class

Methods

def :: CLong #

Default CULong 
Instance details

Defined in Data.Default.Class

Methods

def :: CULong #

Default CLLong 
Instance details

Defined in Data.Default.Class

Methods

def :: CLLong #

Default CULLong 
Instance details

Defined in Data.Default.Class

Methods

def :: CULLong #

Default CFloat 
Instance details

Defined in Data.Default.Class

Methods

def :: CFloat #

Default CDouble 
Instance details

Defined in Data.Default.Class

Methods

def :: CDouble #

Default CPtrdiff 
Instance details

Defined in Data.Default.Class

Methods

def :: CPtrdiff #

Default CSize 
Instance details

Defined in Data.Default.Class

Methods

def :: CSize #

Default CSigAtomic 
Instance details

Defined in Data.Default.Class

Methods

def :: CSigAtomic #

Default CClock 
Instance details

Defined in Data.Default.Class

Methods

def :: CClock #

Default CTime 
Instance details

Defined in Data.Default.Class

Methods

def :: CTime #

Default CUSeconds 
Instance details

Defined in Data.Default.Class

Methods

def :: CUSeconds #

Default CSUSeconds 
Instance details

Defined in Data.Default.Class

Methods

def :: CSUSeconds #

Default CIntPtr 
Instance details

Defined in Data.Default.Class

Methods

def :: CIntPtr #

Default CUIntPtr 
Instance details

Defined in Data.Default.Class

Methods

def :: CUIntPtr #

Default CIntMax 
Instance details

Defined in Data.Default.Class

Methods

def :: CIntMax #

Default CUIntMax 
Instance details

Defined in Data.Default.Class

Methods

def :: CUIntMax #

Default NewtonParam 
Instance details

Defined in Numeric.RootFinding

Methods

def :: NewtonParam #

Default RiddersParam 
Instance details

Defined in Numeric.RootFinding

Methods

def :: RiddersParam #

Default FillRule 
Instance details

Defined in Diagrams.TwoD.Path

Methods

def :: FillRule #

Default FileOptions 
Instance details

Defined in Graphics.Rendering.Chart.Backend.Cairo

Methods

def :: FileOptions #

Default AxisStyle 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Types

Methods

def :: AxisStyle #

Default AxisVisibility 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Types

Methods

def :: AxisVisibility #

Default FillStyle 
Instance details

Defined in Graphics.Rendering.Chart.Backend.Types

Methods

def :: FillStyle #

Default FontSlant 
Instance details

Defined in Graphics.Rendering.Chart.Backend.Types

Methods

def :: FontSlant #

Default FontStyle 
Instance details

Defined in Graphics.Rendering.Chart.Backend.Types

Methods

def :: FontStyle #

Default FontWeight 
Instance details

Defined in Graphics.Rendering.Chart.Backend.Types

Methods

def :: FontWeight #

Default LineStyle 
Instance details

Defined in Graphics.Rendering.Chart.Backend.Types

Methods

def :: LineStyle #

Default PointStyle 
Instance details

Defined in Graphics.Rendering.Chart.Drawing

Methods

def :: PointStyle #

Default LegendStyle 
Instance details

Defined in Graphics.Rendering.Chart.Legend

Methods

def :: LegendStyle #

Default PieChart 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Pie

Methods

def :: PieChart #

Default PieItem 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Pie

Methods

def :: PieItem #

Default PieLayout 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Pie

Methods

def :: PieLayout #

Default VectorStyle 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Vectors

Methods

def :: VectorStyle #

Default Rectangle 
Instance details

Defined in Graphics.Rendering.Chart.Renderable

Methods

def :: Rectangle #

Default CState 
Instance details

Defined in Graphics.Rendering.Chart.State

Methods

def :: CState #

Default LogScale 
Instance details

Defined in Plots.Axis.Scale

Methods

def :: LogScale #

Default NanColours 
Instance details

Defined in Plots.Style

Methods

def :: NanColours #

Default NormalisationMethod 
Instance details

Defined in Plots.Types.Histogram

Default CairoState 
Instance details

Defined in Diagrams.Backend.Cairo.Internal

Methods

def :: CairoState #

Default FontSlant 
Instance details

Defined in Diagrams.TwoD.Text

Methods

def :: FontSlant #

Default FontWeight 
Instance details

Defined in Diagrams.TwoD.Text

Methods

def :: FontWeight #

Default AxisLineType 
Instance details

Defined in Plots.Axis.Line

Methods

def :: AxisLineType #

Default [a] 
Instance details

Defined in Data.Default.Class

Methods

def :: [a] #

Default (Maybe a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Maybe a #

Integral a => Default (Ratio a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Ratio a #

Default a => Default (IO a) 
Instance details

Defined in Data.Default.Class

Methods

def :: IO a #

(Default a, RealFloat a) => Default (Complex a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Complex a #

Default (First a) 
Instance details

Defined in Data.Default.Class

Methods

def :: First a #

Default (Last a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Last a #

Default a => Default (Dual a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Dual a #

Default (Endo a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Endo a #

Num a => Default (Sum a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Sum a #

Num a => Default (Product a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Product a #

TypeableFloat n => Default (ArrowOpts n) 
Instance details

Defined in Diagrams.TwoD.Arrow

Methods

def :: ArrowOpts n #

OrderedField n => Default (EnvelopeOpts n) 
Instance details

Defined in Diagrams.TwoD.Model

Methods

def :: EnvelopeOpts n #

Fractional n => Default (OriginOpts n) 
Instance details

Defined in Diagrams.TwoD.Model

Methods

def :: OriginOpts n #

Floating n => Default (TraceOpts n) 
Instance details

Defined in Diagrams.TwoD.Model

Methods

def :: TraceOpts n #

Default (StrokeOpts a) 
Instance details

Defined in Diagrams.TwoD.Path

Methods

def :: StrokeOpts a #

Num n => Default (PolygonOpts n) 
Instance details

Defined in Diagrams.TwoD.Polygons

Methods

def :: PolygonOpts n #

Num d => Default (RoundedRectOpts d) 
Instance details

Defined in Diagrams.TwoD.Shapes

Methods

def :: RoundedRectOpts d #

(Show a, RealFloat a) => Default (LinearAxisParams a) 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

Methods

def :: LinearAxisParams a #

(Show a, RealFloat a) => Default (LogAxisParams a) 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

Methods

def :: LogAxisParams a #

PlotValue t => Default (LayoutAxis t) 
Instance details

Defined in Graphics.Rendering.Chart.Layout

Methods

def :: LayoutAxis t #

Default (StackedLayouts x) 
Instance details

Defined in Graphics.Rendering.Chart.Layout

Methods

def :: StackedLayouts x #

Fractional n => Default (AxisScaling n) 
Instance details

Defined in Plots.Axis.Scale

Methods

def :: AxisScaling n #

Fractional n => Default (BarLayout n) 
Instance details

Defined in Plots.Types.Bar

Methods

def :: BarLayout n #

Default (HistogramOptions n) 
Instance details

Defined in Plots.Types.Histogram

Methods

def :: HistogramOptions n #

Default (FillTexture n) 
Instance details

Defined in Diagrams.TwoD.Attributes

Methods

def :: FillTexture n #

Default (LineTexture n) 
Instance details

Defined in Diagrams.TwoD.Attributes

Methods

def :: LineTexture n #

Num n => Default (FontSizeM n) 
Instance details

Defined in Diagrams.TwoD.Text

Methods

def :: FontSizeM n #

Default r => Default (e -> r) 
Instance details

Defined in Data.Default.Class

Methods

def :: e -> r #

(Default a, Default b) => Default (a, b) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b) #

(PlotValue x, PlotValue y) => Default (Layout x y) 
Instance details

Defined in Graphics.Rendering.Chart.Layout

Methods

def :: Layout x y #

Default (PlotAnnotation x y) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Annotation

Methods

def :: PlotAnnotation x y #

BarsPlotValue y => Default (PlotBars x y) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Bars

Methods

def :: PlotBars x y #

Default (PlotCandle x y) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Candle

Methods

def :: PlotCandle x y #

Default (PlotErrBars x y) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.ErrBars

Methods

def :: PlotErrBars x y #

Default (PlotFillBetween x y) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.FillBetween

Methods

def :: PlotFillBetween x y #

Default (PlotHist x Int) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Histogram

Methods

def :: PlotHist x Int #

Default (PlotLines x y) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Lines

Methods

def :: PlotLines x y #

Default (PlotPoints x y) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Points

Methods

def :: PlotPoints x y #

Default (PlotVectors x y) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Vectors

Methods

def :: PlotVectors x y #

(Typeable n, Floating n) => Default (GridLines v n) 
Instance details

Defined in Plots.Axis.Grid

Methods

def :: GridLines v n #

(Typeable n, Floating n) => Default (MajorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

Methods

def :: MajorGridLines v n #

(Typeable n, Floating n) => Default (MinorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

Methods

def :: MinorGridLines v n #

TypeableFloat n => Default (MajorTicks v n) 
Instance details

Defined in Plots.Axis.Ticks

Methods

def :: MajorTicks v n #

TypeableFloat n => Default (MinorTicks v n) 
Instance details

Defined in Plots.Axis.Ticks

Methods

def :: MinorTicks v n #

TypeableFloat n => Default (Ticks v n) 
Instance details

Defined in Plots.Axis.Ticks

Methods

def :: Ticks v n #

(TypeableFloat n, Renderable (Text n) b) => Default (Legend b n) 
Instance details

Defined in Plots.Legend

Methods

def :: Legend b n #

Typeable n => Default (AxisLine v n) 
Instance details

Defined in Plots.Axis.Line

Methods

def :: AxisLine v n #

(Default a, Default b, Default c) => Default (a, b, c) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c) #

(PlotValue x, PlotValue y1, PlotValue y2) => Default (LayoutLR x y1 y2) 
Instance details

Defined in Graphics.Rendering.Chart.Layout

Methods

def :: LayoutLR x y1 y2 #

Default (AreaSpots z x y) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.AreaSpots

Methods

def :: AreaSpots z x y #

(TypeableFloat n, Renderable (Text n) b) => Default (SingleAxis b V2 n) 
Instance details

Defined in Plots.Axis

Methods

def :: SingleAxis b V2 n #

(TypeableFloat n, Renderable (Text n) b) => Default (AxisLabel b V2 n) 
Instance details

Defined in Plots.Axis.Labels

Methods

def :: AxisLabel b V2 n #

(TypeableFloat n, Renderable (Text n) b) => Default (TickLabels b V2 n) 
Instance details

Defined in Plots.Axis.Labels

Methods

def :: TickLabels b V2 n #

(Renderable (Text n) b, TypeableFloat n) => Default (Title b V2 n) 
Instance details

Defined in Plots.Axis.Title

Methods

def :: Title b V2 n #

Default (LegendPic b v n) 
Instance details

Defined in Plots.Types

Methods

def :: LegendPic b v n #

(Additive v, Num n) => Default (PlotMods b v n) 
Instance details

Defined in Plots.Types

Methods

def :: PlotMods b v n #

(Additive v, Num n) => Default (PlotOptions b v n) 
Instance details

Defined in Plots.Types

Methods

def :: PlotOptions b v n #

(Default a, Default b, Default c, Default d) => Default (a, b, c, d) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c, d) #

Default (AreaSpots4D z t x y) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.AreaSpots

Methods

def :: AreaSpots4D z t x y #

(Default a, Default b, Default c, Default d, Default e) => Default (a, b, c, d, e) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c, d, e) #

(Default a, Default b, Default c, Default d, Default e, Default f) => Default (a, b, c, d, e, f) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c, d, e, f) #

(Default a, Default b, Default c, Default d, Default e, Default f, Default g) => Default (a, b, c, d, e, f, g) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c, d, e, f, g) #

class Profunctor (p :: Type -> Type -> Type) where #

Formally, the class Profunctor represents a profunctor from Hask -> Hask.

Intuitively it is a bifunctor where the first argument is contravariant and the second argument is covariant.

You can define a Profunctor by either defining dimap or by defining both lmap and rmap.

If you supply dimap, you should ensure that:

dimap id idid

If you supply lmap and rmap, ensure:

lmap idid
rmap idid

If you supply both, you should also ensure:

dimap f g ≡ lmap f . rmap g

These ensure by parametricity:

dimap (f . g) (h . i) ≡ dimap g h . dimap f i
lmap (f . g) ≡ lmap g . lmap f
rmap (f . g) ≡ rmap f . rmap g

Minimal complete definition

dimap | lmap, rmap

Methods

dimap :: (a -> b) -> (c -> d) -> p b c -> p a d #

Map over both arguments at the same time.

dimap f g ≡ lmap f . rmap g

lmap :: (a -> b) -> p b c -> p a c #

Map the first argument contravariantly.

lmap f ≡ dimap f id

rmap :: (b -> c) -> p a b -> p a c #

Map the second argument covariantly.

rmapdimap id
Instances
Profunctor Measured 
Instance details

Defined in Diagrams.Core.Measure

Methods

dimap :: (a -> b) -> (c -> d) -> Measured b c -> Measured a d #

lmap :: (a -> b) -> Measured b c -> Measured a c #

rmap :: (b -> c) -> Measured a b -> Measured a c #

(#.) :: Coercible c b => q b c -> Measured a b -> Measured a c #

(.#) :: Coercible b a => Measured b c -> q a b -> Measured a c #

Profunctor ReifiedFold 
Instance details

Defined in Control.Lens.Reified

Methods

dimap :: (a -> b) -> (c -> d) -> ReifiedFold b c -> ReifiedFold a d #

lmap :: (a -> b) -> ReifiedFold b c -> ReifiedFold a c #

rmap :: (b -> c) -> ReifiedFold a b -> ReifiedFold a c #

(#.) :: Coercible c b => q b c -> ReifiedFold a b -> ReifiedFold a c #

(.#) :: Coercible b a => ReifiedFold b c -> q a b -> ReifiedFold a c #

Profunctor ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Methods

dimap :: (a -> b) -> (c -> d) -> ReifiedGetter b c -> ReifiedGetter a d #

lmap :: (a -> b) -> ReifiedGetter b c -> ReifiedGetter a c #

rmap :: (b -> c) -> ReifiedGetter a b -> ReifiedGetter a c #

(#.) :: Coercible c b => q b c -> ReifiedGetter a b -> ReifiedGetter a c #

(.#) :: Coercible b a => ReifiedGetter b c -> q a b -> ReifiedGetter a c #

Monad m => Profunctor (Kleisli m) 
Instance details

Defined in Data.Profunctor.Unsafe

Methods

dimap :: (a -> b) -> (c -> d) -> Kleisli m b c -> Kleisli m a d #

lmap :: (a -> b) -> Kleisli m b c -> Kleisli m a c #

rmap :: (b -> c) -> Kleisli m a b -> Kleisli m a c #

(#.) :: Coercible c b => q b c -> Kleisli m a b -> Kleisli m a c #

(.#) :: Coercible b a => Kleisli m b c -> q a b -> Kleisli m a c #

Profunctor p => Profunctor (TambaraSum p) 
Instance details

Defined in Data.Profunctor.Choice

Methods

dimap :: (a -> b) -> (c -> d) -> TambaraSum p b c -> TambaraSum p a d #

lmap :: (a -> b) -> TambaraSum p b c -> TambaraSum p a c #

rmap :: (b -> c) -> TambaraSum p a b -> TambaraSum p a c #

(#.) :: Coercible c b => q b c -> TambaraSum p a b -> TambaraSum p a c #

(.#) :: Coercible b a => TambaraSum p b c -> q a b -> TambaraSum p a c #

Profunctor (PastroSum p) 
Instance details

Defined in Data.Profunctor.Choice

Methods

dimap :: (a -> b) -> (c -> d) -> PastroSum p b c -> PastroSum p a d #

lmap :: (a -> b) -> PastroSum p b c -> PastroSum p a c #

rmap :: (b -> c) -> PastroSum p a b -> PastroSum p a c #

(#.) :: Coercible c b => q b c -> PastroSum p a b -> PastroSum p a c #

(.#) :: Coercible b a => PastroSum p b c -> q a b -> PastroSum p a c #

Profunctor (CotambaraSum p) 
Instance details

Defined in Data.Profunctor.Choice

Methods

dimap :: (a -> b) -> (c -> d) -> CotambaraSum p b c -> CotambaraSum p a d #

lmap :: (a -> b) -> CotambaraSum p b c -> CotambaraSum p a c #

rmap :: (b -> c) -> CotambaraSum p a b -> CotambaraSum p a c #

(#.) :: Coercible c b => q b c -> CotambaraSum p a b -> CotambaraSum p a c #

(.#) :: Coercible b a => CotambaraSum p b c -> q a b -> CotambaraSum p a c #

Profunctor (CopastroSum p) 
Instance details

Defined in Data.Profunctor.Choice

Methods

dimap :: (a -> b) -> (c -> d) -> CopastroSum p b c -> CopastroSum p a d #

lmap :: (a -> b) -> CopastroSum p b c -> CopastroSum p a c #

rmap :: (b -> c) -> CopastroSum p a b -> CopastroSum p a c #

(#.) :: Coercible c b => q b c -> CopastroSum p a b -> CopastroSum p a c #

(.#) :: Coercible b a => CopastroSum p b c -> q a b -> CopastroSum p a c #

Profunctor p => Profunctor (Tambara p) 
Instance details

Defined in Data.Profunctor.Strong

Methods

dimap :: (a -> b) -> (c -> d) -> Tambara p b c -> Tambara p a d #

lmap :: (a -> b) -> Tambara p b c -> Tambara p a c #

rmap :: (b -> c) -> Tambara p a b -> Tambara p a c #

(#.) :: Coercible c b => q b c -> Tambara p a b -> Tambara p a c #

(.#) :: Coercible b a => Tambara p b c -> q a b -> Tambara p a c #

Profunctor (Pastro p) 
Instance details

Defined in Data.Profunctor.Strong

Methods

dimap :: (a -> b) -> (c -> d) -> Pastro p b c -> Pastro p a d #

lmap :: (a -> b) -> Pastro p b c -> Pastro p a c #

rmap :: (b -> c) -> Pastro p a b -> Pastro p a c #

(#.) :: Coercible c b => q b c -> Pastro p a b -> Pastro p a c #

(.#) :: Coercible b a => Pastro p b c -> q a b -> Pastro p a c #

Profunctor (Cotambara p) 
Instance details

Defined in Data.Profunctor.Strong

Methods

dimap :: (a -> b) -> (c -> d) -> Cotambara p b c -> Cotambara p a d #

lmap :: (a -> b) -> Cotambara p b c -> Cotambara p a c #

rmap :: (b -> c) -> Cotambara p a b -> Cotambara p a c #

(#.) :: Coercible c b => q b c -> Cotambara p a b -> Cotambara p a c #

(.#) :: Coercible b a => Cotambara p b c -> q a b -> Cotambara p a c #

Profunctor (Copastro p) 
Instance details

Defined in Data.Profunctor.Strong

Methods

dimap :: (a -> b) -> (c -> d) -> Copastro p b c -> Copastro p a d #

lmap :: (a -> b) -> Copastro p b c -> Copastro p a c #

rmap :: (b -> c) -> Copastro p a b -> Copastro p a c #

(#.) :: Coercible c b => q b c -> Copastro p a b -> Copastro p a c #

(.#) :: Coercible b a => Copastro p b c -> q a b -> Copastro p a c #

Functor f => Profunctor (Star f) 
Instance details

Defined in Data.Profunctor.Types

Methods

dimap :: (a -> b) -> (c -> d) -> Star f b c -> Star f a d #

lmap :: (a -> b) -> Star f b c -> Star f a c #

rmap :: (b -> c) -> Star f a b -> Star f a c #

(#.) :: Coercible c b => q b c -> Star f a b -> Star f a c #

(.#) :: Coercible b a => Star f b c -> q a b -> Star f a c #

Functor f => Profunctor (Costar f) 
Instance details

Defined in Data.Profunctor.Types

Methods

dimap :: (a -> b) -> (c -> d) -> Costar f b c -> Costar f a d #

lmap :: (a -> b) -> Costar f b c -> Costar f a c #

rmap :: (b -> c) -> Costar f a b -> Costar f a c #

(#.) :: Coercible c b => q b c -> Costar f a b -> Costar f a c #

(.#) :: Coercible b a => Costar f b c -> q a b -> Costar f a c #

Arrow p => Profunctor (WrappedArrow p) 
Instance details

Defined in Data.Profunctor.Types

Methods

dimap :: (a -> b) -> (c -> d) -> WrappedArrow p b c -> WrappedArrow p a d #

lmap :: (a -> b) -> WrappedArrow p b c -> WrappedArrow p a c #

rmap :: (b -> c) -> WrappedArrow p a b -> WrappedArrow p a c #

(#.) :: Coercible c b => q b c -> WrappedArrow p a b -> WrappedArrow p a c #

(.#) :: Coercible b a => WrappedArrow p b c -> q a b -> WrappedArrow p a c #

Profunctor (Forget r) 
Instance details

Defined in Data.Profunctor.Types

Methods

dimap :: (a -> b) -> (c -> d) -> Forget r b c -> Forget r a d #

lmap :: (a -> b) -> Forget r b c -> Forget r a c #

rmap :: (b -> c) -> Forget r a b -> Forget r a c #

(#.) :: Coercible c b => q b c -> Forget r a b -> Forget r a c #

(.#) :: Coercible b a => Forget r b c -> q a b -> Forget r a c #

Profunctor (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Profunctor.Unsafe

Methods

dimap :: (a -> b) -> (c -> d) -> Tagged b c -> Tagged a d #

lmap :: (a -> b) -> Tagged b c -> Tagged a c #

rmap :: (b -> c) -> Tagged a b -> Tagged a c #

(#.) :: Coercible c b => q b c -> Tagged a b -> Tagged a c #

(.#) :: Coercible b a => Tagged b c -> q a b -> Tagged a c #

Functor v => Profunctor (Query v) 
Instance details

Defined in Diagrams.Core.Query

Methods

dimap :: (a -> b) -> (c -> d) -> Query v b c -> Query v a d #

lmap :: (a -> b) -> Query v b c -> Query v a c #

rmap :: (b -> c) -> Query v a b -> Query v a c #

(#.) :: Coercible c b => q b c -> Query v a b -> Query v a c #

(.#) :: Coercible b a => Query v b c -> q a b -> Query v a c #

Profunctor (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

dimap :: (a -> b) -> (c -> d) -> Indexed i b c -> Indexed i a d #

lmap :: (a -> b) -> Indexed i b c -> Indexed i a c #

rmap :: (b -> c) -> Indexed i a b -> Indexed i a c #

(#.) :: Coercible c b => q b c -> Indexed i a b -> Indexed i a c #

(.#) :: Coercible b a => Indexed i b c -> q a b -> Indexed i a c #

Profunctor (ReifiedIndexedFold i) 
Instance details

Defined in Control.Lens.Reified

Methods

dimap :: (a -> b) -> (c -> d) -> ReifiedIndexedFold i b c -> ReifiedIndexedFold i a d #

lmap :: (a -> b) -> ReifiedIndexedFold i b c -> ReifiedIndexedFold i a c #

rmap :: (b -> c) -> ReifiedIndexedFold i a b -> ReifiedIndexedFold i a c #

(#.) :: Coercible c b => q b c -> ReifiedIndexedFold i a b -> ReifiedIndexedFold i a c #

(.#) :: Coercible b a => ReifiedIndexedFold i b c -> q a b -> ReifiedIndexedFold i a c #

Profunctor (ReifiedIndexedGetter i) 
Instance details

Defined in Control.Lens.Reified

Methods

dimap :: (a -> b) -> (c -> d) -> ReifiedIndexedGetter i b c -> ReifiedIndexedGetter i a d #

lmap :: (a -> b) -> ReifiedIndexedGetter i b c -> ReifiedIndexedGetter i a c #

rmap :: (b -> c) -> ReifiedIndexedGetter i a b -> ReifiedIndexedGetter i a c #

(#.) :: Coercible c b => q b c -> ReifiedIndexedGetter i a b -> ReifiedIndexedGetter i a c #

(.#) :: Coercible b a => ReifiedIndexedGetter i b c -> q a b -> ReifiedIndexedGetter i a c #

Profunctor ((->) :: Type -> Type -> Type) 
Instance details

Defined in Data.Profunctor.Unsafe

Methods

dimap :: (a -> b) -> (c -> d) -> (b -> c) -> a -> d #

lmap :: (a -> b) -> (b -> c) -> a -> c #

rmap :: (b -> c) -> (a -> b) -> a -> c #

(#.) :: Coercible c b => q b c -> (a -> b) -> a -> c #

(.#) :: Coercible b a => (b -> c) -> q a b -> a -> c #

Functor w => Profunctor (Cokleisli w) 
Instance details

Defined in Data.Profunctor.Unsafe

Methods

dimap :: (a -> b) -> (c -> d) -> Cokleisli w b c -> Cokleisli w a d #

lmap :: (a -> b) -> Cokleisli w b c -> Cokleisli w a c #

rmap :: (b -> c) -> Cokleisli w a b -> Cokleisli w a c #

(#.) :: Coercible c b => q b c -> Cokleisli w a b -> Cokleisli w a c #

(.#) :: Coercible b a => Cokleisli w b c -> q a b -> Cokleisli w a c #

(Profunctor p, Profunctor q) => Profunctor (Procompose p q) 
Instance details

Defined in Data.Profunctor.Composition

Methods

dimap :: (a -> b) -> (c -> d) -> Procompose p q b c -> Procompose p q a d #

lmap :: (a -> b) -> Procompose p q b c -> Procompose p q a c #

rmap :: (b -> c) -> Procompose p q a b -> Procompose p q a c #

(#.) :: Coercible c b => q0 b c -> Procompose p q a b -> Procompose p q a c #

(.#) :: Coercible b a => Procompose p q b c -> q0 a b -> Procompose p q a c #

(Profunctor p, Profunctor q) => Profunctor (Rift p q) 
Instance details

Defined in Data.Profunctor.Composition

Methods

dimap :: (a -> b) -> (c -> d) -> Rift p q b c -> Rift p q a d #

lmap :: (a -> b) -> Rift p q b c -> Rift p q a c #

rmap :: (b -> c) -> Rift p q a b -> Rift p q a c #

(#.) :: Coercible c b => q0 b c -> Rift p q a b -> Rift p q a c #

(.#) :: Coercible b a => Rift p q b c -> q0 a b -> Rift p q a c #

Profunctor (Exchange a b) 
Instance details

Defined in Control.Lens.Internal.Iso

Methods

dimap :: (a0 -> b0) -> (c -> d) -> Exchange a b b0 c -> Exchange a b a0 d #

lmap :: (a0 -> b0) -> Exchange a b b0 c -> Exchange a b a0 c #

rmap :: (b0 -> c) -> Exchange a b a0 b0 -> Exchange a b a0 c #

(#.) :: Coercible c b0 => q b0 c -> Exchange a b a0 b0 -> Exchange a b a0 c #

(.#) :: Coercible b0 a0 => Exchange a b b0 c -> q a0 b0 -> Exchange a b a0 c #

Functor f => Profunctor (Joker f :: Type -> Type -> Type) 
Instance details

Defined in Data.Profunctor.Unsafe

Methods

dimap :: (a -> b) -> (c -> d) -> Joker f b c -> Joker f a d #

lmap :: (a -> b) -> Joker f b c -> Joker f a c #

rmap :: (b -> c) -> Joker f a b -> Joker f a c #

(#.) :: Coercible c b => q b c -> Joker f a b -> Joker f a c #

(.#) :: Coercible b a => Joker f b c -> q a b -> Joker f a c #

Contravariant f => Profunctor (Clown f :: Type -> Type -> Type) 
Instance details

Defined in Data.Profunctor.Unsafe

Methods

dimap :: (a -> b) -> (c -> d) -> Clown f b c -> Clown f a d #

lmap :: (a -> b) -> Clown f b c -> Clown f a c #

rmap :: (b -> c) -> Clown f a b -> Clown f a c #

(#.) :: Coercible c b => q b c -> Clown f a b -> Clown f a c #

(.#) :: Coercible b a => Clown f b c -> q a b -> Clown f a c #

(Profunctor p, Profunctor q) => Profunctor (Sum p q) 
Instance details

Defined in Data.Profunctor.Unsafe

Methods

dimap :: (a -> b) -> (c -> d) -> Sum p q b c -> Sum p q a d #

lmap :: (a -> b) -> Sum p q b c -> Sum p q a c #

rmap :: (b -> c) -> Sum p q a b -> Sum p q a c #

(#.) :: Coercible c b => q0 b c -> Sum p q a b -> Sum p q a c #

(.#) :: Coercible b a => Sum p q b c -> q0 a b -> Sum p q a c #

(Profunctor p, Profunctor q) => Profunctor (Product p q) 
Instance details

Defined in Data.Profunctor.Unsafe

Methods

dimap :: (a -> b) -> (c -> d) -> Product p q b c -> Product p q a d #

lmap :: (a -> b) -> Product p q b c -> Product p q a c #

rmap :: (b -> c) -> Product p q a b -> Product p q a c #

(#.) :: Coercible c b => q0 b c -> Product p q a b -> Product p q a c #

(.#) :: Coercible b a => Product p q b c -> q0 a b -> Product p q a c #

(Functor f, Profunctor p) => Profunctor (Tannen f p) 
Instance details

Defined in Data.Profunctor.Unsafe

Methods

dimap :: (a -> b) -> (c -> d) -> Tannen f p b c -> Tannen f p a d #

lmap :: (a -> b) -> Tannen f p b c -> Tannen f p a c #

rmap :: (b -> c) -> Tannen f p a b -> Tannen f p a c #

(#.) :: Coercible c b => q b c -> Tannen f p a b -> Tannen f p a c #

(.#) :: Coercible b a => Tannen f p b c -> q a b -> Tannen f p a c #

(Profunctor p, Functor f, Functor g) => Profunctor (Biff p f g) 
Instance details

Defined in Data.Profunctor.Unsafe

Methods

dimap :: (a -> b) -> (c -> d) -> Biff p f g b c -> Biff p f g a d #

lmap :: (a -> b) -> Biff p f g b c -> Biff p f g a c #

rmap :: (b -> c) -> Biff p f g a b -> Biff p f g a c #

(#.) :: Coercible c b => q b c -> Biff p f g a b -> Biff p f g a c #

(.#) :: Coercible b a => Biff p f g b c -> q a b -> Biff p f g a c #

class Profunctor p => Choice (p :: Type -> Type -> Type) where #

The generalization of Costar of Functor that is strong with respect to Either.

Note: This is also a notion of strength, except with regards to another monoidal structure that we can choose to equip Hask with: the cocartesian coproduct.

Minimal complete definition

left' | right'

Methods

left' :: p a b -> p (Either a c) (Either b c) #

Laws:

left'dimap swapE swapE . right' where
  swapE :: Either a b -> Either b a
  swapE = either Right Left
rmap Leftlmap Left . left'
lmap (right f) . left'rmap (right f) . left'
left' . left'dimap assocE unassocE . left' where
  assocE :: Either (Either a b) c -> Either a (Either b c)
  assocE (Left (Left a)) = Left a
  assocE (Left (Right b)) = Right (Left b)
  assocE (Right c) = Right (Right c)
  unassocE :: Either a (Either b c) -> Either (Either a b) c
  unassocE (Left a) = Left (Left a)
  unassocE (Right (Left b) = Left (Right b)
  unassocE (Right (Right c)) = Right c)

right' :: p a b -> p (Either c a) (Either c b) #

Laws:

right'dimap swapE swapE . left' where
  swapE :: Either a b -> Either b a
  swapE = either Right Left
rmap Rightlmap Right . right'
lmap (left f) . right'rmap (left f) . right'
right' . right'dimap unassocE assocE . right' where
  assocE :: Either (Either a b) c -> Either a (Either b c)
  assocE (Left (Left a)) = Left a
  assocE (Left (Right b)) = Right (Left b)
  assocE (Right c) = Right (Right c)
  unassocE :: Either a (Either b c) -> Either (Either a b) c
  unassocE (Left a) = Left (Left a)
  unassocE (Right (Left b) = Left (Right b)
  unassocE (Right (Right c)) = Right c)
Instances
Choice ReifiedFold 
Instance details

Defined in Control.Lens.Reified

Methods

left' :: ReifiedFold a b -> ReifiedFold (Either a c) (Either b c) #

right' :: ReifiedFold a b -> ReifiedFold (Either c a) (Either c b) #

Choice ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Methods

left' :: ReifiedGetter a b -> ReifiedGetter (Either a c) (Either b c) #

right' :: ReifiedGetter a b -> ReifiedGetter (Either c a) (Either c b) #

Monad m => Choice (Kleisli m) 
Instance details

Defined in Data.Profunctor.Choice

Methods

left' :: Kleisli m a b -> Kleisli m (Either a c) (Either b c) #

right' :: Kleisli m a b -> Kleisli m (Either c a) (Either c b) #

Profunctor p => Choice (TambaraSum p) 
Instance details

Defined in Data.Profunctor.Choice

Methods

left' :: TambaraSum p a b -> TambaraSum p (Either a c) (Either b c) #

right' :: TambaraSum p a b -> TambaraSum p (Either c a) (Either c b) #

Choice (PastroSum p) 
Instance details

Defined in Data.Profunctor.Choice

Methods

left' :: PastroSum p a b -> PastroSum p (Either a c) (Either b c) #

right' :: PastroSum p a b -> PastroSum p (Either c a) (Either c b) #

Choice p => Choice (Tambara p) 
Instance details

Defined in Data.Profunctor.Choice

Methods

left' :: Tambara p a b -> Tambara p (Either a c) (Either b c) #

right' :: Tambara p a b -> Tambara p (Either c a) (Either c b) #

Applicative f => Choice (Star f) 
Instance details

Defined in Data.Profunctor.Choice

Methods

left' :: Star f a b -> Star f (Either a c) (Either b c) #

right' :: Star f a b -> Star f (Either c a) (Either c b) #

Traversable w => Choice (Costar w) 
Instance details

Defined in Data.Profunctor.Choice

Methods

left' :: Costar w a b -> Costar w (Either a c) (Either b c) #

right' :: Costar w a b -> Costar w (Either c a) (Either c b) #

ArrowChoice p => Choice (WrappedArrow p) 
Instance details

Defined in Data.Profunctor.Choice

Methods

left' :: WrappedArrow p a b -> WrappedArrow p (Either a c) (Either b c) #

right' :: WrappedArrow p a b -> WrappedArrow p (Either c a) (Either c b) #

Monoid r => Choice (Forget r) 
Instance details

Defined in Data.Profunctor.Choice

Methods

left' :: Forget r a b -> Forget r (Either a c) (Either b c) #

right' :: Forget r a b -> Forget r (Either c a) (Either c b) #

Choice (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Profunctor.Choice

Methods

left' :: Tagged a b -> Tagged (Either a c) (Either b c) #

right' :: Tagged a b -> Tagged (Either c a) (Either c b) #

Choice (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

left' :: Indexed i a b -> Indexed i (Either a c) (Either b c) #

right' :: Indexed i a b -> Indexed i (Either c a) (Either c b) #

Choice ((->) :: Type -> Type -> Type) 
Instance details

Defined in Data.Profunctor.Choice

Methods

left' :: (a -> b) -> Either a c -> Either b c #

right' :: (a -> b) -> Either c a -> Either c b #

Comonad w => Choice (Cokleisli w)

extract approximates costrength

Instance details

Defined in Data.Profunctor.Choice

Methods

left' :: Cokleisli w a b -> Cokleisli w (Either a c) (Either b c) #

right' :: Cokleisli w a b -> Cokleisli w (Either c a) (Either c b) #

(Choice p, Choice q) => Choice (Procompose p q) 
Instance details

Defined in Data.Profunctor.Composition

Methods

left' :: Procompose p q a b -> Procompose p q (Either a c) (Either b c) #

right' :: Procompose p q a b -> Procompose p q (Either c a) (Either c b) #

Functor f => Choice (Joker f :: Type -> Type -> Type) 
Instance details

Defined in Data.Profunctor.Choice

Methods

left' :: Joker f a b -> Joker f (Either a c) (Either b c) #

right' :: Joker f a b -> Joker f (Either c a) (Either c b) #

(Choice p, Choice q) => Choice (Product p q) 
Instance details

Defined in Data.Profunctor.Choice

Methods

left' :: Product p q a b -> Product p q (Either a c) (Either b c) #

right' :: Product p q a b -> Product p q (Either c a) (Either c b) #

(Functor f, Choice p) => Choice (Tannen f p) 
Instance details

Defined in Data.Profunctor.Choice

Methods

left' :: Tannen f p a b -> Tannen f p (Either a c) (Either b c) #

right' :: Tannen f p a b -> Tannen f p (Either c a) (Either c b) #

sequenceBy :: Traversable t => (forall x. x -> f x) -> (forall x y. f (x -> y) -> f x -> f y) -> t (f a) -> f (t a) #

Sequence a container using its Traversable instance using explicitly provided Applicative operations. This is like sequence where the Applicative instance can be manually specified.

traverseBy :: Traversable t => (forall x. x -> f x) -> (forall x y. f (x -> y) -> f x -> f y) -> (a -> f b) -> t a -> f (t b) #

Traverse a container using its Traversable instance using explicitly provided Applicative operations. This is like traverse where the Applicative instance can be manually specified.

foldMapBy :: Foldable t => (r -> r -> r) -> r -> (a -> r) -> t a -> r #

Fold a value using its Foldable instance using explicitly provided Monoid operations. This is like foldMap where the Monoid instance can be manually specified.

foldMapBy mappend memptyfoldMap
>>> foldMapBy (+) 0 length ["hello","world"]
10

foldBy :: Foldable t => (a -> a -> a) -> a -> t a -> a #

Fold a value using its Foldable instance using explicitly provided Monoid operations. This is like fold where the Monoid instance can be manually specified.

foldBy mappend memptyfold
>>> foldBy (++) [] ["hello","world"]
"helloworld"

class (Foldable1 t, Traversable t) => Traversable1 (t :: Type -> Type) where #

Minimal complete definition

traverse1 | sequence1

Methods

traverse1 :: Apply f => (a -> f b) -> t a -> f (t b) #

Instances
Traversable1 Par1 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a -> f b) -> Par1 a -> f (Par1 b) #

sequence1 :: Apply f => Par1 (f b) -> f (Par1 b) #

Traversable1 Complex 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a -> f b) -> Complex a -> f (Complex b) #

sequence1 :: Apply f => Complex (f b) -> f (Complex b) #

Traversable1 Min 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a -> f b) -> Min a -> f (Min b) #

sequence1 :: Apply f => Min (f b) -> f (Min b) #

Traversable1 Max 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a -> f b) -> Max a -> f (Max b) #

sequence1 :: Apply f => Max (f b) -> f (Max b) #

Traversable1 First 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a -> f b) -> First a -> f (First b) #

sequence1 :: Apply f => First (f b) -> f (First b) #

Traversable1 Last 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a -> f b) -> Last a -> f (Last b) #

sequence1 :: Apply f => Last (f b) -> f (Last b) #

Traversable1 Identity 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a -> f b) -> Identity a -> f (Identity b) #

sequence1 :: Apply f => Identity (f b) -> f (Identity b) #

Traversable1 Dual 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a -> f b) -> Dual a -> f (Dual b) #

sequence1 :: Apply f => Dual (f b) -> f (Dual b) #

Traversable1 Sum 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a -> f b) -> Sum a -> f (Sum b) #

sequence1 :: Apply f => Sum (f b) -> f (Sum b) #

Traversable1 Product 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a -> f b) -> Product a -> f (Product b) #

sequence1 :: Apply f => Product (f b) -> f (Product b) #

Traversable1 NonEmpty 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a -> f b) -> NonEmpty a -> f (NonEmpty b) #

sequence1 :: Apply f => NonEmpty (f b) -> f (NonEmpty b) #

Traversable1 Tree 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a -> f b) -> Tree a -> f (Tree b) #

sequence1 :: Apply f => Tree (f b) -> f (Tree b) #

Traversable1 Log 
Instance details

Defined in Numeric.Log

Methods

traverse1 :: Apply f => (a -> f b) -> Log a -> f (Log b) #

sequence1 :: Apply f => Log (f b) -> f (Log b) #

Traversable1 V2 
Instance details

Defined in Linear.V2

Methods

traverse1 :: Apply f => (a -> f b) -> V2 a -> f (V2 b) #

sequence1 :: Apply f => V2 (f b) -> f (V2 b) #

Traversable1 V3 
Instance details

Defined in Linear.V3

Methods

traverse1 :: Apply f => (a -> f b) -> V3 a -> f (V3 b) #

sequence1 :: Apply f => V3 (f b) -> f (V3 b) #

Traversable1 V1 
Instance details

Defined in Linear.V1

Methods

traverse1 :: Apply f => (a -> f b) -> V1 a -> f (V1 b) #

sequence1 :: Apply f => V1 (f b) -> f (V1 b) #

Traversable1 Plucker 
Instance details

Defined in Linear.Plucker

Methods

traverse1 :: Apply f => (a -> f b) -> Plucker a -> f (Plucker b) #

sequence1 :: Apply f => Plucker (f b) -> f (Plucker b) #

Traversable1 V4 
Instance details

Defined in Linear.V4

Methods

traverse1 :: Apply f => (a -> f b) -> V4 a -> f (V4 b) #

sequence1 :: Apply f => V4 (f b) -> f (V4 b) #

Traversable1 (V1 :: Type -> Type) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a -> f b) -> V1 a -> f (V1 b) #

sequence1 :: Apply f => V1 (f b) -> f (V1 b) #

Traversable1 ((,) a) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a0 -> f b) -> (a, a0) -> f (a, b) #

sequence1 :: Apply f => (a, f b) -> f (a, b) #

Traversable1 f => Traversable1 (Lift f) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f0 => (a -> f0 b) -> Lift f a -> f0 (Lift f b) #

sequence1 :: Apply f0 => Lift f (f0 b) -> f0 (Lift f b) #

Traversable1 f => Traversable1 (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

traverse1 :: Apply f0 => (a -> f0 b) -> Cofree f a -> f0 (Cofree f b) #

sequence1 :: Apply f0 => Cofree f (f0 b) -> f0 (Cofree f b) #

Traversable1 f => Traversable1 (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

traverse1 :: Apply f0 => (a -> f0 b) -> Free f a -> f0 (Free f b) #

sequence1 :: Apply f0 => Free f (f0 b) -> f0 (Free f b) #

Traversable1 f => Traversable1 (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

traverse1 :: Apply f0 => (a -> f0 b) -> Yoneda f a -> f0 (Yoneda f b) #

sequence1 :: Apply f0 => Yoneda f (f0 b) -> f0 (Yoneda f b) #

Traversable1 f => Traversable1 (Rec1 f) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f0 => (a -> f0 b) -> Rec1 f a -> f0 (Rec1 f b) #

sequence1 :: Apply f0 => Rec1 f (f0 b) -> f0 (Rec1 f b) #

Traversable1 f => Traversable1 (Alt f) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f0 => (a -> f0 b) -> Alt f a -> f0 (Alt f b) #

sequence1 :: Apply f0 => Alt f (f0 b) -> f0 (Alt f b) #

Bitraversable1 p => Traversable1 (Join p) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a -> f b) -> Join p a -> f (Join p b) #

sequence1 :: Apply f => Join p (f b) -> f (Join p b) #

Traversable1 f => Traversable1 (IdentityT f) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f0 => (a -> f0 b) -> IdentityT f a -> f0 (IdentityT f b) #

sequence1 :: Apply f0 => IdentityT f (f0 b) -> f0 (IdentityT f b) #

Traversable1 (Tagged a) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a0 -> f b) -> Tagged a a0 -> f (Tagged a b) #

sequence1 :: Apply f => Tagged a (f b) -> f (Tagged a b) #

Traversable1 f => Traversable1 (Reverse f) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f0 => (a -> f0 b) -> Reverse f a -> f0 (Reverse f b) #

sequence1 :: Apply f0 => Reverse f (f0 b) -> f0 (Reverse f b) #

Traversable1 f => Traversable1 (Backwards f) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f0 => (a -> f0 b) -> Backwards f a -> f0 (Backwards f b) #

sequence1 :: Apply f0 => Backwards f (f0 b) -> f0 (Backwards f b) #

Traversable1 f => Traversable1 (AlongsideLeft f b) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

traverse1 :: Apply f0 => (a -> f0 b0) -> AlongsideLeft f b a -> f0 (AlongsideLeft f b b0) #

sequence1 :: Apply f0 => AlongsideLeft f b (f0 b0) -> f0 (AlongsideLeft f b b0) #

Traversable1 f => Traversable1 (AlongsideRight f a) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

traverse1 :: Apply f0 => (a0 -> f0 b) -> AlongsideRight f a a0 -> f0 (AlongsideRight f a b) #

sequence1 :: Apply f0 => AlongsideRight f a (f0 b) -> f0 (AlongsideRight f a b) #

(Traversable1 f, Traversable1 g) => Traversable1 (f :+: g) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f0 => (a -> f0 b) -> (f :+: g) a -> f0 ((f :+: g) b) #

sequence1 :: Apply f0 => (f :+: g) (f0 b) -> f0 ((f :+: g) b) #

(Traversable1 f, Traversable1 g) => Traversable1 (f :*: g) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f0 => (a -> f0 b) -> (f :*: g) a -> f0 ((f :*: g) b) #

sequence1 :: Apply f0 => (f :*: g) (f0 b) -> f0 ((f :*: g) b) #

(Traversable1 f, Traversable1 g) => Traversable1 (Product f g) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f0 => (a -> f0 b) -> Product f g a -> f0 (Product f g b) #

sequence1 :: Apply f0 => Product f g (f0 b) -> f0 (Product f g b) #

(Traversable1 f, Traversable1 g) => Traversable1 (Sum f g) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f0 => (a -> f0 b) -> Sum f g a -> f0 (Sum f g b) #

sequence1 :: Apply f0 => Sum f g (f0 b) -> f0 (Sum f g b) #

Traversable1 f => Traversable1 (M1 i c f) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f0 => (a -> f0 b) -> M1 i c f a -> f0 (M1 i c f b) #

sequence1 :: Apply f0 => M1 i c f (f0 b) -> f0 (M1 i c f b) #

(Traversable1 f, Traversable1 g) => Traversable1 (f :.: g) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f0 => (a -> f0 b) -> (f :.: g) a -> f0 ((f :.: g) b) #

sequence1 :: Apply f0 => (f :.: g) (f0 b) -> f0 ((f :.: g) b) #

(Traversable1 f, Traversable1 g) => Traversable1 (Compose f g) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f0 => (a -> f0 b) -> Compose f g a -> f0 (Compose f g b) #

sequence1 :: Apply f0 => Compose f g (f0 b) -> f0 (Compose f g b) #

Traversable1 g => Traversable1 (Joker g a) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a0 -> f b) -> Joker g a a0 -> f (Joker g a b) #

sequence1 :: Apply f => Joker g a (f b) -> f (Joker g a b) #

class AsEmpty a where #

Minimal complete definition

Nothing

Methods

_Empty :: Prism' a () #

Instances
AsEmpty Ordering 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' Ordering () #

AsEmpty () 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' () () #

AsEmpty ByteString 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' ByteString () #

AsEmpty ByteString 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' ByteString () #

AsEmpty Text 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' Text () #

AsEmpty Text 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' Text () #

AsEmpty Event 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' Event () #

AsEmpty All 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' All () #

AsEmpty Any 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' Any () #

AsEmpty IntSet 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' IntSet () #

AsEmpty [a] 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' [a] () #

AsEmpty (Maybe a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Maybe a) () #

Storable a => AsEmpty (Vector a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Vector a) () #

AsEmpty (ZipList a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (ZipList a) () #

AsEmpty (First a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (First a) () #

AsEmpty (Last a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Last a) () #

AsEmpty a => AsEmpty (Dual a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Dual a) () #

(Eq a, Num a) => AsEmpty (Sum a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Sum a) () #

(Eq a, Num a) => AsEmpty (Product a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Product a) () #

AsEmpty (IntMap a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (IntMap a) () #

AsEmpty (Seq a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Seq a) () #

AsEmpty (Set a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Set a) () #

AsEmpty (HashSet a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (HashSet a) () #

Unbox a => AsEmpty (Vector a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Vector a) () #

AsEmpty (Vector a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Vector a) () #

AsEmpty (Clip n) 
Instance details

Defined in Diagrams.TwoD.Path

Methods

_Empty :: Prism' (Clip n) () #

(AsEmpty a, AsEmpty b) => AsEmpty (a, b) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (a, b) () #

AsEmpty (HashMap k a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (HashMap k a) () #

AsEmpty (Map k a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Map k a) () #

AsEmpty (Path v n) 
Instance details

Defined in Diagrams.Path

Methods

_Empty :: Prism' (Path v n) () #

(Metric v, OrderedField n) => AsEmpty (Trail v n) 
Instance details

Defined in Diagrams.Trail

Methods

_Empty :: Prism' (Trail v n) () #

AsEmpty (BoundingBox v n) 
Instance details

Defined in Diagrams.BoundingBox

Methods

_Empty :: Prism' (BoundingBox v n) () #

(AsEmpty a, AsEmpty b, AsEmpty c) => AsEmpty (a, b, c) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (a, b, c) () #

(Metric v, OrderedField n) => AsEmpty (Trail' Line v n) 
Instance details

Defined in Diagrams.Trail

Methods

_Empty :: Prism' (Trail' Line v n) () #

type Prism' s a = Prism s s a a #

class Cons s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Methods

_Cons :: Prism s t (a, s) (b, t) #

Instances
Cons ByteString ByteString Word8 Word8 
Instance details

Defined in Control.Lens.Cons

Cons ByteString ByteString Word8 Word8 
Instance details

Defined in Control.Lens.Cons

Cons Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism Text Text (Char, Text) (Char, Text) #

Cons Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism Text Text (Char, Text) (Char, Text) #

Cons [a] [b] a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism [a] [b] (a, [a]) (b, [b]) #

(Storable a, Storable b) => Cons (Vector a) (Vector b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism (Vector a) (Vector b) (a, Vector a) (b, Vector b) #

Cons (ZipList a) (ZipList b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism (ZipList a) (ZipList b) (a, ZipList a) (b, ZipList b) #

Cons (Seq a) (Seq b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism (Seq a) (Seq b) (a, Seq a) (b, Seq b) #

(Unbox a, Unbox b) => Cons (Vector a) (Vector b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism (Vector a) (Vector b) (a, Vector a) (b, Vector b) #

(Prim a, Prim b) => Cons (Vector a) (Vector b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism (Vector a) (Vector b) (a, Vector a) (b, Vector b) #

Cons (Vector a) (Vector b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism (Vector a) (Vector b) (a, Vector a) (b, Vector b) #

Cons (Path v n) (Path v' n') (Located (Trail v n)) (Located (Trail v' n')) 
Instance details

Defined in Diagrams.Path

Methods

_Cons :: Prism (Path v n) (Path v' n') (Located (Trail v n), Path v n) (Located (Trail v' n'), Path v' n') #

(Metric v, OrderedField n, Metric u, OrderedField n') => Cons (SegTree v n) (SegTree u n') (Segment Closed v n) (Segment Closed u n') 
Instance details

Defined in Diagrams.Trail

Methods

_Cons :: Prism (SegTree v n) (SegTree u n') (Segment Closed v n, SegTree v n) (Segment Closed u n', SegTree u n') #

(Metric v, OrderedField n, Metric u, OrderedField n') => Cons (Trail' Line v n) (Trail' Line u n') (Segment Closed v n) (Segment Closed u n') 
Instance details

Defined in Diagrams.Trail

Methods

_Cons :: Prism (Trail' Line v n) (Trail' Line u n') (Segment Closed v n, Trail' Line v n) (Segment Closed u n', Trail' Line u n') #

type Prism s t a b = forall (p :: Type -> Type -> Type) (f :: Type -> Type). (Choice p, Applicative f) => p a (f b) -> p s (f t) #

class Each s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

each :: Traversal s t a b #

Instances
(a ~ Word8, b ~ Word8) => Each ByteString ByteString a b 
Instance details

Defined in Control.Lens.Each

(a ~ Word8, b ~ Word8) => Each ByteString ByteString a b 
Instance details

Defined in Control.Lens.Each

(a ~ Char, b ~ Char) => Each Text Text a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal Text Text a b #

(a ~ Char, b ~ Char) => Each Text Text a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal Text Text a b #

Each Name Name AName AName 
Instance details

Defined in Diagrams.Core.Names

Methods

each :: Traversal Name Name AName AName #

Each ColourMap ColourMap (Colour Double) (Colour Double) 
Instance details

Defined in Plots.Style

Each [a] [b] a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal [a] [b] a b #

Each (Maybe a) (Maybe b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Maybe a) (Maybe b) a b #

(Storable a, Storable b) => Each (Vector a) (Vector b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Vector a) (Vector b) a b #

Each (Complex a) (Complex b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Complex a) (Complex b) a b #

Each (Identity a) (Identity b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Identity a) (Identity b) a b #

Each (NonEmpty a) (NonEmpty b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (NonEmpty a) (NonEmpty b) a b #

Each (IntMap a) (IntMap b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (IntMap a) (IntMap b) a b #

Each (Tree a) (Tree b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Tree a) (Tree b) a b #

Each (Seq a) (Seq b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Seq a) (Seq b) a b #

(Unbox a, Unbox b) => Each (Vector a) (Vector b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Vector a) (Vector b) a b #

(Prim a, Prim b) => Each (Vector a) (Vector b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Vector a) (Vector b) a b #

Each (Vector a) (Vector b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Vector a) (Vector b) a b #

Each (V2 a) (V2 b) a b 
Instance details

Defined in Linear.V2

Methods

each :: Traversal (V2 a) (V2 b) a b #

Each (V3 a) (V3 b) a b 
Instance details

Defined in Linear.V3

Methods

each :: Traversal (V3 a) (V3 b) a b #

Each (V1 a) (V1 b) a b 
Instance details

Defined in Linear.V1

Methods

each :: Traversal (V1 a) (V1 b) a b #

Each (Plucker a) (Plucker b) a b 
Instance details

Defined in Linear.Plucker

Methods

each :: Traversal (Plucker a) (Plucker b) a b #

Each (Quaternion a) (Quaternion b) a b 
Instance details

Defined in Linear.Quaternion

Methods

each :: Traversal (Quaternion a) (Quaternion b) a b #

Each (V0 a) (V0 b) a b 
Instance details

Defined in Linear.V0

Methods

each :: Traversal (V0 a) (V0 b) a b #

Each (V4 a) (V4 b) a b 
Instance details

Defined in Linear.V4

Methods

each :: Traversal (V4 a) (V4 b) a b #

(a ~ a', b ~ b') => Each (a, a') (b, b') a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (a, a') (b, b') a b #

c ~ d => Each (HashMap c a) (HashMap d b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (HashMap c a) (HashMap d b) a b #

c ~ d => Each (Map c a) (Map d b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Map c a) (Map d b) a b #

(Ix i, IArray UArray a, IArray UArray b, i ~ j) => Each (UArray i a) (UArray j b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (UArray i a) (UArray j b) a b #

(Ix i, i ~ j) => Each (Array i a) (Array j b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Array i a) (Array j b) a b #

Traversable f => Each (Point f a) (Point f b) a b 
Instance details

Defined in Linear.Affine

Methods

each :: Traversal (Point f a) (Point f b) a b #

Each (Path v n) (Path v' n') (Located (Trail v n)) (Located (Trail v' n')) 
Instance details

Defined in Diagrams.Path

Methods

each :: Traversal (Path v n) (Path v' n') (Located (Trail v n)) (Located (Trail v' n')) #

Each (Style v n) (Style v' n') (Attribute v n) (Attribute v' n') 
Instance details

Defined in Diagrams.Core.Style

Methods

each :: Traversal (Style v n) (Style v' n') (Attribute v n) (Attribute v' n') #

Each (FixedSegment v n) (FixedSegment v' n') (Point v n) (Point v' n') 
Instance details

Defined in Diagrams.Segment

Methods

each :: Traversal (FixedSegment v n) (FixedSegment v' n') (Point v n) (Point v' n') #

(Additive v', Foldable v', Ord n') => Each (BoundingBox v n) (BoundingBox v' n') (Point v n) (Point v' n') 
Instance details

Defined in Diagrams.BoundingBox

Methods

each :: Traversal (BoundingBox v n) (BoundingBox v' n') (Point v n) (Point v' n') #

(a ~ a2, a ~ a3, b ~ b2, b ~ b3) => Each (a, a2, a3) (b, b2, b3) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (a, a2, a3) (b, b2, b3) a b #

Each (V n a) (V n b) a b 
Instance details

Defined in Linear.V

Methods

each :: Traversal (V n a) (V n b) a b #

Each (Segment c v n) (Segment c v' n') (v n) (v' n') 
Instance details

Defined in Diagrams.Segment

Methods

each :: Traversal (Segment c v n) (Segment c v' n') (v n) (v' n') #

Each (Offset c v n) (Offset c v' n') (v n) (v' n') 
Instance details

Defined in Diagrams.Segment

Methods

each :: Traversal (Offset c v n) (Offset c v' n') (v n) (v' n') #

(a ~ a2, a ~ a3, a ~ a4, b ~ b2, b ~ b3, b ~ b4) => Each (a, a2, a3, a4) (b, b2, b3, b4) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (a, a2, a3, a4) (b, b2, b3, b4) a b #

(a ~ a2, a ~ a3, a ~ a4, a ~ a5, b ~ b2, b ~ b3, b ~ b4, b ~ b5) => Each (a, a2, a3, a4, a5) (b, b2, b3, b4, b5) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (a, a2, a3, a4, a5) (b, b2, b3, b4, b5) a b #

(a ~ a2, a ~ a3, a ~ a4, a ~ a5, a ~ a6, b ~ b2, b ~ b3, b ~ b4, b ~ b5, b ~ b6) => Each (a, a2, a3, a4, a5, a6) (b, b2, b3, b4, b5, b6) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (a, a2, a3, a4, a5, a6) (b, b2, b3, b4, b5, b6) a b #

(a ~ a2, a ~ a3, a ~ a4, a ~ a5, a ~ a6, a ~ a7, b ~ b2, b ~ b3, b ~ b4, b ~ b5, b ~ b6, b ~ b7) => Each (a, a2, a3, a4, a5, a6, a7) (b, b2, b3, b4, b5, b6, b7) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (a, a2, a3, a4, a5, a6, a7) (b, b2, b3, b4, b5, b6, b7) a b #

(a ~ a2, a ~ a3, a ~ a4, a ~ a5, a ~ a6, a ~ a7, a ~ a8, b ~ b2, b ~ b3, b ~ b4, b ~ b5, b ~ b6, b ~ b7, b ~ b8) => Each (a, a2, a3, a4, a5, a6, a7, a8) (b, b2, b3, b4, b5, b6, b7, b8) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (a, a2, a3, a4, a5, a6, a7, a8) (b, b2, b3, b4, b5, b6, b7, b8) a b #

(a ~ a2, a ~ a3, a ~ a4, a ~ a5, a ~ a6, a ~ a7, a ~ a8, a ~ a9, b ~ b2, b ~ b3, b ~ b4, b ~ b5, b ~ b6, b ~ b7, b ~ b8, b ~ b9) => Each (a, a2, a3, a4, a5, a6, a7, a8, a9) (b, b2, b3, b4, b5, b6, b7, b8, b9) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (a, a2, a3, a4, a5, a6, a7, a8, a9) (b, b2, b3, b4, b5, b6, b7, b8, b9) a b #

type Traversal s t a b = forall (f :: Type -> Type). Applicative f => (a -> f b) -> s -> f t #

class Reversing t where #

Methods

reversing :: t -> t #

Instances
Reversing ByteString 
Instance details

Defined in Control.Lens.Internal.Iso

Reversing ByteString 
Instance details

Defined in Control.Lens.Internal.Iso

Reversing Text 
Instance details

Defined in Control.Lens.Internal.Iso

Methods

reversing :: Text -> Text #

Reversing Text 
Instance details

Defined in Control.Lens.Internal.Iso

Methods

reversing :: Text -> Text #

Reversing [a] 
Instance details

Defined in Control.Lens.Internal.Iso

Methods

reversing :: [a] -> [a] #

Storable a => Reversing (Vector a) 
Instance details

Defined in Control.Lens.Internal.Iso

Methods

reversing :: Vector a -> Vector a #

Reversing (NonEmpty a) 
Instance details

Defined in Control.Lens.Internal.Iso

Methods

reversing :: NonEmpty a -> NonEmpty a #

Reversing (Seq a) 
Instance details

Defined in Control.Lens.Internal.Iso

Methods

reversing :: Seq a -> Seq a #

Unbox a => Reversing (Vector a) 
Instance details

Defined in Control.Lens.Internal.Iso

Methods

reversing :: Vector a -> Vector a #

Prim a => Reversing (Vector a) 
Instance details

Defined in Control.Lens.Internal.Iso

Methods

reversing :: Vector a -> Vector a #

Reversing (Vector a) 
Instance details

Defined in Control.Lens.Internal.Iso

Methods

reversing :: Vector a -> Vector a #

(Metric v, OrderedField n) => Reversing (Located (Trail v n)) 
Instance details

Defined in Diagrams.Trail

Methods

reversing :: Located (Trail v n) -> Located (Trail v n) #

(Metric v, OrderedField n) => Reversing (Located (Trail' l v n)) 
Instance details

Defined in Diagrams.Trail

Methods

reversing :: Located (Trail' l v n) -> Located (Trail' l v n) #

(Metric v, OrderedField n) => Reversing (Path v n) 
Instance details

Defined in Diagrams.Path

Methods

reversing :: Path v n -> Path v n #

(Metric v, OrderedField n) => Reversing (Trail v n) 
Instance details

Defined in Diagrams.Trail

Methods

reversing :: Trail v n -> Trail v n #

Reversing (FixedSegment v n) 
Instance details

Defined in Diagrams.Segment

Methods

reversing :: FixedSegment v n -> FixedSegment v n #

(Additive v, Num n) => Reversing (Segment Closed v n) 
Instance details

Defined in Diagrams.Segment

Methods

reversing :: Segment Closed v n -> Segment Closed v n #

(Metric v, OrderedField n) => Reversing (Trail' l v n) 
Instance details

Defined in Diagrams.Trail

Methods

reversing :: Trail' l v n -> Trail' l v n #

(Additive v, Num n) => Reversing (Offset c v n) 
Instance details

Defined in Diagrams.Segment

Methods

reversing :: Offset c v n -> Offset c v n #

class Wrapped s => Rewrapped s t #

Instances
Rewrapped Fd t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CTimer t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CKey t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CId t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CFsFilCnt t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CFsBlkCnt t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CClockId t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CBlkCnt t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CBlkSize t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CRLim t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CTcflag t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CSpeed t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CCc t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CUid t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CNlink t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CGid t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CSsize t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CPid t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped COff t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CMode t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CIno t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CDev t 
Instance details

Defined in Control.Lens.Wrapped

t ~ PatternMatchFail => Rewrapped PatternMatchFail t 
Instance details

Defined in Control.Lens.Wrapped

t ~ RecSelError => Rewrapped RecSelError t 
Instance details

Defined in Control.Lens.Wrapped

t ~ RecConError => Rewrapped RecConError t 
Instance details

Defined in Control.Lens.Wrapped

t ~ RecUpdError => Rewrapped RecUpdError t 
Instance details

Defined in Control.Lens.Wrapped

t ~ NoMethodError => Rewrapped NoMethodError t 
Instance details

Defined in Control.Lens.Wrapped

t ~ TypeError => Rewrapped TypeError t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped Errno t 
Instance details

Defined in Control.Lens.Wrapped

t ~ CompactionFailed => Rewrapped CompactionFailed t 
Instance details

Defined in Control.Lens.Wrapped

t ~ AssertionFailed => Rewrapped AssertionFailed t 
Instance details

Defined in Control.Lens.Wrapped

t ~ ErrorCall => Rewrapped ErrorCall t 
Instance details

Defined in Control.Lens.Wrapped

t ~ All => Rewrapped All t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Any => Rewrapped Any t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CChar t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CSChar t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CUChar t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CShort t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CUShort t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CInt t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CUInt t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CLong t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CULong t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CLLong t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CULLong t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CBool t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CFloat t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CDouble t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CPtrdiff t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CSize t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CWchar t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CSigAtomic t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CClock t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CTime t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CUSeconds t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CSUSeconds t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CIntPtr t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CUIntPtr t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CIntMax t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped CUIntMax t 
Instance details

Defined in Control.Lens.Wrapped

t ~ IntSet => Rewrapped IntSet t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped Name Name 
Instance details

Defined in Diagrams.Core.Names

Rewrapped SegCount SegCount 
Instance details

Defined in Diagrams.Segment

t ~ Par1 p' => Rewrapped (Par1 p) t 
Instance details

Defined in Control.Lens.Wrapped

(Storable a, t ~ Vector a') => Rewrapped (Vector a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Predicate b => Rewrapped (Predicate a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Comparison b => Rewrapped (Comparison a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Equivalence b => Rewrapped (Equivalence a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Min b => Rewrapped (Min a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Max b => Rewrapped (Max a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ First b => Rewrapped (First a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Last b => Rewrapped (Last a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ WrappedMonoid b => Rewrapped (WrappedMonoid a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Option b => Rewrapped (Option a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ ZipList b => Rewrapped (ZipList a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Identity b => Rewrapped (Identity a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ First b => Rewrapped (First a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Last b => Rewrapped (Last a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Dual b => Rewrapped (Dual a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Endo b => Rewrapped (Endo a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Sum b => Rewrapped (Sum a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Product b => Rewrapped (Product a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Down b => Rewrapped (Down a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ NonEmpty b => Rewrapped (NonEmpty a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ IntMap a' => Rewrapped (IntMap a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Seq a' => Rewrapped (Seq a) t 
Instance details

Defined in Control.Lens.Wrapped

(t ~ Set a', Ord a) => Rewrapped (Set a) t 
Instance details

Defined in Control.Lens.Wrapped

(t ~ HashSet a', Hashable a, Eq a) => Rewrapped (HashSet a) t 
Instance details

Defined in Control.Lens.Wrapped

(Unbox a, t ~ Vector a') => Rewrapped (Vector a) t 
Instance details

Defined in Control.Lens.Wrapped

(Prim a, t ~ Vector a') => Rewrapped (Vector a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Vector a' => Rewrapped (Vector a) t 
Instance details

Defined in Control.Lens.Wrapped

Polar a1 ~ t => Rewrapped (Polar a2) t 
Instance details

Defined in Diagrams.Coordinates.Polar

Active a1 ~ t => Rewrapped (Active a2) t 
Instance details

Defined in Data.Active

Time n1 ~ t => Rewrapped (Time n2) t 
Instance details

Defined in Data.Active

Clip n1 ~ t => Rewrapped (Clip n2) t 
Instance details

Defined in Diagrams.TwoD.Path

Duration n1 ~ t => Rewrapped (Duration n2) t 
Instance details

Defined in Data.Active

Rewrapped (TransInv t) (TransInv t') 
Instance details

Defined in Diagrams.Core.Transform

Rewrapped (ArcLength n) (ArcLength n') 
Instance details

Defined in Diagrams.Segment

(t ~ HashMap k' a', Hashable k, Eq k) => Rewrapped (HashMap k a) t 
Instance details

Defined in Control.Lens.Wrapped

(t ~ Map k' a', Ord k) => Rewrapped (Map k a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Op a' b' => Rewrapped (Op a b) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ WrappedMonad m' a' => Rewrapped (WrappedMonad m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ ArrowMonad m' a' => Rewrapped (ArrowMonad m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ MaybeT n b => Rewrapped (MaybeT m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ CatchT m' a' => Rewrapped (CatchT m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ ListT n b => Rewrapped (ListT m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ WrappedApplicative f' a' => Rewrapped (WrappedApplicative f a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ MaybeApply f' a' => Rewrapped (MaybeApply f a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Point g b => Rewrapped (Point f a) t 
Instance details

Defined in Linear.Affine

t ~ Alt f' a' => Rewrapped (Alt f a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ CoiterT w' a' => Rewrapped (CoiterT w a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ IterT m' a' => Rewrapped (IterT m a) t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped (Envelope v n) (Envelope v' n') 
Instance details

Defined in Diagrams.Core.Envelope

Rewrapped (Style v n) (Style v' n') 
Instance details

Defined in Diagrams.Core.Style

Rewrapped (Trace v n) (Trace v' n') 
Instance details

Defined in Diagrams.Core.Trace

Rewrapped (Path v n) (Path v' n') 
Instance details

Defined in Diagrams.Path

Rewrapped (Trail v n) (Trail v' n') 
Instance details

Defined in Diagrams.Trail

Rewrapped (SegTree v n) (SegTree v' n') 
Instance details

Defined in Diagrams.Trail

Rewrapped (TotalOffset v n) (TotalOffset v' n') 
Instance details

Defined in Diagrams.Segment

t ~ Rec1 f' p' => Rewrapped (Rec1 f p) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ WrappedArrow a' b' c' => Rewrapped (WrappedArrow a b c) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Kleisli m' a' b' => Rewrapped (Kleisli m a b) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Const a' x' => Rewrapped (Const a x) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Ap g b => Rewrapped (Ap f a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Alt g b => Rewrapped (Alt f a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Join p' a' => Rewrapped (Join p a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Fix p' a' => Rewrapped (Fix p a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ TracedT m' w' a' => Rewrapped (TracedT m w a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ IdentityT n b => Rewrapped (IdentityT m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Compose f' g' a' => Rewrapped (Compose f g a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ ComposeFC f' g' a' => Rewrapped (ComposeFC f g a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ ComposeCF f' g' a' => Rewrapped (ComposeCF f g a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ ExceptT e' m' a' => Rewrapped (ExceptT e m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ WriterT w' m' a' => Rewrapped (WriterT w m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ StateT s' m' a' => Rewrapped (StateT s m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ ReaderT s n b => Rewrapped (ReaderT r m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ ErrorT e' m' a' => Rewrapped (ErrorT e m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ StateT s' m' a' => Rewrapped (StateT s m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ WriterT w' m' a' => Rewrapped (WriterT w m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Star f' d' c' => Rewrapped (Star f d c) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Costar f' d' c' => Rewrapped (Costar f d c) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ WrappedArrow p' a' b' => Rewrapped (WrappedArrow p a b) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Forget r' a' b' => Rewrapped (Forget r a b) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Static f' a' b' => Rewrapped (Static f a b) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Tagged s' a' => Rewrapped (Tagged s a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Reverse g b => Rewrapped (Reverse f a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Constant a' b' => Rewrapped (Constant a b) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Backwards g b => Rewrapped (Backwards f a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ CofreeT f' w' a' => Rewrapped (CofreeT f w a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ FreeT f' m' a' => Rewrapped (FreeT f m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ ApT f' g' a' => Rewrapped (ApT f g a) t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped (Query v a m) (Query v' a' m') 
Instance details

Defined in Diagrams.Core.Query

Rewrapped (Trail' Line v n) (Trail' Line v' n') 
Instance details

Defined in Diagrams.Trail

t ~ K1 i' c' p' => Rewrapped (K1 i c p) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ ContT r' m' a' => Rewrapped (ContT r m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Cayley f' p' a' b' => Rewrapped (Cayley f p a b) t 
Instance details

Defined in Control.Lens.Wrapped

Rewrapped (QDiagram b v n m) (QDiagram b' v' n' m') 
Instance details

Defined in Diagrams.Core.Types

Rewrapped (SubMap b v n m) (SubMap b' v' n' m') 
Instance details

Defined in Diagrams.Core.Types

t ~ M1 i' c' f' p' => Rewrapped (M1 i c f p) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ (f' :.: g') p' => Rewrapped ((f :.: g) p) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Compose f' g' a' => Rewrapped (Compose f g a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ WrappedBifunctor p' a' b' => Rewrapped (WrappedBifunctor p a b) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Joker g' a' b' => Rewrapped (Joker g a b) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Flip p' a' b' => Rewrapped (Flip p a b) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Clown f' a' b' => Rewrapped (Clown f a b) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ RWST r' w' s' m' a' => Rewrapped (RWST r w s m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ RWST r' w' s' m' a' => Rewrapped (RWST r w s m a) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Dual k' a' b' => Rewrapped (Dual k6 a b) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ WrappedCategory k' a' b' => Rewrapped (WrappedCategory k6 a b) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Semi m' a' b' => Rewrapped (Semi m a b) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Tannen f' p' a' b' => Rewrapped (Tannen f p a b) t 
Instance details

Defined in Control.Lens.Wrapped

t ~ Biff p' f' g' a' b' => Rewrapped (Biff p f g a b) t 
Instance details

Defined in Control.Lens.Wrapped

class Snoc s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Methods

_Snoc :: Prism s t (s, a) (t, b) #

Instances
Snoc ByteString ByteString Word8 Word8 
Instance details

Defined in Control.Lens.Cons

Snoc ByteString ByteString Word8 Word8 
Instance details

Defined in Control.Lens.Cons

Snoc Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism Text Text (Text, Char) (Text, Char) #

Snoc Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism Text Text (Text, Char) (Text, Char) #

Snoc [a] [b] a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism [a] [b] ([a], a) ([b], b) #

(Storable a, Storable b) => Snoc (Vector a) (Vector b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism (Vector a) (Vector b) (Vector a, a) (Vector b, b) #

Snoc (ZipList a) (ZipList b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism (ZipList a) (ZipList b) (ZipList a, a) (ZipList b, b) #

Snoc (Seq a) (Seq b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism (Seq a) (Seq b) (Seq a, a) (Seq b, b) #

(Unbox a, Unbox b) => Snoc (Vector a) (Vector b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism (Vector a) (Vector b) (Vector a, a) (Vector b, b) #

(Prim a, Prim b) => Snoc (Vector a) (Vector b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism (Vector a) (Vector b) (Vector a, a) (Vector b, b) #

Snoc (Vector a) (Vector b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism (Vector a) (Vector b) (Vector a, a) (Vector b, b) #

Snoc (Path v n) (Path v' n') (Located (Trail v n)) (Located (Trail v' n')) 
Instance details

Defined in Diagrams.Path

Methods

_Snoc :: Prism (Path v n) (Path v' n') (Path v n, Located (Trail v n)) (Path v' n', Located (Trail v' n')) #

(Metric v, OrderedField n, Metric u, OrderedField n') => Snoc (SegTree v n) (SegTree u n') (Segment Closed v n) (Segment Closed u n') 
Instance details

Defined in Diagrams.Trail

Methods

_Snoc :: Prism (SegTree v n) (SegTree u n') (SegTree v n, Segment Closed v n) (SegTree u n', Segment Closed u n') #

(Metric v, OrderedField n, Metric u, OrderedField n') => Snoc (Trail' Line v n) (Trail' Line u n') (Segment Closed v n) (Segment Closed u n') 
Instance details

Defined in Diagrams.Trail

Methods

_Snoc :: Prism (Trail' Line v n) (Trail' Line u n') (Trail' Line v n, Segment Closed v n) (Trail' Line u n', Segment Closed u n') #

class Wrapped s where #

Minimal complete definition

Nothing

Associated Types

type Unwrapped s :: Type #

Methods

_Wrapped' :: Iso' s (Unwrapped s) #

Instances
Wrapped Fd 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped Fd :: Type #

Wrapped CTimer 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CTimer :: Type #

Wrapped CKey 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CKey :: Type #

Wrapped CId 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CId :: Type #

Wrapped CFsFilCnt 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CFsFilCnt :: Type #

Wrapped CFsBlkCnt 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CFsBlkCnt :: Type #

Wrapped CClockId 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CClockId :: Type #

Wrapped CBlkCnt 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CBlkCnt :: Type #

Wrapped CBlkSize 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CBlkSize :: Type #

Wrapped CRLim 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CRLim :: Type #

Wrapped CTcflag 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CTcflag :: Type #

Wrapped CSpeed 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CSpeed :: Type #

Wrapped CCc 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CCc :: Type #

Wrapped CUid 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CUid :: Type #

Wrapped CNlink 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CNlink :: Type #

Wrapped CGid 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CGid :: Type #

Wrapped CSsize 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CSsize :: Type #

Wrapped CPid 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CPid :: Type #

Wrapped COff 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped COff :: Type #

Wrapped CMode 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CMode :: Type #

Wrapped CIno 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CIno :: Type #

Wrapped CDev 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CDev :: Type #

Wrapped PatternMatchFail 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped PatternMatchFail :: Type #

Wrapped RecSelError 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped RecSelError :: Type #

Wrapped RecConError 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped RecConError :: Type #

Wrapped RecUpdError 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped RecUpdError :: Type #

Wrapped NoMethodError 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped NoMethodError :: Type #

Wrapped TypeError 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped TypeError :: Type #

Wrapped Errno 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped Errno :: Type #

Wrapped CompactionFailed 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CompactionFailed :: Type #

Wrapped AssertionFailed 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped AssertionFailed :: Type #

Wrapped ErrorCall 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped ErrorCall :: Type #

Wrapped All 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped All :: Type #

Wrapped Any 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped Any :: Type #

Wrapped CChar 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CChar :: Type #

Wrapped CSChar 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CSChar :: Type #

Wrapped CUChar 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CUChar :: Type #

Wrapped CShort 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CShort :: Type #

Wrapped CUShort 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CUShort :: Type #

Wrapped CInt 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CInt :: Type #

Wrapped CUInt 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CUInt :: Type #

Wrapped CLong 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CLong :: Type #

Wrapped CULong 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CULong :: Type #

Wrapped CLLong 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CLLong :: Type #

Wrapped CULLong 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CULLong :: Type #

Wrapped CBool 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CBool :: Type #

Wrapped CFloat 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CFloat :: Type #

Wrapped CDouble 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CDouble :: Type #

Wrapped CPtrdiff 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CPtrdiff :: Type #

Wrapped CSize 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CSize :: Type #

Wrapped CWchar 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CWchar :: Type #

Wrapped CSigAtomic 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CSigAtomic :: Type #

Wrapped CClock 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CClock :: Type #

Wrapped CTime 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CTime :: Type #

Wrapped CUSeconds 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CUSeconds :: Type #

Wrapped CSUSeconds 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CSUSeconds :: Type #

Wrapped CIntPtr 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CIntPtr :: Type #

Wrapped CUIntPtr 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CUIntPtr :: Type #

Wrapped CIntMax 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CIntMax :: Type #

Wrapped CUIntMax 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped CUIntMax :: Type #

Wrapped IntSet 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped IntSet :: Type #

Wrapped Name 
Instance details

Defined in Diagrams.Core.Names

Associated Types

type Unwrapped Name :: Type #

Methods

_Wrapped' :: Iso' Name (Unwrapped Name) #

Wrapped SegCount 
Instance details

Defined in Diagrams.Segment

Associated Types

type Unwrapped SegCount :: Type #

Methods

_Wrapped' :: Iso' SegCount (Unwrapped SegCount) #

Wrapped (Par1 p) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Par1 p) :: Type #

Methods

_Wrapped' :: Iso' (Par1 p) (Unwrapped (Par1 p)) #

Storable a => Wrapped (Vector a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Vector a) :: Type #

Methods

_Wrapped' :: Iso' (Vector a) (Unwrapped (Vector a)) #

Wrapped (Predicate a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Predicate a) :: Type #

Wrapped (Comparison a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Comparison a) :: Type #

Wrapped (Equivalence a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Equivalence a) :: Type #

Wrapped (Min a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Min a) :: Type #

Methods

_Wrapped' :: Iso' (Min a) (Unwrapped (Min a)) #

Wrapped (Max a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Max a) :: Type #

Methods

_Wrapped' :: Iso' (Max a) (Unwrapped (Max a)) #

Wrapped (First a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (First a) :: Type #

Methods

_Wrapped' :: Iso' (First a) (Unwrapped (First a)) #

Wrapped (Last a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Last a) :: Type #

Methods

_Wrapped' :: Iso' (Last a) (Unwrapped (Last a)) #

Wrapped (WrappedMonoid a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (WrappedMonoid a) :: Type #

Wrapped (Option a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Option a) :: Type #

Methods

_Wrapped' :: Iso' (Option a) (Unwrapped (Option a)) #

Wrapped (ZipList a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (ZipList a) :: Type #

Methods

_Wrapped' :: Iso' (ZipList a) (Unwrapped (ZipList a)) #

Wrapped (Identity a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Identity a) :: Type #

Wrapped (First a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (First a) :: Type #

Methods

_Wrapped' :: Iso' (First a) (Unwrapped (First a)) #

Wrapped (Last a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Last a) :: Type #

Methods

_Wrapped' :: Iso' (Last a) (Unwrapped (Last a)) #

Wrapped (Dual a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Dual a) :: Type #

Methods

_Wrapped' :: Iso' (Dual a) (Unwrapped (Dual a)) #

Wrapped (Endo a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Endo a) :: Type #

Methods

_Wrapped' :: Iso' (Endo a) (Unwrapped (Endo a)) #

Wrapped (Sum a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Sum a) :: Type #

Methods

_Wrapped' :: Iso' (Sum a) (Unwrapped (Sum a)) #

Wrapped (Product a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Product a) :: Type #

Methods

_Wrapped' :: Iso' (Product a) (Unwrapped (Product a)) #

Wrapped (Down a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Down a) :: Type #

Methods

_Wrapped' :: Iso' (Down a) (Unwrapped (Down a)) #

Wrapped (NonEmpty a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (NonEmpty a) :: Type #

Wrapped (IntMap a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (IntMap a) :: Type #

Methods

_Wrapped' :: Iso' (IntMap a) (Unwrapped (IntMap a)) #

Wrapped (Seq a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Seq a) :: Type #

Methods

_Wrapped' :: Iso' (Seq a) (Unwrapped (Seq a)) #

Ord a => Wrapped (Set a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Set a) :: Type #

Methods

_Wrapped' :: Iso' (Set a) (Unwrapped (Set a)) #

(Hashable a, Eq a) => Wrapped (HashSet a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (HashSet a) :: Type #

Methods

_Wrapped' :: Iso' (HashSet a) (Unwrapped (HashSet a)) #

Unbox a => Wrapped (Vector a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Vector a) :: Type #

Methods

_Wrapped' :: Iso' (Vector a) (Unwrapped (Vector a)) #

Prim a => Wrapped (Vector a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Vector a) :: Type #

Methods

_Wrapped' :: Iso' (Vector a) (Unwrapped (Vector a)) #

Wrapped (Vector a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Vector a) :: Type #

Methods

_Wrapped' :: Iso' (Vector a) (Unwrapped (Vector a)) #

Wrapped (TransInv t) 
Instance details

Defined in Diagrams.Core.Transform

Associated Types

type Unwrapped (TransInv t) :: Type #

Methods

_Wrapped' :: Iso' (TransInv t) (Unwrapped (TransInv t)) #

Wrapped (Polar a) 
Instance details

Defined in Diagrams.Coordinates.Polar

Associated Types

type Unwrapped (Polar a) :: Type #

Methods

_Wrapped' :: Iso' (Polar a) (Unwrapped (Polar a)) #

Wrapped (Active a) 
Instance details

Defined in Data.Active

Associated Types

type Unwrapped (Active a) :: Type #

Methods

_Wrapped' :: Iso' (Active a) (Unwrapped (Active a)) #

Wrapped (Time n) 
Instance details

Defined in Data.Active

Associated Types

type Unwrapped (Time n) :: Type #

Methods

_Wrapped' :: Iso' (Time n) (Unwrapped (Time n)) #

Wrapped (Clip n) 
Instance details

Defined in Diagrams.TwoD.Path

Associated Types

type Unwrapped (Clip n) :: Type #

Methods

_Wrapped' :: Iso' (Clip n) (Unwrapped (Clip n)) #

Wrapped (ArcLength n) 
Instance details

Defined in Diagrams.Segment

Associated Types

type Unwrapped (ArcLength n) :: Type #

Methods

_Wrapped' :: Iso' (ArcLength n) (Unwrapped (ArcLength n)) #

Wrapped (Duration n) 
Instance details

Defined in Data.Active

Associated Types

type Unwrapped (Duration n) :: Type #

Methods

_Wrapped' :: Iso' (Duration n) (Unwrapped (Duration n)) #

(Hashable k, Eq k) => Wrapped (HashMap k a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (HashMap k a) :: Type #

Methods

_Wrapped' :: Iso' (HashMap k a) (Unwrapped (HashMap k a)) #

Ord k => Wrapped (Map k a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Map k a) :: Type #

Methods

_Wrapped' :: Iso' (Map k a) (Unwrapped (Map k a)) #

Wrapped (Op a b) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Op a b) :: Type #

Methods

_Wrapped' :: Iso' (Op a b) (Unwrapped (Op a b)) #

Wrapped (WrappedMonad m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (WrappedMonad m a) :: Type #

Wrapped (ArrowMonad m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (ArrowMonad m a) :: Type #

Methods

_Wrapped' :: Iso' (ArrowMonad m a) (Unwrapped (ArrowMonad m a)) #

Wrapped (MaybeT m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (MaybeT m a) :: Type #

Methods

_Wrapped' :: Iso' (MaybeT m a) (Unwrapped (MaybeT m a)) #

Wrapped (CatchT m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (CatchT m a) :: Type #

Methods

_Wrapped' :: Iso' (CatchT m a) (Unwrapped (CatchT m a)) #

Wrapped (ListT m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (ListT m a) :: Type #

Methods

_Wrapped' :: Iso' (ListT m a) (Unwrapped (ListT m a)) #

Wrapped (WrappedApplicative f a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (WrappedApplicative f a) :: Type #

Wrapped (MaybeApply f a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (MaybeApply f a) :: Type #

Methods

_Wrapped' :: Iso' (MaybeApply f a) (Unwrapped (MaybeApply f a)) #

Wrapped (Envelope v n) 
Instance details

Defined in Diagrams.Core.Envelope

Associated Types

type Unwrapped (Envelope v n) :: Type #

Methods

_Wrapped' :: Iso' (Envelope v n) (Unwrapped (Envelope v n)) #

Wrapped (Style v n) 
Instance details

Defined in Diagrams.Core.Style

Associated Types

type Unwrapped (Style v n) :: Type #

Methods

_Wrapped' :: Iso' (Style v n) (Unwrapped (Style v n)) #

Wrapped (Trace v n) 
Instance details

Defined in Diagrams.Core.Trace

Associated Types

type Unwrapped (Trace v n) :: Type #

Methods

_Wrapped' :: Iso' (Trace v n) (Unwrapped (Trace v n)) #

Wrapped (Point f a) 
Instance details

Defined in Linear.Affine

Associated Types

type Unwrapped (Point f a) :: Type #

Methods

_Wrapped' :: Iso' (Point f a) (Unwrapped (Point f a)) #

Wrapped (Path v n) 
Instance details

Defined in Diagrams.Path

Associated Types

type Unwrapped (Path v n) :: Type #

Methods

_Wrapped' :: Iso' (Path v n) (Unwrapped (Path v n)) #

Wrapped (Trail v n) 
Instance details

Defined in Diagrams.Trail

Associated Types

type Unwrapped (Trail v n) :: Type #

Methods

_Wrapped' :: Iso' (Trail v n) (Unwrapped (Trail v n)) #

Wrapped (SegTree v n) 
Instance details

Defined in Diagrams.Trail

Associated Types

type Unwrapped (SegTree v n) :: Type #

Methods

_Wrapped' :: Iso' (SegTree v n) (Unwrapped (SegTree v n)) #

Wrapped (TotalOffset v n) 
Instance details

Defined in Diagrams.Segment

Associated Types

type Unwrapped (TotalOffset v n) :: Type #

Methods

_Wrapped' :: Iso' (TotalOffset v n) (Unwrapped (TotalOffset v n)) #

Wrapped (Alt f a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Alt f a) :: Type #

Methods

_Wrapped' :: Iso' (Alt f a) (Unwrapped (Alt f a)) #

Wrapped (CoiterT w a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (CoiterT w a) :: Type #

Methods

_Wrapped' :: Iso' (CoiterT w a) (Unwrapped (CoiterT w a)) #

Wrapped (IterT m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (IterT m a) :: Type #

Methods

_Wrapped' :: Iso' (IterT m a) (Unwrapped (IterT m a)) #

Wrapped (Rec1 f p) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Rec1 f p) :: Type #

Methods

_Wrapped' :: Iso' (Rec1 f p) (Unwrapped (Rec1 f p)) #

Wrapped (WrappedArrow a b c) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (WrappedArrow a b c) :: Type #

Methods

_Wrapped' :: Iso' (WrappedArrow a b c) (Unwrapped (WrappedArrow a b c)) #

Wrapped (Kleisli m a b) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Kleisli m a b) :: Type #

Methods

_Wrapped' :: Iso' (Kleisli m a b) (Unwrapped (Kleisli m a b)) #

Wrapped (Const a x) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Const a x) :: Type #

Methods

_Wrapped' :: Iso' (Const a x) (Unwrapped (Const a x)) #

Wrapped (Ap f a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Ap f a) :: Type #

Methods

_Wrapped' :: Iso' (Ap f a) (Unwrapped (Ap f a)) #

Wrapped (Alt f a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Alt f a) :: Type #

Methods

_Wrapped' :: Iso' (Alt f a) (Unwrapped (Alt f a)) #

Wrapped (Join p a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Join p a) :: Type #

Methods

_Wrapped' :: Iso' (Join p a) (Unwrapped (Join p a)) #

Wrapped (Fix p a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Fix p a) :: Type #

Methods

_Wrapped' :: Iso' (Fix p a) (Unwrapped (Fix p a)) #

Wrapped (TracedT m w a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (TracedT m w a) :: Type #

Methods

_Wrapped' :: Iso' (TracedT m w a) (Unwrapped (TracedT m w a)) #

Wrapped (IdentityT m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (IdentityT m a) :: Type #

Methods

_Wrapped' :: Iso' (IdentityT m a) (Unwrapped (IdentityT m a)) #

Wrapped (Compose f g a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Compose f g a) :: Type #

Methods

_Wrapped' :: Iso' (Compose f g a) (Unwrapped (Compose f g a)) #

Wrapped (ComposeFC f g a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (ComposeFC f g a) :: Type #

Methods

_Wrapped' :: Iso' (ComposeFC f g a) (Unwrapped (ComposeFC f g a)) #

Wrapped (ComposeCF f g a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (ComposeCF f g a) :: Type #

Methods

_Wrapped' :: Iso' (ComposeCF f g a) (Unwrapped (ComposeCF f g a)) #

Wrapped (ExceptT e m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (ExceptT e m a) :: Type #

Methods

_Wrapped' :: Iso' (ExceptT e m a) (Unwrapped (ExceptT e m a)) #

Wrapped (WriterT w m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (WriterT w m a) :: Type #

Methods

_Wrapped' :: Iso' (WriterT w m a) (Unwrapped (WriterT w m a)) #

Wrapped (StateT s m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (StateT s m a) :: Type #

Methods

_Wrapped' :: Iso' (StateT s m a) (Unwrapped (StateT s m a)) #

Wrapped (ReaderT r m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (ReaderT r m a) :: Type #

Methods

_Wrapped' :: Iso' (ReaderT r m a) (Unwrapped (ReaderT r m a)) #

Wrapped (ErrorT e m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (ErrorT e m a) :: Type #

Methods

_Wrapped' :: Iso' (ErrorT e m a) (Unwrapped (ErrorT e m a)) #

Wrapped (StateT s m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (StateT s m a) :: Type #

Methods

_Wrapped' :: Iso' (StateT s m a) (Unwrapped (StateT s m a)) #

Wrapped (WriterT w m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (WriterT w m a) :: Type #

Methods

_Wrapped' :: Iso' (WriterT w m a) (Unwrapped (WriterT w m a)) #

Wrapped (Star f d c) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Star f d c) :: Type #

Methods

_Wrapped' :: Iso' (Star f d c) (Unwrapped (Star f d c)) #

Wrapped (Costar f d c) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Costar f d c) :: Type #

Methods

_Wrapped' :: Iso' (Costar f d c) (Unwrapped (Costar f d c)) #

Wrapped (WrappedArrow p a b) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (WrappedArrow p a b) :: Type #

Methods

_Wrapped' :: Iso' (WrappedArrow p a b) (Unwrapped (WrappedArrow p a b)) #

Wrapped (Forget r a b) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Forget r a b) :: Type #

Methods

_Wrapped' :: Iso' (Forget r a b) (Unwrapped (Forget r a b)) #

Wrapped (Static f a b) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Static f a b) :: Type #

Methods

_Wrapped' :: Iso' (Static f a b) (Unwrapped (Static f a b)) #

Wrapped (Tagged s a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Tagged s a) :: Type #

Methods

_Wrapped' :: Iso' (Tagged s a) (Unwrapped (Tagged s a)) #

Wrapped (Reverse f a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Reverse f a) :: Type #

Methods

_Wrapped' :: Iso' (Reverse f a) (Unwrapped (Reverse f a)) #

Wrapped (Constant a b) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Constant a b) :: Type #

Methods

_Wrapped' :: Iso' (Constant a b) (Unwrapped (Constant a b)) #

Wrapped (Backwards f a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Backwards f a) :: Type #

Methods

_Wrapped' :: Iso' (Backwards f a) (Unwrapped (Backwards f a)) #

Wrapped (CofreeT f w a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (CofreeT f w a) :: Type #

Methods

_Wrapped' :: Iso' (CofreeT f w a) (Unwrapped (CofreeT f w a)) #

Wrapped (FreeT f m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (FreeT f m a) :: Type #

Methods

_Wrapped' :: Iso' (FreeT f m a) (Unwrapped (FreeT f m a)) #

Wrapped (Query v n m) 
Instance details

Defined in Diagrams.Core.Query

Associated Types

type Unwrapped (Query v n m) :: Type #

Methods

_Wrapped' :: Iso' (Query v n m) (Unwrapped (Query v n m)) #

Wrapped (Trail' Line v n) 
Instance details

Defined in Diagrams.Trail

Associated Types

type Unwrapped (Trail' Line v n) :: Type #

Methods

_Wrapped' :: Iso' (Trail' Line v n) (Unwrapped (Trail' Line v n)) #

Wrapped (ApT f g a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (ApT f g a) :: Type #

Methods

_Wrapped' :: Iso' (ApT f g a) (Unwrapped (ApT f g a)) #

Wrapped (K1 i c p) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (K1 i c p) :: Type #

Methods

_Wrapped' :: Iso' (K1 i c p) (Unwrapped (K1 i c p)) #

Wrapped (ContT r m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (ContT r m a) :: Type #

Methods

_Wrapped' :: Iso' (ContT r m a) (Unwrapped (ContT r m a)) #

Wrapped (Cayley f p a b) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Cayley f p a b) :: Type #

Methods

_Wrapped' :: Iso' (Cayley f p a b) (Unwrapped (Cayley f p a b)) #

Wrapped (QDiagram b v n m) 
Instance details

Defined in Diagrams.Core.Types

Associated Types

type Unwrapped (QDiagram b v n m) :: Type #

Methods

_Wrapped' :: Iso' (QDiagram b v n m) (Unwrapped (QDiagram b v n m)) #

Wrapped (SubMap b v n m) 
Instance details

Defined in Diagrams.Core.Types

Associated Types

type Unwrapped (SubMap b v n m) :: Type #

Methods

_Wrapped' :: Iso' (SubMap b v n m) (Unwrapped (SubMap b v n m)) #

Wrapped (M1 i c f p) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (M1 i c f p) :: Type #

Methods

_Wrapped' :: Iso' (M1 i c f p) (Unwrapped (M1 i c f p)) #

Wrapped ((f :.: g) p) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped ((f :.: g) p) :: Type #

Methods

_Wrapped' :: Iso' ((f :.: g) p) (Unwrapped ((f :.: g) p)) #

Wrapped (Compose f g a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Compose f g a) :: Type #

Methods

_Wrapped' :: Iso' (Compose f g a) (Unwrapped (Compose f g a)) #

Wrapped (WrappedBifunctor p a b) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (WrappedBifunctor p a b) :: Type #

Wrapped (Joker g a b) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Joker g a b) :: Type #

Methods

_Wrapped' :: Iso' (Joker g a b) (Unwrapped (Joker g a b)) #

Wrapped (Flip p a b) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Flip p a b) :: Type #

Methods

_Wrapped' :: Iso' (Flip p a b) (Unwrapped (Flip p a b)) #

Wrapped (Clown f a b) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Clown f a b) :: Type #

Methods

_Wrapped' :: Iso' (Clown f a b) (Unwrapped (Clown f a b)) #

Wrapped (RWST r w s m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (RWST r w s m a) :: Type #

Methods

_Wrapped' :: Iso' (RWST r w s m a) (Unwrapped (RWST r w s m a)) #

Wrapped (RWST r w s m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (RWST r w s m a) :: Type #

Methods

_Wrapped' :: Iso' (RWST r w s m a) (Unwrapped (RWST r w s m a)) #

Wrapped (Dual k3 a b) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Dual k3 a b) :: Type #

Methods

_Wrapped' :: Iso' (Dual k3 a b) (Unwrapped (Dual k3 a b)) #

Wrapped (WrappedCategory k3 a b) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (WrappedCategory k3 a b) :: Type #

Wrapped (Semi m a b) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Semi m a b) :: Type #

Methods

_Wrapped' :: Iso' (Semi m a b) (Unwrapped (Semi m a b)) #

Wrapped (Tannen f p a b) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Tannen f p a b) :: Type #

Methods

_Wrapped' :: Iso' (Tannen f p a b) (Unwrapped (Tannen f p a b)) #

Wrapped (Biff p f g a b) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Biff p f g a b) :: Type #

Methods

_Wrapped' :: Iso' (Biff p f g a b) (Unwrapped (Biff p f g a b)) #

type BackendProgram a = Program ChartBackendInstr a #

class ToRenderable a where #

Methods

toRenderable :: a -> Renderable () #

Instances
ToRenderable PieChart 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Pie

ToRenderable PieLayout 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Pie

ToRenderable Rectangle 
Instance details

Defined in Graphics.Rendering.Chart.Renderable

ToRenderable (Renderable a) 
Instance details

Defined in Graphics.Rendering.Chart.Renderable

Ord x => ToRenderable (StackedLayouts x) 
Instance details

Defined in Graphics.Rendering.Chart.Layout

ToRenderable a => ToRenderable (Grid a) 
Instance details

Defined in Graphics.Rendering.Chart.Grid

Methods

toRenderable :: Grid a -> Renderable () #

(Default a, ToRenderable a) => ToRenderable (EC a b) 
Instance details

Defined in Graphics.Rendering.Chart.State

Methods

toRenderable :: EC a b -> Renderable () #

(Ord x, Ord y) => ToRenderable (Layout x y) 
Instance details

Defined in Graphics.Rendering.Chart.Layout

Methods

toRenderable :: Layout x y -> Renderable () #

ToRenderable (Legend x y) 
Instance details

Defined in Graphics.Rendering.Chart.Legend

Methods

toRenderable :: Legend x y -> Renderable () #

(Ord x, Ord yl, Ord yr) => ToRenderable (LayoutLR x yl yr) 
Instance details

Defined in Graphics.Rendering.Chart.Layout

Methods

toRenderable :: LayoutLR x yl yr -> Renderable () #

type EC l a = StateT l (State CState) a #

type PickFn a = Point -> Maybe a #

execEC :: Default l => EC l a -> l #

type Lens' s a = Lens s s a a #

data Renderable a #

Instances
Functor Renderable 
Instance details

Defined in Graphics.Rendering.Chart.Renderable

Methods

fmap :: (a -> b) -> Renderable a -> Renderable b #

(<$) :: a -> Renderable b -> Renderable a #

ToRenderable (Renderable a) 
Instance details

Defined in Graphics.Rendering.Chart.Renderable

ToImage (Renderable a) # 
Instance details

Defined in Language.Stochaskell.Plot

Methods

toPNG :: String -> Renderable a -> IO () #

toSVG :: String -> Renderable a -> IO () #

autoSteps :: Int -> [Double] -> [Double] #

la_labelf :: Lens (LinearAxisParams a1) (LinearAxisParams a2) ([a1] -> [String]) ([a2] -> [String]) #

loga_labelf :: Iso (LogAxisParams a1) (LogAxisParams a2) ([a1] -> [String]) ([a2] -> [String]) #

scaledAxis :: RealFloat a => LinearAxisParams a -> (a, a) -> AxisFn a #

addIndexes :: [a] -> [(PlotIndex, a)] #

autoIndexAxis :: Integral i => [String] -> [i] -> AxisData i #

invLinMap :: (Double -> a) -> (a -> Double) -> (a, a) -> Range -> Double -> a #

invmap :: PlotValue x => (x, x) -> Range -> Double -> x #

linMap :: (a -> Double) -> (a, a) -> Range -> a -> Double #

makeAxis :: PlotValue x => ([x] -> [String]) -> ([x], [x], [x]) -> AxisData x #

makeAxis' :: Ord x => (x -> Double) -> (Double -> x) -> ([x] -> [String]) -> ([x], [x], [x]) -> AxisData x #

vmap :: PlotValue x => (x, x) -> Range -> x -> Double #

alignPath :: (Point -> Point) -> Path -> Path #

bars :: (PlotValue x, BarsPlotValue y) => [String] -> [(x, [y])] -> EC l (PlotBars x y) #

line :: String -> [[(x, y)]] -> EC l (PlotLines x y) #

points :: String -> [(x, y)] -> EC l (PlotPoints x y) #

setShapes :: [PointShape] -> EC l () #

arc :: Point -> Double -> Double -> Double -> Path #

foldPath :: Monoid m => (Point -> m) -> (Point -> m) -> (Point -> Double -> Double -> Double -> m) -> (Point -> Double -> Double -> Double -> m) -> m -> Path -> m #

mkrect :: Point -> Point -> Point -> Point -> Rect #

pointToVec :: Point -> Vector #

psub :: Point -> Point -> Vector #

pvadd :: Point -> Vector -> Point #

pvsub :: Point -> Vector -> Point #

scale :: Vector -> Matrix -> Matrix #

scaleP :: Vector -> Point -> Point #

translate :: Vector -> Matrix -> Matrix #

translateP :: Vector -> Point -> Point #

vangle :: Vector -> Double #

vlen :: Vector -> Double #

vscale :: Double -> Vector -> Vector #

laxis_style :: Lens' (LayoutAxis x) AxisStyle #

layoutLRToGrid :: (Ord x, Ord yl, Ord yr) => LayoutLR x yl yr -> Grid (Renderable (LayoutPick x yl yr)) #

layoutLRToRenderable :: (Ord x, Ord yl, Ord yr) => LayoutLR x yl yr -> Renderable (LayoutPick x yl yr) #

layoutToGrid :: (Ord x, Ord y) => Layout x y -> Grid (Renderable (LayoutPick x y y)) #

layoutToRenderable :: (Ord x, Ord y) => Layout x y -> Renderable (LayoutPick x y y) #

layout_axes_styles :: Setter' (Layout x y) AxisStyle #

layout_plots :: Lens' (Layout x y) [Plot x y] #

layoutlr_axes_styles :: Setter' (LayoutLR x y1 y2) AxisStyle #

layoutlr_plots :: Lens' (LayoutLR x y1 y2) [Either (Plot x y1) (Plot x y2)] #

plot_annotation_values :: Lens (PlotAnnotation x1 y1) (PlotAnnotation x2 y2) [(x1, y1, String)] [(x2, y2, String)] #

area_spots_4d_values :: Lens (AreaSpots4D z1 t1 x1 y1) (AreaSpots4D z2 t2 x2 y2) [(x1, y1, z1, t1)] [(x2, y2, z2, t2)] #

area_spots_values :: Lens (AreaSpots z1 x1 y1) (AreaSpots z2 x2 y2) [(x1, y1, z1)] [(x2, y2, z2)] #

plotBars :: BarsPlotValue y => PlotBars x y -> Plot x y #

plot_bars_values :: Lens (PlotBars x1 y) (PlotBars x2 y) [(x1, [y])] [(x2, [y])] #

plot_candle_values :: Lens (PlotCandle x1 y1) (PlotCandle x2 y2) [Candle x1 y1] [Candle x2 y2] #

symErrPoint :: (Num a, Num b) => a -> b -> a -> b -> ErrPoint a b #

plot_fillbetween_values :: Lens (PlotFillBetween x1 y1) (PlotFillBetween x2 y2) [(x1, (y1, y1))] [(x2, (y2, y2))] #

plot_hidden_x_values :: Lens (PlotHidden x1 y) (PlotHidden x2 y) [x1] [x2] #

plot_hidden_y_values :: Lens (PlotHidden x y1) (PlotHidden x y2) [y1] [y2] #

histToPlot :: (RealFrac x, Num y, Ord y) => PlotHist x y -> Plot x y #

plot_hist_norm_func :: Lens (PlotHist x y1) (PlotHist x y2) (Double -> Int -> y1) (Double -> Int -> y2) #

hlinePlot :: String -> LineStyle -> b -> Plot a b #

plot_lines_values :: Lens' (PlotLines x y) [[(x, y)]] #

vlinePlot :: String -> LineStyle -> a -> Plot a b #

plot_points_values :: Lens (PlotPoints x1 y1) (PlotPoints x2 y2) [(x1, y1)] [(x2, y2)] #

joinPlot :: Plot x y -> Plot x y -> Plot x y #

mapXY :: PointMapFn x y -> (x, y) -> Point #

plot_all_points :: Lens' (Plot x y) ([x], [y]) #

plot_legend :: Lens' (Plot x y) [(String, Rect -> BackendProgram ())] #

plot_render :: Lens' (Plot x y) (PointMapFn x y -> BackendProgram ()) #

plotVectorField :: (PlotValue x, PlotValue y) => PlotVectors x y -> Plot x y #

plot_vectors_mapf :: Lens' (PlotVectors x y) ((x, y) -> (x, y)) #

plot_vectors_values :: Lens' (PlotVectors x y) [((x, y), (x, y))] #

mapPickFn :: (a -> b) -> Renderable a -> Renderable b #

liftCState :: State CState a -> EC l a #

liftEC :: Default l1 => EC l1 a -> EC l2 l1 #

plot :: ToPlot p => EC (Layout x y) (p x y) -> EC (Layout x y) () #

plotLeft :: ToPlot p => EC (LayoutLR x y1 y2) (p x y1) -> EC (LayoutLR x y1 y2) () #

plotRight :: ToPlot p => EC (LayoutLR x y1 y2) (p x y2) -> EC (LayoutLR x y1 y2) () #

iat :: At m => Index m -> IndexedLens' (Index m) m (Maybe (IxValue m)) #

iix :: Ixed m => Index m -> IndexedTraversal' (Index m) m (IxValue m) #

ixAt :: At m => Index m -> Traversal' m (IxValue m) #

sans :: At m => Index m -> m -> m #

pattern (:<) :: forall b a. Cons b b a a => a -> b -> b #

pattern (:>) :: forall a b. Snoc a a b b => a -> b -> a #

(<|) :: Cons s s a a => a -> s -> s #

_head :: Cons s s a a => Traversal' s a #

_init :: Snoc s s a a => Traversal' s s #

_last :: Snoc s s a a => Traversal' s a #

_tail :: Cons s s a a => Traversal' s s #

cons :: Cons s s a a => a -> s -> s #

snoc :: Snoc s s a a => s -> a -> s #

uncons :: Cons s s a a => s -> Maybe (a, s) #

unsnoc :: Snoc s s a a => s -> Maybe (s, a) #

(|>) :: Snoc s s a a => s -> a -> s #

pattern Empty :: forall s. AsEmpty s => s #

fromEq :: AnEquality s t a b -> Equality b a t s #

mapEq :: AnEquality s t a b -> f s -> f a #

runEq :: AnEquality s t a b -> Identical s t a b #

simply :: (Optic' p f s a -> r) -> Optic' p f s a -> r #

substEq :: AnEquality s t a b -> ((s ~ a) -> (t ~ b) -> r) -> r #

(^..) :: s -> Getting (Endo [a]) s a -> [a] #

(^?) :: s -> Getting (First a) s a -> Maybe a #

(^?!) :: HasCallStack => s -> Getting (Endo a) s a -> a #

(^@..) :: s -> IndexedGetting i (Endo [(i, a)]) s a -> [(i, a)] #

(^@?) :: s -> IndexedGetting i (Endo (Maybe (i, a))) s a -> Maybe (i, a) #

(^@?!) :: HasCallStack => s -> IndexedGetting i (Endo (i, a)) s a -> (i, a) #

allOf :: Getting All s a -> (a -> Bool) -> s -> Bool #

andOf :: Getting All s Bool -> s -> Bool #

anyOf :: Getting Any s a -> (a -> Bool) -> s -> Bool #

asumOf :: Alternative f => Getting (Endo (f a)) s (f a) -> s -> f a #

backwards :: (Profunctor p, Profunctor q) => Optical p q (Backwards f) s t a b -> Optical p q f s t a b #

concatMapOf :: Getting [r] s a -> (a -> [r]) -> s -> [r] #

concatOf :: Getting [r] s [r] -> s -> [r] #

cycled :: Apply f => LensLike f s t a b -> LensLike f s t a b #

droppingWhile :: (Conjoined p, Profunctor q, Applicative f) => (a -> Bool) -> Optical p q (Compose (State Bool) f) s t a a -> Optical p q f s t a a #

elemIndexOf :: Eq a => IndexedGetting i (First i) s a -> a -> s -> Maybe i #

elemIndicesOf :: Eq a => IndexedGetting i (Endo [i]) s a -> a -> s -> [i] #

elemOf :: Eq a => Getting Any s a -> a -> s -> Bool #

filtered :: (Choice p, Applicative f) => (a -> Bool) -> Optic' p f a a #

findIndexOf :: IndexedGetting i (First i) s a -> (a -> Bool) -> s -> Maybe i #

findIndicesOf :: IndexedGetting i (Endo [i]) s a -> (a -> Bool) -> s -> [i] #

findMOf :: Monad m => Getting (Endo (m (Maybe a))) s a -> (a -> m Bool) -> s -> m (Maybe a) #

findOf :: Getting (Endo (Maybe a)) s a -> (a -> Bool) -> s -> Maybe a #

first1Of :: Getting (First a) s a -> s -> a #

firstOf :: Getting (Leftmost a) s a -> s -> Maybe a #

foldByOf :: Fold s a -> (a -> a -> a) -> a -> s -> a #

foldMapByOf :: Fold s a -> (r -> r -> r) -> r -> (a -> r) -> s -> r #

foldMapOf :: Getting r s a -> (a -> r) -> s -> r #

foldOf :: Getting a s a -> s -> a #

folded :: Foldable f => IndexedFold Int (f a) a #

folding :: Foldable f => (s -> f a) -> Fold s a #

foldl1Of :: HasCallStack => Getting (Dual (Endo (Maybe a))) s a -> (a -> a -> a) -> s -> a #

foldl1Of' :: HasCallStack => Getting (Endo (Endo (Maybe a))) s a -> (a -> a -> a) -> s -> a #

foldlMOf :: Monad m => Getting (Endo (r -> m r)) s a -> (r -> a -> m r) -> r -> s -> m r #

foldlOf :: Getting (Dual (Endo r)) s a -> (r -> a -> r) -> r -> s -> r #

foldlOf' :: Getting (Endo (Endo r)) s a -> (r -> a -> r) -> r -> s -> r #

foldr1Of :: HasCallStack => Getting (Endo (Maybe a)) s a -> (a -> a -> a) -> s -> a #

foldr1Of' :: HasCallStack => Getting (Dual (Endo (Endo (Maybe a)))) s a -> (a -> a -> a) -> s -> a #

foldrMOf :: Monad m => Getting (Dual (Endo (r -> m r))) s a -> (a -> r -> m r) -> r -> s -> m r #

foldrOf :: Getting (Endo r) s a -> (a -> r -> r) -> r -> s -> r #

foldrOf' :: Getting (Dual (Endo (Endo r))) s a -> (a -> r -> r) -> r -> s -> r #

foldring :: (Contravariant f, Applicative f) => ((a -> f a -> f a) -> f a -> s -> f a) -> LensLike f s t a b #

for1Of_ :: Functor f => Getting (TraversedF r f) s a -> s -> (a -> f r) -> f () #

forMOf_ :: Monad m => Getting (Sequenced r m) s a -> s -> (a -> m r) -> m () #

forOf_ :: Functor f => Getting (Traversed r f) s a -> s -> (a -> f r) -> f () #

has :: Getting Any s a -> s -> Bool #

hasn't :: Getting All s a -> s -> Bool #

iallOf :: IndexedGetting i All s a -> (i -> a -> Bool) -> s -> Bool #

ianyOf :: IndexedGetting i Any s a -> (i -> a -> Bool) -> s -> Bool #

iconcatMapOf :: IndexedGetting i [r] s a -> (i -> a -> [r]) -> s -> [r] #

idroppingWhile :: (Indexable i p, Profunctor q, Applicative f) => (i -> a -> Bool) -> Optical (Indexed i) q (Compose (State Bool) f) s t a a -> Optical p q f s t a a #

ifiltered :: (Indexable i p, Applicative f) => (i -> a -> Bool) -> Optical' p (Indexed i) f a a #

ifindMOf :: Monad m => IndexedGetting i (Endo (m (Maybe a))) s a -> (i -> a -> m Bool) -> s -> m (Maybe a) #

ifindOf :: IndexedGetting i (Endo (Maybe a)) s a -> (i -> a -> Bool) -> s -> Maybe a #

ifoldMapOf :: IndexedGetting i m s a -> (i -> a -> m) -> s -> m #

ifolding :: (Foldable f, Indexable i p, Contravariant g, Applicative g) => (s -> f (i, a)) -> Over p g s t a b #

ifoldlMOf :: Monad m => IndexedGetting i (Endo (r -> m r)) s a -> (i -> r -> a -> m r) -> r -> s -> m r #

ifoldlOf :: IndexedGetting i (Dual (Endo r)) s a -> (i -> r -> a -> r) -> r -> s -> r #

ifoldlOf' :: IndexedGetting i (Endo (r -> r)) s a -> (i -> r -> a -> r) -> r -> s -> r #

ifoldrMOf :: Monad m => IndexedGetting i (Dual (Endo (r -> m r))) s a -> (i -> a -> r -> m r) -> r -> s -> m r #

ifoldrOf :: IndexedGetting i (Endo r) s a -> (i -> a -> r -> r) -> r -> s -> r #

ifoldrOf' :: IndexedGetting i (Dual (Endo (r -> r))) s a -> (i -> a -> r -> r) -> r -> s -> r #

ifoldring :: (Indexable i p, Contravariant f, Applicative f) => ((i -> a -> f a -> f a) -> f a -> s -> f a) -> Over p f s t a b #

iforMOf_ :: Monad m => IndexedGetting i (Sequenced r m) s a -> s -> (i -> a -> m r) -> m () #

iforOf_ :: Functor f => IndexedGetting i (Traversed r f) s a -> s -> (i -> a -> f r) -> f () #

imapMOf_ :: Monad m => IndexedGetting i (Sequenced r m) s a -> (i -> a -> m r) -> s -> m () #

inoneOf :: IndexedGetting i Any s a -> (i -> a -> Bool) -> s -> Bool #

ipre :: IndexedGetting i (First (i, a)) s a -> IndexPreservingGetter s (Maybe (i, a)) #

ipreuse :: MonadState s m => IndexedGetting i (First (i, a)) s a -> m (Maybe (i, a)) #

ipreuses :: MonadState s m => IndexedGetting i (First r) s a -> (i -> a -> r) -> m (Maybe r) #

ipreview :: MonadReader s m => IndexedGetting i (First (i, a)) s a -> m (Maybe (i, a)) #

ipreviews :: MonadReader s m => IndexedGetting i (First r) s a -> (i -> a -> r) -> m (Maybe r) #

itakingWhile :: (Indexable i p, Profunctor q, Contravariant f, Applicative f) => (i -> a -> Bool) -> Optical' (Indexed i) q (Const (Endo (f s)) :: Type -> Type) s a -> Optical' p q f s a #

iterated :: Apply f => (a -> a) -> LensLike' f a a #

itoListOf :: IndexedGetting i (Endo [(i, a)]) s a -> s -> [(i, a)] #

itraverseOf_ :: Functor f => IndexedGetting i (Traversed r f) s a -> (i -> a -> f r) -> s -> f () #

last1Of :: Getting (Last a) s a -> s -> a #

lastOf :: Getting (Rightmost a) s a -> s -> Maybe a #

lengthOf :: Getting (Endo (Endo Int)) s a -> s -> Int #

lookupOf :: Eq k => Getting (Endo (Maybe v)) s (k, v) -> k -> s -> Maybe v #

mapMOf_ :: Monad m => Getting (Sequenced r m) s a -> (a -> m r) -> s -> m () #

maximum1Of :: Ord a => Getting (Max a) s a -> s -> a #

maximumByOf :: Getting (Endo (Endo (Maybe a))) s a -> (a -> a -> Ordering) -> s -> Maybe a #

maximumOf :: Ord a => Getting (Endo (Endo (Maybe a))) s a -> s -> Maybe a #

minimum1Of :: Ord a => Getting (Min a) s a -> s -> a #

minimumByOf :: Getting (Endo (Endo (Maybe a))) s a -> (a -> a -> Ordering) -> s -> Maybe a #

minimumOf :: Ord a => Getting (Endo (Endo (Maybe a))) s a -> s -> Maybe a #

msumOf :: MonadPlus m => Getting (Endo (m a)) s (m a) -> s -> m a #

noneOf :: Getting Any s a -> (a -> Bool) -> s -> Bool #

notElemOf :: Eq a => Getting All s a -> a -> s -> Bool #

notNullOf :: Getting Any s a -> s -> Bool #

nullOf :: Getting All s a -> s -> Bool #

orOf :: Getting Any s Bool -> s -> Bool #

preuse :: MonadState s m => Getting (First a) s a -> m (Maybe a) #

preuses :: MonadState s m => Getting (First r) s a -> (a -> r) -> m (Maybe r) #

preview :: MonadReader s m => Getting (First a) s a -> m (Maybe a) #

previews :: MonadReader s m => Getting (First r) s a -> (a -> r) -> m (Maybe r) #

productOf :: Num a => Getting (Endo (Endo a)) s a -> s -> a #

repeated :: Apply f => LensLike' f a a #

replicated :: Int -> Fold a a #

sequence1Of_ :: Functor f => Getting (TraversedF a f) s (f a) -> s -> f () #

sequenceAOf_ :: Functor f => Getting (Traversed a f) s (f a) -> s -> f () #

sequenceOf_ :: Monad m => Getting (Sequenced a m) s (m a) -> s -> m () #

sumOf :: Num a => Getting (Endo (Endo a)) s a -> s -> a #

takingWhile :: (Conjoined p, Applicative f) => (a -> Bool) -> Over p (TakingWhile p f a a) s t a a -> Over p f s t a a #

toListOf :: Getting (Endo [a]) s a -> s -> [a] #

toNonEmptyOf :: Getting (NonEmptyDList a) s a -> s -> NonEmpty a #

traverse1Of_ :: Functor f => Getting (TraversedF r f) s a -> (a -> f r) -> s -> f () #

traverseOf_ :: Functor f => Getting (Traversed r f) s a -> (a -> f r) -> s -> f () #

unfolded :: (b -> Maybe (a, b)) -> Fold b a #

(^.) :: s -> Getting a s a -> a #

(^@.) :: s -> IndexedGetting i (i, a) s a -> (i, a) #

getting :: (Profunctor p, Profunctor q, Functor f, Contravariant f) => Optical p q f s t a b -> Optical' p q f s a #

ilike :: (Indexable i p, Contravariant f, Functor f) => i -> a -> Over' p f s a #

ilistening :: MonadWriter w m => IndexedGetting i (i, u) w u -> m a -> m (a, (i, u)) #

ilistenings :: MonadWriter w m => IndexedGetting i v w u -> (i -> u -> v) -> m a -> m (a, v) #

ito :: (Indexable i p, Contravariant f) => (s -> (i, a)) -> Over' p f s a #

iuse :: MonadState s m => IndexedGetting i (i, a) s a -> m (i, a) #

iuses :: MonadState s m => IndexedGetting i r s a -> (i -> a -> r) -> m r #

iview :: MonadReader s m => IndexedGetting i (i, a) s a -> m (i, a) #

iviews :: MonadReader s m => IndexedGetting i r s a -> (i -> a -> r) -> m r #

like :: (Profunctor p, Contravariant f, Functor f) => a -> Optic' p f s a #

listening :: MonadWriter w m => Getting u w u -> m a -> m (a, u) #

listenings :: MonadWriter w m => Getting v w u -> (u -> v) -> m a -> m (a, v) #

to :: (Profunctor p, Contravariant f) => (s -> a) -> Optic' p f s a #

use :: MonadState s m => Getting a s a -> m a #

uses :: MonadState s m => LensLike' (Const r :: Type -> Type) s a -> (a -> r) -> m r #

view :: MonadReader s m => Getting a s a -> m a #

views :: MonadReader s m => LensLike' (Const r :: Type -> Type) s a -> (a -> r) -> m r #

(.>) :: (st -> r) -> (kab -> st) -> kab -> r #

(<.) :: Indexable i p => (Indexed i s t -> r) -> ((a -> b) -> s -> t) -> p a b -> r #

(<.>) :: Indexable (i, j) p => (Indexed i s t -> r) -> (Indexed j a b -> s -> t) -> p a b -> r #

iall :: FoldableWithIndex i f => (i -> a -> Bool) -> f a -> Bool #

iany :: FoldableWithIndex i f => (i -> a -> Bool) -> f a -> Bool #

icompose :: Indexable p c => (i -> j -> p) -> (Indexed i s t -> r) -> (Indexed j a b -> s -> t) -> c a b -> r #

iconcatMap :: FoldableWithIndex i f => (i -> a -> [b]) -> f a -> [b] #

ifind :: FoldableWithIndex i f => (i -> a -> Bool) -> f a -> Maybe (i, a) #

ifoldMapBy :: FoldableWithIndex i t => (r -> r -> r) -> r -> (i -> a -> r) -> t a -> r #

ifoldMapByOf :: IndexedFold i t a -> (r -> r -> r) -> r -> (i -> a -> r) -> t -> r #

ifoldlM :: (FoldableWithIndex i f, Monad m) => (i -> b -> a -> m b) -> b -> f a -> m b #

ifoldrM :: (FoldableWithIndex i f, Monad m) => (i -> a -> b -> m b) -> b -> f a -> m b #

ifor :: (TraversableWithIndex i t, Applicative f) => t a -> (i -> a -> f b) -> f (t b) #

iforM :: (TraversableWithIndex i t, Monad m) => t a -> (i -> a -> m b) -> m (t b) #

iforM_ :: (FoldableWithIndex i t, Monad m) => t a -> (i -> a -> m b) -> m () #

ifor_ :: (FoldableWithIndex i t, Applicative f) => t a -> (i -> a -> f b) -> f () #

imapAccumL :: TraversableWithIndex i t => (i -> s -> a -> (s, b)) -> s -> t a -> (s, t b) #

imapAccumR :: TraversableWithIndex i t => (i -> s -> a -> (s, b)) -> s -> t a -> (s, t b) #

imapM :: (TraversableWithIndex i t, Monad m) => (i -> a -> m b) -> t a -> m (t b) #

imapM_ :: (FoldableWithIndex i t, Monad m) => (i -> a -> m b) -> t a -> m () #

index :: (Indexable i p, Eq i, Applicative f) => i -> Optical' p (Indexed i) f a a #

indices :: (Indexable i p, Applicative f) => (i -> Bool) -> Optical' p (Indexed i) f a a #

inone :: FoldableWithIndex i f => (i -> a -> Bool) -> f a -> Bool #

itoList :: FoldableWithIndex i f => f a -> [(i, a)] #

itraverseBy :: TraversableWithIndex i t => (forall x. x -> f x) -> (forall x y. f (x -> y) -> f x -> f y) -> (i -> a -> f b) -> t a -> f (t b) #

itraverseByOf :: IndexedTraversal i s t a b -> (forall x. x -> f x) -> (forall x y. f (x -> y) -> f x -> f y) -> (i -> a -> f b) -> s -> f t #

itraverse_ :: (FoldableWithIndex i t, Applicative f) => (i -> a -> f b) -> t a -> f () #

none :: Foldable f => (a -> Bool) -> f a -> Bool #

reindexed :: Indexable j p => (i -> j) -> (Indexed i a b -> r) -> p a b -> r #

selfIndex :: Indexable a p => p a fb -> a -> fb #

asIndex :: (Indexable i p, Contravariant f, Functor f) => p i (f i) -> Indexed i s (f s) #

indexing :: Indexable Int p => ((a -> Indexing f b) -> s -> Indexing f t) -> p a (f b) -> s -> f t #

indexing64 :: Indexable Int64 p => ((a -> Indexing64 f b) -> s -> Indexing64 f t) -> p a (f b) -> s -> f t #

withIndex :: (Indexable i p, Functor f) => p (i, s) (f (j, t)) -> Indexed i s (f t) #

retagged :: (Profunctor p, Bifunctor p) => p a b -> p s b #

pattern Lazy :: forall t s. Strict t s => t -> s #

pattern List :: forall l. IsList l => [Item l] -> l #

pattern Reversed :: forall t. Reversing t => t -> t #

pattern Strict :: forall s t. Strict s t => t -> s #

pattern Swapped :: forall (p :: Type -> Type -> Type) c d. Swapped p => p d c -> p c d #

anon :: a -> (a -> Bool) -> Iso' (Maybe a) a #

au :: Functor f => AnIso s t a b -> ((b -> t) -> f s) -> f a #

auf :: Optic (Costar f) g s t a b -> (f a -> g b) -> f s -> g t #

bimapping :: (Bifunctor f, Bifunctor g) => AnIso s t a b -> AnIso s' t' a' b' -> Iso (f s s') (g t t') (f a a') (g b b') #

cloneIso :: AnIso s t a b -> Iso s t a b #

coerced :: (Coercible s a, Coercible t b) => Iso s t a b #

contramapping :: Contravariant f => AnIso s t a b -> Iso (f a) (f b) (f s) (f t) #

curried :: Iso ((a, b) -> c) ((d, e) -> f) (a -> b -> c) (d -> e -> f) #

dimapping :: (Profunctor p, Profunctor q) => AnIso s t a b -> AnIso s' t' a' b' -> Iso (p a s') (q b t') (p s a') (q t b') #

enum :: Enum a => Iso' Int a #

firsting :: (Bifunctor f, Bifunctor g) => AnIso s t a b -> Iso (f s x) (g t y) (f a x) (g b y) #

flipped :: Iso (a -> b -> c) (a' -> b' -> c') (b -> a -> c) (b' -> a' -> c') #

from :: AnIso s t a b -> Iso b a t s #

imagma :: Over (Indexed i) (Molten i a b) s t a b -> Iso s t' (Magma i t b a) (Magma j t' c c) #

involuted :: (a -> a) -> Iso' a a #

iso :: (s -> a) -> (b -> t) -> Iso s t a b #

lazy :: Strict lazy strict => Iso' strict lazy #

lmapping :: (Profunctor p, Profunctor q) => AnIso s t a b -> Iso (p a x) (q b y) (p s x) (q t y) #

mapping :: (Functor f, Functor g) => AnIso s t a b -> Iso (f s) (g t) (f a) (g b) #

non :: Eq a => a -> Iso' (Maybe a) a #

non' :: APrism' a () -> Iso' (Maybe a) a #

reversed :: Reversing a => Iso' a a #

rmapping :: (Profunctor p, Profunctor q) => AnIso s t a b -> Iso (p x s) (q y t) (p x a) (q y b) #

seconding :: (Bifunctor f, Bifunctor g) => AnIso s t a b -> Iso (f x s) (g y t) (f x a) (g y b) #

uncurried :: Iso (a -> b -> c) (d -> e -> f) ((a, b) -> c) ((d, e) -> f) #

under :: AnIso s t a b -> (t -> s) -> b -> a #

withIso :: AnIso s t a b -> ((s -> a) -> (b -> t) -> r) -> r #

(#%%=) :: MonadState s m => ALens s s a b -> (a -> (r, b)) -> m r #

(#%%~) :: Functor f => ALens s t a b -> (a -> f b) -> s -> f t #

(#%=) :: MonadState s m => ALens s s a b -> (a -> b) -> m () #

(#%~) :: ALens s t a b -> (a -> b) -> s -> t #

(#=) :: MonadState s m => ALens s s a b -> b -> m () #

(#~) :: ALens s t a b -> b -> s -> t #

(%%=) :: MonadState s m => Over p ((,) r) s s a b -> p a (r, b) -> m r #

(%%@=) :: MonadState s m => Over (Indexed i) ((,) r) s s a b -> (i -> a -> (r, b)) -> m r #

(%%@~) :: Over (Indexed i) f s t a b -> (i -> a -> f b) -> s -> f t #

(%%~) :: LensLike f s t a b -> (a -> f b) -> s -> f t #

(&~) :: s -> State s a -> s #

(<#%=) :: MonadState s m => ALens s s a b -> (a -> b) -> m b #

(<#%~) :: ALens s t a b -> (a -> b) -> s -> (b, t) #

(<#=) :: MonadState s m => ALens s s a b -> b -> m b #

(<#~) :: ALens s t a b -> b -> s -> (b, t) #

(<%=) :: MonadState s m => LensLike ((,) b) s s a b -> (a -> b) -> m b #

(<%@=) :: MonadState s m => Over (Indexed i) ((,) b) s s a b -> (i -> a -> b) -> m b #

(<%@~) :: Over (Indexed i) ((,) b) s t a b -> (i -> a -> b) -> s -> (b, t) #

(<%~) :: LensLike ((,) b) s t a b -> (a -> b) -> s -> (b, t) #

(<&&=) :: MonadState s m => LensLike' ((,) Bool) s Bool -> Bool -> m Bool #

(<&&~) :: LensLike ((,) Bool) s t Bool Bool -> Bool -> s -> (Bool, t) #

(<**=) :: (MonadState s m, Floating a) => LensLike' ((,) a) s a -> a -> m a #

(<**~) :: Floating a => LensLike ((,) a) s t a a -> a -> s -> (a, t) #

(<*=) :: (MonadState s m, Num a) => LensLike' ((,) a) s a -> a -> m a #

(<*~) :: Num a => LensLike ((,) a) s t a a -> a -> s -> (a, t) #

(<+=) :: (MonadState s m, Num a) => LensLike' ((,) a) s a -> a -> m a #

(<+~) :: Num a => LensLike ((,) a) s t a a -> a -> s -> (a, t) #

(<-=) :: (MonadState s m, Num a) => LensLike' ((,) a) s a -> a -> m a #

(<-~) :: Num a => LensLike ((,) a) s t a a -> a -> s -> (a, t) #

(<//=) :: (MonadState s m, Fractional a) => LensLike' ((,) a) s a -> a -> m a #

(<//~) :: Fractional a => LensLike ((,) a) s t a a -> a -> s -> (a, t) #

(<<%=) :: (Strong p, MonadState s m) => Over p ((,) a) s s a b -> p a b -> m a #

(<<%@=) :: MonadState s m => Over (Indexed i) ((,) a) s s a b -> (i -> a -> b) -> m a #

(<<%@~) :: Over (Indexed i) ((,) a) s t a b -> (i -> a -> b) -> s -> (a, t) #

(<<%~) :: LensLike ((,) a) s t a b -> (a -> b) -> s -> (a, t) #

(<<&&~) :: LensLike' ((,) Bool) s Bool -> Bool -> s -> (Bool, s) #

(<<**=) :: (MonadState s m, Floating a) => LensLike' ((,) a) s a -> a -> m a #

(<<**~) :: Floating a => LensLike' ((,) a) s a -> a -> s -> (a, s) #

(<<*=) :: (MonadState s m, Num a) => LensLike' ((,) a) s a -> a -> m a #

(<<*~) :: Num a => LensLike' ((,) a) s a -> a -> s -> (a, s) #

(<<+=) :: (MonadState s m, Num a) => LensLike' ((,) a) s a -> a -> m a #

(<<+~) :: Num a => LensLike' ((,) a) s a -> a -> s -> (a, s) #

(<<-=) :: (MonadState s m, Num a) => LensLike' ((,) a) s a -> a -> m a #

(<<-~) :: Num a => LensLike' ((,) a) s a -> a -> s -> (a, s) #

(<<.=) :: MonadState s m => LensLike ((,) a) s s a b -> b -> m a #

(<<.~) :: LensLike ((,) a) s t a b -> b -> s -> (a, t) #

(<<//=) :: (MonadState s m, Fractional a) => LensLike' ((,) a) s a -> a -> m a #

(<<//~) :: Fractional a => LensLike' ((,) a) s a -> a -> s -> (a, s) #

(<<<>=) :: (MonadState s m, Monoid r) => LensLike' ((,) r) s r -> r -> m r #

(<<<>~) :: Monoid r => LensLike' ((,) r) s r -> r -> s -> (r, s) #

(<<>=) :: (MonadState s m, Monoid r) => LensLike' ((,) r) s r -> r -> m r #

(<<>~) :: Monoid m => LensLike ((,) m) s t m m -> m -> s -> (m, t) #

(<<?=) :: MonadState s m => LensLike ((,) a) s s a (Maybe b) -> b -> m a #

(<<?~) :: LensLike ((,) a) s t a (Maybe b) -> b -> s -> (a, t) #

(<<^=) :: (MonadState s m, Num a, Integral e) => LensLike' ((,) a) s a -> e -> m a #

(<<^^=) :: (MonadState s m, Fractional a, Integral e) => LensLike' ((,) a) s a -> e -> m a #

(<<^^~) :: (Fractional a, Integral e) => LensLike' ((,) a) s a -> e -> s -> (a, s) #

(<<^~) :: (Num a, Integral e) => LensLike' ((,) a) s a -> e -> s -> (a, s) #

(<<||~) :: LensLike' ((,) Bool) s Bool -> Bool -> s -> (Bool, s) #

(<<~) :: MonadState s m => ALens s s a b -> m b -> m b #

(<^=) :: (MonadState s m, Num a, Integral e) => LensLike' ((,) a) s a -> e -> m a #

(<^^=) :: (MonadState s m, Fractional a, Integral e) => LensLike' ((,) a) s a -> e -> m a #

(<^^~) :: (Fractional a, Integral e) => LensLike ((,) a) s t a a -> e -> s -> (a, t) #

(<^~) :: (Num a, Integral e) => LensLike ((,) a) s t a a -> e -> s -> (a, t) #

(<||=) :: MonadState s m => LensLike' ((,) Bool) s Bool -> Bool -> m Bool #

(<||~) :: LensLike ((,) Bool) s t Bool Bool -> Bool -> s -> (Bool, t) #

(??) :: Functor f => f (a -> b) -> a -> f b #

(^#) :: s -> ALens s t a b -> a #

alongside :: LensLike (AlongsideLeft f b') s t a b -> LensLike (AlongsideRight f t) s' t' a' b' -> LensLike f (s, s') (t, t') (a, a') (b, b') #

choosing :: Functor f => LensLike f s t a b -> LensLike f s' t' a b -> LensLike f (Either s s') (Either t t') a b #

cloneIndexedLens :: AnIndexedLens i s t a b -> IndexedLens i s t a b #

cloneLens :: ALens s t a b -> Lens s t a b #

devoid :: Over p f Void Void a b #

fusing :: Functor f => LensLike (Yoneda f) s t a b -> LensLike f s t a b #

ilens :: (s -> (i, a)) -> (s -> b -> t) -> IndexedLens i s t a b #

inside :: Corepresentable p => ALens s t a b -> Lens (p e s) (p e t) (p e a) (p e b) #

iplens :: (s -> a) -> (s -> b -> t) -> IndexPreservingLens s t a b #

lens :: (s -> a) -> (s -> b -> t) -> Lens s t a b #

locus :: IndexedComonadStore p => Lens (p a c s) (p b c s) a b #

overA :: Arrow ar => LensLike (Context a b) s t a b -> ar a b -> ar s t #

storing :: ALens s t a b -> b -> s -> t #

united :: Lens' a () #

ilevels :: Applicative f => Traversing (Indexed i) f s t a b -> IndexedLensLike Int f s t (Level i a) (Level j b) #

levels :: Applicative f => Traversing ((->) :: Type -> Type -> Type) f s t a b -> IndexedLensLike Int f s t (Level () a) (Level () b) #

children :: Plated a => a -> [a] #

composOpFold :: Plated a => b -> (b -> b -> b) -> (a -> b) -> a -> b #

contexts :: Plated a => a -> [Context a a a] #

contextsOf :: ATraversal' a a -> a -> [Context a a a] #

contextsOn :: Plated a => ATraversal s t a a -> s -> [Context a a t] #

contextsOnOf :: ATraversal s t a a -> ATraversal' a a -> s -> [Context a a t] #

cosmos :: Plated a => Fold a a #

cosmosOnOf :: (Applicative f, Contravariant f) => LensLike' f s a -> LensLike' f a a -> LensLike' f s a #

deep :: (Conjoined p, Applicative f, Plated s) => Traversing p f s s a b -> Over p f s s a b #

gplate :: (Generic a, GPlated a (Rep a)) => Traversal' a a #

gplate1 :: (Generic1 f, GPlated1 f (Rep1 f)) => Traversal' (f a) (f a) #

holes :: Plated a => a -> [Pretext ((->) :: Type -> Type -> Type) a a a] #

holesOn :: Conjoined p => Over p (Bazaar p a a) s t a a -> s -> [Pretext p a a t] #

holesOnOf :: Conjoined p => LensLike (Bazaar p r r) s t a b -> Over p (Bazaar p r r) a b r r -> s -> [Pretext p r r t] #

para :: Plated a => (a -> [r] -> r) -> a -> r #

paraOf :: Getting (Endo [a]) a a -> (a -> [r] -> r) -> a -> r #

parts :: Plated a => Lens' a [a] #

rewrite :: Plated a => (a -> Maybe a) -> a -> a #

rewriteM :: (Monad m, Plated a) => (a -> m (Maybe a)) -> a -> m a #

rewriteMOf :: Monad m => LensLike (WrappedMonad m) a b a b -> (b -> m (Maybe a)) -> a -> m b #

rewriteMOn :: (Monad m, Plated a) => LensLike (WrappedMonad m) s t a a -> (a -> m (Maybe a)) -> s -> m t #

rewriteMOnOf :: Monad m => LensLike (WrappedMonad m) s t a b -> LensLike (WrappedMonad m) a b a b -> (b -> m (Maybe a)) -> s -> m t #

rewriteOf :: ASetter a b a b -> (b -> Maybe a) -> a -> b #

rewriteOn :: Plated a => ASetter s t a a -> (a -> Maybe a) -> s -> t #

rewriteOnOf :: ASetter s t a b -> ASetter a b a b -> (b -> Maybe a) -> s -> t #

transform :: Plated a => (a -> a) -> a -> a #

transformM :: (Monad m, Plated a) => (a -> m a) -> a -> m a #

transformMOf :: Monad m => LensLike (WrappedMonad m) a b a b -> (b -> m b) -> a -> m b #

transformMOn :: (Monad m, Plated a) => LensLike (WrappedMonad m) s t a a -> (a -> m a) -> s -> m t #

transformMOnOf :: Monad m => LensLike (WrappedMonad m) s t a b -> LensLike (WrappedMonad m) a b a b -> (b -> m b) -> s -> m t #

transformOf :: ASetter a b a b -> (b -> b) -> a -> b #

transformOn :: Plated a => ASetter s t a a -> (a -> a) -> s -> t #

transformOnOf :: ASetter s t a b -> ASetter a b a b -> (b -> b) -> s -> t #

universe :: Plated a => a -> [a] #

universeOf :: Getting [a] a a -> a -> [a] #

universeOn :: Plated a => Getting [a] s a -> s -> [a] #

universeOnOf :: Getting [a] s a -> Getting [a] a a -> s -> [a] #

_Just :: Prism (Maybe a) (Maybe b) a b #

_Left :: Prism (Either a c) (Either b c) a b #

_Right :: Prism (Either c a) (Either c b) a b #

_Show :: (Read a, Show a) => Prism' String a #

_Void :: Prism s s a Void #

aside :: APrism s t a b -> Prism (e, s) (e, t) (e, a) (e, b) #

below :: Traversable f => APrism' s a -> Prism' (f s) (f a) #

clonePrism :: APrism s t a b -> Prism s t a b #

isn't :: APrism s t a b -> s -> Bool #

matching :: APrism s t a b -> s -> Either t a #

nearly :: a -> (a -> Bool) -> Prism' a () #

only :: Eq a => a -> Prism' a () #

outside :: Representable p => APrism s t a b -> Lens (p t r) (p s r) (p b r) (p a r) #

prism :: (b -> t) -> (s -> Either t a) -> Prism s t a b #

prism' :: (b -> s) -> (s -> Maybe a) -> Prism s s a b #

withPrism :: APrism s t a b -> ((b -> t) -> (s -> Either t a) -> r) -> r #

without :: APrism s t a b -> APrism u v c d -> Prism (Either s u) (Either t v) (Either a c) (Either b d) #

(#) :: AReview t b -> b -> t #

re :: AReview t b -> Getter b t #

reuse :: MonadState b m => AReview t b -> m t #

reuses :: MonadState b m => AReview t b -> (t -> r) -> m r #

review :: MonadReader b m => AReview t b -> m t #

reviews :: MonadReader b m => AReview t b -> (t -> r) -> m r #

un :: (Profunctor p, Bifunctor p, Functor f) => Getting a s a -> Optic' p f a s #

unto :: (Profunctor p, Bifunctor p, Functor f) => (b -> t) -> Optic p f s t a b #

(%=) :: MonadState s m => ASetter s s a b -> (a -> b) -> m () #

(%@=) :: MonadState s m => AnIndexedSetter i s s a b -> (i -> a -> b) -> m () #

(%@~) :: AnIndexedSetter i s t a b -> (i -> a -> b) -> s -> t #

(%~) :: ASetter s t a b -> (a -> b) -> s -> t #

(&&=) :: MonadState s m => ASetter' s Bool -> Bool -> m () #

(&&~) :: ASetter s t Bool Bool -> Bool -> s -> t #

(**=) :: (MonadState s m, Floating a) => ASetter' s a -> a -> m () #

(**~) :: Floating a => ASetter s t a a -> a -> s -> t #

(*=) :: (MonadState s m, Num a) => ASetter' s a -> a -> m () #

(*~) :: Num a => ASetter s t a a -> a -> s -> t #

(+=) :: (MonadState s m, Num a) => ASetter' s a -> a -> m () #

(+~) :: Num a => ASetter s t a a -> a -> s -> t #

(-=) :: (MonadState s m, Num a) => ASetter' s a -> a -> m () #

(-~) :: Num a => ASetter s t a a -> a -> s -> t #

(.=) :: MonadState s m => ASetter s s a b -> b -> m () #

(.@=) :: MonadState s m => AnIndexedSetter i s s a b -> (i -> b) -> m () #

(.@~) :: AnIndexedSetter i s t a b -> (i -> b) -> s -> t #

(.~) :: ASetter s t a b -> b -> s -> t #

(//=) :: (MonadState s m, Fractional a) => ASetter' s a -> a -> m () #

(//~) :: Fractional a => ASetter s t a a -> a -> s -> t #

(<.=) :: MonadState s m => ASetter s s a b -> b -> m b #

(<.~) :: ASetter s t a b -> b -> s -> (b, t) #

(<>=) :: (MonadState s m, Monoid a) => ASetter' s a -> a -> m () #

(<>~) :: Monoid a => ASetter s t a a -> a -> s -> t #

(<?=) :: MonadState s m => ASetter s s a (Maybe b) -> b -> m b #

(<?~) :: ASetter s t a (Maybe b) -> b -> s -> (b, t) #

(<~) :: MonadState s m => ASetter s s a b -> m b -> m () #

(?=) :: MonadState s m => ASetter s s a (Maybe b) -> b -> m () #

(?~) :: ASetter s t a (Maybe b) -> b -> s -> t #

(^=) :: (MonadState s m, Num a, Integral e) => ASetter' s a -> e -> m () #

(^^=) :: (MonadState s m, Fractional a, Integral e) => ASetter' s a -> e -> m () #

(^^~) :: (Fractional a, Integral e) => ASetter s t a a -> e -> s -> t #

(^~) :: (Num a, Integral e) => ASetter s t a a -> e -> s -> t #

argument :: Profunctor p => Setter (p b r) (p a r) a b #

assign :: MonadState s m => ASetter s s a b -> b -> m () #

assignA :: Arrow p => ASetter s t a b -> p s b -> p s t #

censoring :: MonadWriter w m => Setter w w u v -> (u -> v) -> m a -> m a #

cloneSetter :: ASetter s t a b -> Setter s t a b #

contramapped :: Contravariant f => Setter (f b) (f a) a b #

icensoring :: MonadWriter w m => IndexedSetter i w w u v -> (i -> u -> v) -> m a -> m a #

ilocally :: MonadReader s m => AnIndexedSetter i s s a b -> (i -> a -> b) -> m r -> m r #

imapOf :: AnIndexedSetter i s t a b -> (i -> a -> b) -> s -> t #

imodifying :: MonadState s m => AnIndexedSetter i s s a b -> (i -> a -> b) -> m () #

iover :: AnIndexedSetter i s t a b -> (i -> a -> b) -> s -> t #

ipassing :: MonadWriter w m => IndexedSetter i w w u v -> m (a, i -> u -> v) -> m a #

iset :: AnIndexedSetter i s t a b -> (i -> b) -> s -> t #

isets :: ((i -> a -> b) -> s -> t) -> IndexedSetter i s t a b #

lifted :: Monad m => Setter (m a) (m b) a b #

locally :: MonadReader s m => ASetter s s a b -> (a -> b) -> m r -> m r #

mapOf :: ASetter s t a b -> (a -> b) -> s -> t #

mapped :: Functor f => Setter (f a) (f b) a b #

modifying :: MonadState s m => ASetter s s a b -> (a -> b) -> m () #

over :: ASetter s t a b -> (a -> b) -> s -> t #

passing :: MonadWriter w m => Setter w w u v -> m (a, u -> v) -> m a #

scribe :: (MonadWriter t m, Monoid s) => ASetter s t a b -> b -> m () #

set :: ASetter s t a b -> b -> s -> t #

set' :: ASetter' s a -> a -> s -> s #

sets :: (Profunctor p, Profunctor q, Settable f) => (p a b -> q s t) -> Optical p q f s t a b #

setting :: ((a -> b) -> s -> t) -> IndexPreservingSetter s t a b #

(||=) :: MonadState s m => ASetter' s Bool -> Bool -> m () #

(||~) :: ASetter s t Bool Bool -> Bool -> s -> t #

both :: Bitraversable r => Traversal (r a a) (r b b) a b #

both1 :: Bitraversable1 r => Traversal1 (r a a) (r b b) a b #

cloneTraversal :: ATraversal s t a b -> Traversal s t a b #

cloneTraversal1 :: ATraversal1 s t a b -> Traversal1 s t a b #

confusing :: Applicative f => LensLike (Curried (Yoneda f) (Yoneda f)) s t a b -> LensLike f s t a b #

deepOf :: (Conjoined p, Applicative f) => LensLike f s t s t -> Traversing p f s t a b -> Over p f s t a b #

dropping :: (Conjoined p, Applicative f) => Int -> Over p (Indexing f) s t a a -> Over p f s t a a #

elementOf :: Applicative f => LensLike (Indexing f) s t a a -> Int -> IndexedLensLike Int f s t a a #

elementsOf :: Applicative f => LensLike (Indexing f) s t a a -> (Int -> Bool) -> IndexedLensLike Int f s t a a #

failing :: (Conjoined p, Applicative f) => Traversing p f s t a b -> Over p f s t a b -> Over p f s t a b #

failover :: Alternative m => LensLike ((,) Any) s t a b -> (a -> b) -> s -> m t #

forMOf :: LensLike (WrappedMonad m) s t a b -> s -> (a -> m b) -> m t #

forOf :: LensLike f s t a b -> s -> (a -> f b) -> f t #

holes1Of :: Conjoined p => Over p (Bazaar1 p a a) s t a a -> s -> NonEmpty (Pretext p a a t) #

holesOf :: Conjoined p => Over p (Bazaar p a a) s t a a -> s -> [Pretext p a a t] #

ifailover :: Alternative m => Over (Indexed i) ((,) Any) s t a b -> (i -> a -> b) -> s -> m t #

iforMOf :: (Indexed i a (WrappedMonad m b) -> s -> WrappedMonad m t) -> s -> (i -> a -> m b) -> m t #

iforOf :: (Indexed i a (f b) -> s -> f t) -> s -> (i -> a -> f b) -> f t #

ignored :: Applicative f => pafb -> s -> f s #

iloci :: IndexedTraversal i (Bazaar (Indexed i) a c s) (Bazaar (Indexed i) b c s) a b #

imapAccumLOf :: Over (Indexed i) (State acc) s t a b -> (i -> acc -> a -> (acc, b)) -> acc -> s -> (acc, t) #

imapAccumROf :: Over (Indexed i) (Backwards (State acc)) s t a b -> (i -> acc -> a -> (acc, b)) -> acc -> s -> (acc, t) #

imapMOf :: Over (Indexed i) (WrappedMonad m) s t a b -> (i -> a -> m b) -> s -> m t #

ipartsOf :: (Indexable [i] p, Functor f) => Traversing (Indexed i) f s t a a -> Over p f s t [a] [a] #

ipartsOf' :: (Indexable [i] p, Functor f) => Over (Indexed i) (Bazaar' (Indexed i) a) s t a a -> Over p f s t [a] [a] #

itraverseOf :: (Indexed i a (f b) -> s -> f t) -> (i -> a -> f b) -> s -> f t #

iunsafePartsOf :: (Indexable [i] p, Functor f) => Traversing (Indexed i) f s t a b -> Over p f s t [a] [b] #

iunsafePartsOf' :: Over (Indexed i) (Bazaar (Indexed i) a b) s t a b -> IndexedLens [i] s t [a] [b] #

loci :: Traversal (Bazaar ((->) :: Type -> Type -> Type) a c s) (Bazaar ((->) :: Type -> Type -> Type) b c s) a b #

mapAccumLOf :: LensLike (State acc) s t a b -> (acc -> a -> (acc, b)) -> acc -> s -> (acc, t) #

mapAccumROf :: LensLike (Backwards (State acc)) s t a b -> (acc -> a -> (acc, b)) -> acc -> s -> (acc, t) #

mapMOf :: LensLike (WrappedMonad m) s t a b -> (a -> m b) -> s -> m t #

partsOf :: Functor f => Traversing ((->) :: Type -> Type -> Type) f s t a a -> LensLike f s t [a] [a] #

partsOf' :: ATraversal s t a a -> Lens s t [a] [a] #

scanl1Of :: LensLike (State (Maybe a)) s t a a -> (a -> a -> a) -> s -> t #

scanr1Of :: LensLike (Backwards (State (Maybe a))) s t a a -> (a -> a -> a) -> s -> t #

sequenceAOf :: LensLike f s t (f b) b -> s -> f t #

sequenceByOf :: Traversal s t (f b) b -> (forall x. x -> f x) -> (forall x y. f (x -> y) -> f x -> f y) -> s -> f t #

sequenceOf :: LensLike (WrappedMonad m) s t (m b) b -> s -> m t #

singular :: (HasCallStack, Conjoined p, Functor f) => Traversing p f s t a a -> Over p f s t a a #

taking :: (Conjoined p, Applicative f) => Int -> Traversing p f s t a a -> Over p f s t a a #

transposeOf :: LensLike ZipList s t [a] a -> s -> [t] #

traverseByOf :: Traversal s t a b -> (forall x. x -> f x) -> (forall x y. f (x -> y) -> f x -> f y) -> (a -> f b) -> s -> f t #

traverseOf :: LensLike f s t a b -> (a -> f b) -> s -> f t #

traversed :: Traversable f => IndexedTraversal Int (f a) (f b) a b #

unsafePartsOf :: Functor f => Traversing ((->) :: Type -> Type -> Type) f s t a b -> LensLike f s t [a] [b] #

unsafePartsOf' :: ATraversal s t a b -> Lens s t [a] [b] #

unsafeSingular :: (HasCallStack, Conjoined p, Functor f) => Traversing p f s t a b -> Over p f s t a b #

_1' :: Field1 s t a b => Lens s t a b #

_10' :: Field10 s t a b => Lens s t a b #

_11' :: Field11 s t a b => Lens s t a b #

_12' :: Field12 s t a b => Lens s t a b #

_13' :: Field13 s t a b => Lens s t a b #

_14' :: Field14 s t a b => Lens s t a b #

_15' :: Field15 s t a b => Lens s t a b #

_16' :: Field16 s t a b => Lens s t a b #

_17' :: Field17 s t a b => Lens s t a b #

_18' :: Field18 s t a b => Lens s t a b #

_19' :: Field19 s t a b => Lens s t a b #

_2' :: Field2 s t a b => Lens s t a b #

_3' :: Field3 s t a b => Lens s t a b #

_4' :: Field4 s t a b => Lens s t a b #

_5' :: Field5 s t a b => Lens s t a b #

_6' :: Field6 s t a b => Lens s t a b #

_7' :: Field7 s t a b => Lens s t a b #

_8' :: Field8 s t a b => Lens s t a b #

_9' :: Field9 s t a b => Lens s t a b #

pattern Unwrapped :: forall t. Rewrapped t t => t -> Unwrapped t #

pattern Wrapped :: forall s. Rewrapped s s => Unwrapped s -> s #

_GWrapped' :: (Generic s, D1 d (C1 c (S1 s' (Rec0 a))) ~ Rep s, Unwrapped s ~ GUnwrapped (Rep s)) => Iso' s (Unwrapped s) #

_Unwrapping :: Rewrapping s t => (Unwrapped s -> s) -> Iso (Unwrapped t) (Unwrapped s) t s #

_Unwrapping' :: Wrapped s => (Unwrapped s -> s) -> Iso' (Unwrapped s) s #

_Wrapped :: Rewrapping s t => Iso s t (Unwrapped s) (Unwrapped t) #

_Wrapping :: Rewrapping s t => (Unwrapped s -> s) -> Iso s t (Unwrapped s) (Unwrapped t) #

_Wrapping' :: Wrapped s => (Unwrapped s -> s) -> Iso' s (Unwrapped s) #

ala :: (Functor f, Rewrapping s t) => (Unwrapped s -> s) -> ((Unwrapped t -> t) -> f s) -> f (Unwrapped s) #

alaf :: (Functor f, Functor g, Rewrapping s t) => (Unwrapped s -> s) -> (f t -> g s) -> f (Unwrapped t) -> g (Unwrapped s) #

op :: Wrapped s => (Unwrapped s -> s) -> s -> Unwrapped s #

data LinearAxisParams a #

Constructors

LinearAxisParams 

Fields

Instances
(Show a, RealFloat a) => Default (LinearAxisParams a) 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

Methods

def :: LinearAxisParams a #

data LogAxisParams a #

Constructors

LogAxisParams 

Fields

Instances
(Show a, RealFloat a) => Default (LogAxisParams a) 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

Methods

def :: LogAxisParams a #

newtype LogValue #

Constructors

LogValue Double 
Instances
Eq LogValue 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

Floating LogValue 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

Fractional LogValue 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

Num LogValue 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

Ord LogValue 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

Real LogValue 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

RealFloat LogValue 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

RealFrac LogValue 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

Methods

properFraction :: Integral b => LogValue -> (b, LogValue) #

truncate :: Integral b => LogValue -> b #

round :: Integral b => LogValue -> b #

ceiling :: Integral b => LogValue -> b #

floor :: Integral b => LogValue -> b #

Show LogValue 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

PlotValue LogValue 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

newtype Percent #

Constructors

Percent 

Fields

Instances
Eq Percent 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

Methods

(==) :: Percent -> Percent -> Bool #

(/=) :: Percent -> Percent -> Bool #

Floating Percent 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

Fractional Percent 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

Num Percent 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

Ord Percent 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

Real Percent 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

RealFloat Percent 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

RealFrac Percent 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

Methods

properFraction :: Integral b => Percent -> (b, Percent) #

truncate :: Integral b => Percent -> b #

round :: Integral b => Percent -> b #

ceiling :: Integral b => Percent -> b #

floor :: Integral b => Percent -> b #

Show Percent 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

PlotValue Percent 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Floating

newtype PlotIndex #

Constructors

PlotIndex 

Fields

Instances
Enum PlotIndex 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Indexed

Eq PlotIndex 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Indexed

Integral PlotIndex 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Indexed

Num PlotIndex 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Indexed

Ord PlotIndex 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Indexed

Real PlotIndex 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Indexed

Show PlotIndex 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Indexed

PlotValue PlotIndex 
Instance details

Defined in Graphics.Rendering.Chart.Axis.Indexed

type TimeSeq = UTCTime -> ([UTCTime], [UTCTime]) #

data AxisData x #

Constructors

AxisData 

type AxisFn x = [x] -> AxisData x #

_axis_grid_style :: AxisStyle -> LineStyle #

_axis_label_gap :: AxisStyle -> Double #

_axis_label_style :: AxisStyle -> FontStyle #

_axis_line_style :: AxisStyle -> LineStyle #

data AxisT x #

Constructors

AxisT RectEdge AxisStyle Bool (AxisData x) 

data Limit a #

Constructors

LMin 
LValue a 
LMax 
Instances
Show a => Show (Limit a) 
Instance details

Defined in Graphics.Rendering.Chart.Geometry

Methods

showsPrec :: Int -> Limit a -> ShowS #

show :: Limit a -> String #

showList :: [Limit a] -> ShowS #

data Matrix #

Constructors

Matrix 

Fields

Instances
Num Matrix 
Instance details

Defined in Graphics.Rendering.Chart.Geometry

Show Matrix 
Instance details

Defined in Graphics.Rendering.Chart.Geometry

data Point #

Constructors

Point 

Fields

Instances
Show Point 
Instance details

Defined in Graphics.Rendering.Chart.Geometry

Methods

showsPrec :: Int -> Point -> ShowS #

show :: Point -> String #

showList :: [Point] -> ShowS #

type PointMapFn x y = (Limit x, Limit y) -> Point #

type Range = (Double, Double) #

data Rect #

Constructors

Rect Point Point 
Instances
Show Rect 
Instance details

Defined in Graphics.Rendering.Chart.Geometry

Methods

showsPrec :: Int -> Rect -> ShowS #

show :: Rect -> String #

showList :: [Rect] -> ShowS #

data RectEdge #

Constructors

E_Top 
E_Bottom 
E_Left 
E_Right 

v_x :: Vector -> Double #

v_y :: Vector -> Double #

data LayoutAxis x #

Instances
PlotValue t => Default (LayoutAxis t) 
Instance details

Defined in Graphics.Rendering.Chart.Layout

Methods

def :: LayoutAxis t #

type MAxisFn t = [t] -> Maybe (AxisData t) #

data StackedLayout x where #

Constructors

StackedLayout :: forall x y. Ord y => Layout x y -> StackedLayout x 
StackedLayoutLR :: forall x yl yr. (Ord yl, Ord yr) => LayoutLR x yl yr -> StackedLayout x 

data LegendOrientation #

Constructors

LORows Int 
LOCols Int 

data AreaSpots4D z t x y #

Instances
(PlotValue z, PlotValue t, Show t) => ToPlot (AreaSpots4D z t) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.AreaSpots

Methods

toPlot :: AreaSpots4D z t x y -> Plot x y #

Default (AreaSpots4D z t x y) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.AreaSpots

Methods

def :: AreaSpots4D z t x y #

class PlotValue a => BarsPlotValue a where #

Methods

barsReference :: a #

barsAdd :: a -> a -> a #

Instances
BarsPlotValue Double 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Bars

BarsPlotValue Int 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Bars

Methods

barsReference :: Int #

barsAdd :: Int -> Int -> Int #

data Candle x y #

Constructors

Candle 

Fields

Instances
(Show x, Show y) => Show (Candle x y) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Candle

Methods

showsPrec :: Int -> Candle x y -> ShowS #

show :: Candle x y -> String #

showList :: [Candle x y] -> ShowS #

data ErrPoint x y #

Constructors

ErrPoint 

Fields

Instances
(Show x, Show y) => Show (ErrPoint x y) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.ErrBars

Methods

showsPrec :: Int -> ErrPoint x y -> ShowS #

show :: ErrPoint x y -> String #

showList :: [ErrPoint x y] -> ShowS #

data ErrValue x #

Constructors

ErrValue 

Fields

Instances
Show x => Show (ErrValue x) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.ErrBars

Methods

showsPrec :: Int -> ErrValue x -> ShowS #

show :: ErrValue x -> String #

showList :: [ErrValue x] -> ShowS #

data PlotHidden x y #

Constructors

PlotHidden 
Instances
ToPlot PlotHidden 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Hidden

Methods

toPlot :: PlotHidden x y -> Plot x y #

data PlotLines x y #

Instances
ToPlot PlotLines 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Lines

Methods

toPlot :: PlotLines x y -> Plot x y #

Default (PlotLines x y) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Lines

Methods

def :: PlotLines x y #

data PieItem #

Instances
Default PieItem 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Pie

Methods

def :: PieItem #

data PlotPoints x y #

Instances
ToPlot PlotPoints 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Points

Methods

toPlot :: PlotPoints x y -> Plot x y #

Default (PlotPoints x y) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Points

Methods

def :: PlotPoints x y #

_plot_all_points :: Plot x y -> ([x], [y]) #

_plot_legend :: Plot x y -> [(String, Rect -> BackendProgram ())] #

_plot_render :: Plot x y -> PointMapFn x y -> BackendProgram () #

class ToPlot (a :: Type -> Type -> Type) where #

Methods

toPlot :: a x y -> Plot x y #

Instances
ToPlot PlotAnnotation 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Annotation

Methods

toPlot :: PlotAnnotation x y -> Plot x y #

ToPlot PlotCandle 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Candle

Methods

toPlot :: PlotCandle x y -> Plot x y #

ToPlot PlotErrBars 
Instance details

Defined in Graphics.Rendering.Chart.Plot.ErrBars

Methods

toPlot :: PlotErrBars x y -> Plot x y #

ToPlot PlotFillBetween 
Instance details

Defined in Graphics.Rendering.Chart.Plot.FillBetween

Methods

toPlot :: PlotFillBetween x y -> Plot x y #

ToPlot PlotHidden 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Hidden

Methods

toPlot :: PlotHidden x y -> Plot x y #

ToPlot PlotLines 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Lines

Methods

toPlot :: PlotLines x y -> Plot x y #

ToPlot PlotPoints 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Points

Methods

toPlot :: PlotPoints x y -> Plot x y #

ToPlot Plot 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Types

Methods

toPlot :: Plot x y -> Plot x y #

PlotValue z => ToPlot (AreaSpots z) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.AreaSpots

Methods

toPlot :: AreaSpots z x y -> Plot x y #

(PlotValue z, PlotValue t, Show t) => ToPlot (AreaSpots4D z t) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.AreaSpots

Methods

toPlot :: AreaSpots4D z t x y -> Plot x y #

data PlotVectors x y #

Constructors

PlotVectors 
Instances
Default (PlotVectors x y) 
Instance details

Defined in Graphics.Rendering.Chart.Plot.Vectors

Methods

def :: PlotVectors x y #

data CState #

Instances
Default CState 
Instance details

Defined in Graphics.Rendering.Chart.State

Methods

def :: CState #

(Default a, ToRenderable a) => ToRenderable (EC a b) 
Instance details

Defined in Graphics.Rendering.Chart.State

Methods

toRenderable :: EC a b -> Renderable () #

class Ixed m => At m where #

Methods

at :: Index m -> Lens' m (Maybe (IxValue m)) #

Instances
At IntSet 
Instance details

Defined in Control.Lens.At

At ColourMap 
Instance details

Defined in Plots.Style

At (Maybe a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (Maybe a) -> Lens' (Maybe a) (Maybe (IxValue (Maybe a))) #

At (IntMap a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (IntMap a) -> Lens' (IntMap a) (Maybe (IxValue (IntMap a))) #

Ord k => At (Set k) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (Set k) -> Lens' (Set k) (Maybe (IxValue (Set k))) #

(Eq k, Hashable k) => At (HashSet k) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (HashSet k) -> Lens' (HashSet k) (Maybe (IxValue (HashSet k))) #

(Eq k, Hashable k) => At (HashMap k a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (HashMap k a) -> Lens' (HashMap k a) (Maybe (IxValue (HashMap k a))) #

Ord k => At (Map k a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (Map k a) -> Lens' (Map k a) (Maybe (IxValue (Map k a))) #

At (Style v n) 
Instance details

Defined in Diagrams.Core.Style

Methods

at :: Index (Style v n) -> Lens' (Style v n) (Maybe (IxValue (Style v n))) #

class Contains m where #

Methods

contains :: Index m -> Lens' m Bool #

Instances
Contains IntSet 
Instance details

Defined in Control.Lens.At

Ord a => Contains (Set a) 
Instance details

Defined in Control.Lens.At

Methods

contains :: Index (Set a) -> Lens' (Set a) Bool #

(Eq a, Hashable a) => Contains (HashSet a) 
Instance details

Defined in Control.Lens.At

Methods

contains :: Index (HashSet a) -> Lens' (HashSet a) Bool #

type family Index s :: Type #

Instances
type Index ByteString 
Instance details

Defined in Control.Lens.At

type Index ByteString 
Instance details

Defined in Control.Lens.At

type Index Text 
Instance details

Defined in Control.Lens.At

type Index Text = Int
type Index Text 
Instance details

Defined in Control.Lens.At

type Index IntSet 
Instance details

Defined in Control.Lens.At

type Index ColourMap 
Instance details

Defined in Plots.Style

type Index [a] 
Instance details

Defined in Control.Lens.At

type Index [a] = Int
type Index (Maybe a) 
Instance details

Defined in Control.Lens.At

type Index (Maybe a) = ()
type Index (Vector a) 
Instance details

Defined in Control.Lens.At

type Index (Vector a) = Int
type Index (Complex a) 
Instance details

Defined in Control.Lens.At

type Index (Complex a) = Int
type Index (Identity a) 
Instance details

Defined in Control.Lens.At

type Index (Identity a) = ()
type Index (NonEmpty a) 
Instance details

Defined in Control.Lens.At

type Index (NonEmpty a) = Int
type Index (IntMap a) 
Instance details

Defined in Control.Lens.At

type Index (IntMap a) = Int
type Index (Tree a) 
Instance details

Defined in Control.Lens.At

type Index (Tree a) = [Int]
type Index (Seq a) 
Instance details

Defined in Control.Lens.At

type Index (Seq a) = Int
type Index (Set a) 
Instance details

Defined in Control.Lens.At

type Index (Set a) = a
type Index (HashSet a) 
Instance details

Defined in Control.Lens.At

type Index (HashSet a) = a
type Index (Vector a) 
Instance details

Defined in Control.Lens.At

type Index (Vector a) = Int
type Index (Vector a) 
Instance details

Defined in Control.Lens.At

type Index (Vector a) = Int
type Index (Vector a) 
Instance details

Defined in Control.Lens.At

type Index (Vector a) = Int
type Index (V2 a) 
Instance details

Defined in Linear.V2

type Index (V2 a) = E V2
type Index (V3 a) 
Instance details

Defined in Linear.V3

type Index (V3 a) = E V3
type Index (V1 a) 
Instance details

Defined in Linear.V1

type Index (V1 a) = E V1
type Index (Plucker a) 
Instance details

Defined in Linear.Plucker

type Index (Plucker a) = E Plucker
type Index (Quaternion a) 
Instance details

Defined in Linear.Quaternion

type Index (Quaternion a) = E Quaternion
type Index (V0 a) 
Instance details

Defined in Linear.V0

type Index (V0 a) = E V0
type Index (V4 a) 
Instance details

Defined in Linear.V4

type Index (V4 a) = E V4
type Index (e -> a) 
Instance details

Defined in Control.Lens.At

type Index (e -> a) = e
type Index (a, b) 
Instance details

Defined in Control.Lens.At

type Index (a, b) = Int
type Index (HashMap k a) 
Instance details

Defined in Control.Lens.At

type Index (HashMap k a) = k
type Index (Map k a) 
Instance details

Defined in Control.Lens.At

type Index (Map k a) = k
type Index (UArray i e) 
Instance details

Defined in Control.Lens.At

type Index (UArray i e) = i
type Index (Array i e) 
Instance details

Defined in Control.Lens.At

type Index (Array i e) = i
type Index (Style v n) 
Instance details

Defined in Diagrams.Core.Style

type Index (Style v n) = TypeRep
type Index (Point f a) 
Instance details

Defined in Linear.Affine

type Index (Point f a) = Index (f a)
type Index (a, b, c) 
Instance details

Defined in Control.Lens.At

type Index (a, b, c) = Int
type Index (V n a) 
Instance details

Defined in Linear.V

type Index (V n a) = Int
type Index (a, b, c, d) 
Instance details

Defined in Control.Lens.At

type Index (a, b, c, d) = Int
type Index (a, b, c, d, e) 
Instance details

Defined in Control.Lens.At

type Index (a, b, c, d, e) = Int
type Index (a, b, c, d, e, f) 
Instance details

Defined in Control.Lens.At

type Index (a, b, c, d, e, f) = Int
type Index (a, b, c, d, e, f, g) 
Instance details

Defined in Control.Lens.At

type Index (a, b, c, d, e, f, g) = Int
type Index (a, b, c, d, e, f, g, h) 
Instance details

Defined in Control.Lens.At

type Index (a, b, c, d, e, f, g, h) = Int
type Index (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in Control.Lens.At

type Index (a, b, c, d, e, f, g, h, i) = Int

type family IxValue m :: Type #

Instances
type IxValue ByteString 
Instance details

Defined in Control.Lens.At

type IxValue ByteString 
Instance details

Defined in Control.Lens.At

type IxValue Text 
Instance details

Defined in Control.Lens.At

type IxValue Text 
Instance details

Defined in Control.Lens.At

type IxValue IntSet 
Instance details

Defined in Control.Lens.At

type IxValue IntSet = ()
type IxValue ColourMap 
Instance details

Defined in Plots.Style

type IxValue [a] 
Instance details

Defined in Control.Lens.At

type IxValue [a] = a
type IxValue (Maybe a) 
Instance details

Defined in Control.Lens.At

type IxValue (Maybe a) = a
type IxValue (Vector a) 
Instance details

Defined in Control.Lens.At

type IxValue (Vector a) = a
type IxValue (Identity a) 
Instance details

Defined in Control.Lens.At

type IxValue (Identity a) = a
type IxValue (NonEmpty a) 
Instance details

Defined in Control.Lens.At

type IxValue (NonEmpty a) = a
type IxValue (IntMap a) 
Instance details

Defined in Control.Lens.At

type IxValue (IntMap a) = a
type IxValue (Tree a) 
Instance details

Defined in Control.Lens.At

type IxValue (Tree a) = a
type IxValue (Seq a) 
Instance details

Defined in Control.Lens.At

type IxValue (Seq a) = a
type IxValue (Set k) 
Instance details

Defined in Control.Lens.At

type IxValue (Set k) = ()
type IxValue (HashSet k) 
Instance details

Defined in Control.Lens.At

type IxValue (HashSet k) = ()
type IxValue (Vector a) 
Instance details

Defined in Control.Lens.At

type IxValue (Vector a) = a
type IxValue (Vector a) 
Instance details

Defined in Control.Lens.At

type IxValue (Vector a) = a
type IxValue (Vector a) 
Instance details

Defined in Control.Lens.At

type IxValue (Vector a) = a
type IxValue (V2 a) 
Instance details

Defined in Linear.V2

type IxValue (V2 a) = a
type IxValue (V3 a) 
Instance details

Defined in Linear.V3

type IxValue (V3 a) = a
type IxValue (V1 a) 
Instance details

Defined in Linear.V1

type IxValue (V1 a) = a
type IxValue (Plucker a) 
Instance details

Defined in Linear.Plucker

type IxValue (Plucker a) = a
type IxValue (Quaternion a) 
Instance details

Defined in Linear.Quaternion

type IxValue (Quaternion a) = a
type IxValue (V0 a) 
Instance details

Defined in Linear.V0

type IxValue (V0 a) = a
type IxValue (V4 a) 
Instance details

Defined in Linear.V4

type IxValue (V4 a) = a
type IxValue (e -> a) 
Instance details

Defined in Control.Lens.At

type IxValue (e -> a) = a
type IxValue (a, a2) 
Instance details

Defined in Control.Lens.At

type IxValue (a, a2) = a
type IxValue (HashMap k a) 
Instance details

Defined in Control.Lens.At

type IxValue (HashMap k a) = a
type IxValue (Map k a) 
Instance details

Defined in Control.Lens.At

type IxValue (Map k a) = a
type IxValue (UArray i e) 
Instance details

Defined in Control.Lens.At

type IxValue (UArray i e) = e
type IxValue (Array i e) 
Instance details

Defined in Control.Lens.At

type IxValue (Array i e) = e
type IxValue (Style v n) 
Instance details

Defined in Diagrams.Core.Style

type IxValue (Style v n) = Attribute v n
type IxValue (Point f a) 
Instance details

Defined in Linear.Affine

type IxValue (Point f a) = IxValue (f a)
type IxValue (a, a2, a3) 
Instance details

Defined in Control.Lens.At

type IxValue (a, a2, a3) = a
type IxValue (V n a) 
Instance details

Defined in Linear.V

type IxValue (V n a) = a
type IxValue (a, a2, a3, a4) 
Instance details

Defined in Control.Lens.At

type IxValue (a, a2, a3, a4) = a
type IxValue (a, a2, a3, a4, a5) 
Instance details

Defined in Control.Lens.At

type IxValue (a, a2, a3, a4, a5) = a
type IxValue (a, a2, a3, a4, a5, a6) 
Instance details

Defined in Control.Lens.At

type IxValue (a, a2, a3, a4, a5, a6) = a
type IxValue (a, a2, a3, a4, a5, a6, a7) 
Instance details

Defined in Control.Lens.At

type IxValue (a, a2, a3, a4, a5, a6, a7) = a
type IxValue (a, a2, a3, a4, a5, a6, a7, a8) 
Instance details

Defined in Control.Lens.At

type IxValue (a, a2, a3, a4, a5, a6, a7, a8) = a
type IxValue (a, a2, a3, a4, a5, a6, a7, a8, a9) 
Instance details

Defined in Control.Lens.At

type IxValue (a, a2, a3, a4, a5, a6, a7, a8, a9) = a

class Ixed m where #

Minimal complete definition

Nothing

Methods

ix :: Index m -> Traversal' m (IxValue m) #

Instances
Ixed ByteString 
Instance details

Defined in Control.Lens.At

Ixed ByteString 
Instance details

Defined in Control.Lens.At

Ixed Text 
Instance details

Defined in Control.Lens.At

Ixed Text 
Instance details

Defined in Control.Lens.At

Ixed IntSet 
Instance details

Defined in Control.Lens.At

Ixed ColourMap 
Instance details

Defined in Plots.Style

Ixed [a] 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index [a] -> Traversal' [a] (IxValue [a]) #

Ixed (Maybe a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Maybe a) -> Traversal' (Maybe a) (IxValue (Maybe a)) #

Storable a => Ixed (Vector a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Vector a) -> Traversal' (Vector a) (IxValue (Vector a)) #

Ixed (Identity a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Identity a) -> Traversal' (Identity a) (IxValue (Identity a)) #

Ixed (NonEmpty a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (NonEmpty a) -> Traversal' (NonEmpty a) (IxValue (NonEmpty a)) #

Ixed (IntMap a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (IntMap a) -> Traversal' (IntMap a) (IxValue (IntMap a)) #

Ixed (Tree a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Tree a) -> Traversal' (Tree a) (IxValue (Tree a)) #

Ixed (Seq a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Seq a) -> Traversal' (Seq a) (IxValue (Seq a)) #

Ord k => Ixed (Set k) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Set k) -> Traversal' (Set k) (IxValue (Set k)) #

(Eq k, Hashable k) => Ixed (HashSet k) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (HashSet k) -> Traversal' (HashSet k) (IxValue (HashSet k)) #

Unbox a => Ixed (Vector a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Vector a) -> Traversal' (Vector a) (IxValue (Vector a)) #

Prim a => Ixed (Vector a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Vector a) -> Traversal' (Vector a) (IxValue (Vector a)) #

Ixed (Vector a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Vector a) -> Traversal' (Vector a) (IxValue (Vector a)) #

Ixed (V2 a) 
Instance details

Defined in Linear.V2

Methods

ix :: Index (V2 a) -> Traversal' (V2 a) (IxValue (V2 a)) #

Ixed (V3 a) 
Instance details

Defined in Linear.V3

Methods

ix :: Index (V3 a) -> Traversal' (V3 a) (IxValue (V3 a)) #

Ixed (V1 a) 
Instance details

Defined in Linear.V1

Methods

ix :: Index (V1 a) -> Traversal' (V1 a) (IxValue (V1 a)) #

Ixed (Plucker a) 
Instance details

Defined in Linear.Plucker

Methods

ix :: Index (Plucker a) -> Traversal' (Plucker a) (IxValue (Plucker a)) #

Ixed (Quaternion a) 
Instance details

Defined in Linear.Quaternion

Methods

ix :: Index (Quaternion a) -> Traversal' (Quaternion a) (IxValue (Quaternion a)) #

Ixed (V0 a) 
Instance details

Defined in Linear.V0

Methods

ix :: Index (V0 a) -> Traversal' (V0 a) (IxValue (V0 a)) #

Ixed (V4 a) 
Instance details

Defined in Linear.V4

Methods

ix :: Index (V4 a) -> Traversal' (V4 a) (IxValue (V4 a)) #

Eq e => Ixed (e -> a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (e -> a) -> Traversal' (e -> a) (IxValue (e -> a)) #

a ~ a2 => Ixed (a, a2) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (a, a2) -> Traversal' (a, a2) (IxValue (a, a2)) #

(Eq k, Hashable k) => Ixed (HashMap k a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (HashMap k a) -> Traversal' (HashMap k a) (IxValue (HashMap k a)) #

Ord k => Ixed (Map k a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Map k a) -> Traversal' (Map k a) (IxValue (Map k a)) #

(IArray UArray e, Ix i) => Ixed (UArray i e) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (UArray i e) -> Traversal' (UArray i e) (IxValue (UArray i e)) #

Ix i => Ixed (Array i e) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Array i e) -> Traversal' (Array i e) (IxValue (Array i e)) #

Ixed (Style v n) 
Instance details

Defined in Diagrams.Core.Style

Methods

ix :: Index (Style v n) -> Traversal' (Style v n) (IxValue (Style v n)) #

Ixed (f a) => Ixed (Point f a) 
Instance details

Defined in Linear.Affine

Methods

ix :: Index (Point f a) -> Traversal' (Point f a) (IxValue (Point f a)) #

(a ~ a2, a ~ a3) => Ixed (a, a2, a3) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (a, a2, a3) -> Traversal' (a, a2, a3) (IxValue (a, a2, a3)) #

Ixed (V n a) 
Instance details

Defined in Linear.V

Methods

ix :: Index (V n a) -> Traversal' (V n a) (IxValue (V n a)) #

(a ~ a2, a ~ a3, a ~ a4) => Ixed (a, a2, a3, a4) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (a, a2, a3, a4) -> Traversal' (a, a2, a3, a4) (IxValue (a, a2, a3, a4)) #

(a ~ a2, a ~ a3, a ~ a4, a ~ a5) => Ixed (a, a2, a3, a4, a5) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (a, a2, a3, a4, a5) -> Traversal' (a, a2, a3, a4, a5) (IxValue (a, a2, a3, a4, a5)) #

(a ~ a2, a ~ a3, a ~ a4, a ~ a5, a ~ a6) => Ixed (a, a2, a3, a4, a5, a6) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (a, a2, a3, a4, a5, a6) -> Traversal' (a, a2, a3, a4, a5, a6) (IxValue (a, a2, a3, a4, a5, a6)) #

(a ~ a2, a ~ a3, a ~ a4, a ~ a5, a ~ a6, a ~ a7) => Ixed (a, a2, a3, a4, a5, a6, a7) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (a, a2, a3, a4, a5, a6, a7) -> Traversal' (a, a2, a3, a4, a5, a6, a7) (IxValue (a, a2, a3, a4, a5, a6, a7)) #

(a ~ a2, a ~ a3, a ~ a4, a ~ a5, a ~ a6, a ~ a7, a ~ a8) => Ixed (a, a2, a3, a4, a5, a6, a7, a8) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (a, a2, a3, a4, a5, a6, a7, a8) -> Traversal' (a, a2, a3, a4, a5, a6, a7, a8) (IxValue (a, a2, a3, a4, a5, a6, a7, a8)) #

(a ~ a2, a ~ a3, a ~ a4, a ~ a5, a ~ a6, a ~ a7, a ~ a8, a ~ a9) => Ixed (a, a2, a3, a4, a5, a6, a7, a8, a9) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (a, a2, a3, a4, a5, a6, a7, a8, a9) -> Traversal' (a, a2, a3, a4, a5, a6, a7, a8, a9) (IxValue (a, a2, a3, a4, a5, a6, a7, a8, a9)) #

type AnEquality (s :: k1) (t :: k2) (a :: k1) (b :: k2) = Identical a (Proxy b) a (Proxy b) -> Identical a (Proxy b) s (Proxy t) #

type AnEquality' (s :: k2) (a :: k2) = AnEquality s s a a #

data Identical (a :: k) (b :: k1) (s :: k) (t :: k1) :: forall k k1. k -> k1 -> k -> k1 -> Type where #

Constructors

Identical :: forall k k1 (a :: k) (b :: k1) (s :: k) (t :: k1). Identical a b a b 

type Accessing (p :: Type -> Type -> Type) m s a = p a (Const m a) -> s -> Const m s #

type Getting r s a = (a -> Const r a) -> s -> Const r s #

type IndexedGetting i m s a = Indexed i a (Const m a) -> s -> Const m s #

class Foldable f => FoldableWithIndex i (f :: Type -> Type) | f -> i where #

Minimal complete definition

Nothing

Methods

ifoldMap :: Monoid m => (i -> a -> m) -> f a -> m #

ifolded :: IndexedFold i (f a) a #

ifoldr :: (i -> a -> b -> b) -> b -> f a -> b #

ifoldl :: (i -> b -> a -> b) -> b -> f a -> b #

ifoldr' :: (i -> a -> b -> b) -> b -> f a -> b #

ifoldl' :: (i -> b -> a -> b) -> b -> f a -> b #

Instances
FoldableWithIndex Int [] 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> [a] -> m #

ifolded :: IndexedFold Int [a] a #

ifoldr :: (Int -> a -> b -> b) -> b -> [a] -> b #

ifoldl :: (Int -> b -> a -> b) -> b -> [a] -> b #

ifoldr' :: (Int -> a -> b -> b) -> b -> [a] -> b #

ifoldl' :: (Int -> b -> a -> b) -> b -> [a] -> b #

FoldableWithIndex Int ZipList 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> ZipList a -> m #

ifolded :: IndexedFold Int (ZipList a) a #

ifoldr :: (Int -> a -> b -> b) -> b -> ZipList a -> b #

ifoldl :: (Int -> b -> a -> b) -> b -> ZipList a -> b #

ifoldr' :: (Int -> a -> b -> b) -> b -> ZipList a -> b #

ifoldl' :: (Int -> b -> a -> b) -> b -> ZipList a -> b #

FoldableWithIndex Int NonEmpty 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> NonEmpty a -> m #

ifolded :: IndexedFold Int (NonEmpty a) a #

ifoldr :: (Int -> a -> b -> b) -> b -> NonEmpty a -> b #

ifoldl :: (Int -> b -> a -> b) -> b -> NonEmpty a -> b #

ifoldr' :: (Int -> a -> b -> b) -> b -> NonEmpty a -> b #

ifoldl' :: (Int -> b -> a -> b) -> b -> NonEmpty a -> b #

FoldableWithIndex Int IntMap 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> IntMap a -> m #

ifolded :: IndexedFold Int (IntMap a) a #

ifoldr :: (Int -> a -> b -> b) -> b -> IntMap a -> b #

ifoldl :: (Int -> b -> a -> b) -> b -> IntMap a -> b #

ifoldr' :: (Int -> a -> b -> b) -> b -> IntMap a -> b #

ifoldl' :: (Int -> b -> a -> b) -> b -> IntMap a -> b #

FoldableWithIndex Int Seq 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> Seq a -> m #

ifolded :: IndexedFold Int (Seq a) a #

ifoldr :: (Int -> a -> b -> b) -> b -> Seq a -> b #

ifoldl :: (Int -> b -> a -> b) -> b -> Seq a -> b #

ifoldr' :: (Int -> a -> b -> b) -> b -> Seq a -> b #

ifoldl' :: (Int -> b -> a -> b) -> b -> Seq a -> b #

FoldableWithIndex Int Vector 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> Vector a -> m #

ifolded :: IndexedFold Int (Vector a) a #

ifoldr :: (Int -> a -> b -> b) -> b -> Vector a -> b #

ifoldl :: (Int -> b -> a -> b) -> b -> Vector a -> b #

ifoldr' :: (Int -> a -> b -> b) -> b -> Vector a -> b #

ifoldl' :: (Int -> b -> a -> b) -> b -> Vector a -> b #

FoldableWithIndex () Maybe 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (() -> a -> m) -> Maybe a -> m #

ifolded :: IndexedFold () (Maybe a) a #

ifoldr :: (() -> a -> b -> b) -> b -> Maybe a -> b #

ifoldl :: (() -> b -> a -> b) -> b -> Maybe a -> b #

ifoldr' :: (() -> a -> b -> b) -> b -> Maybe a -> b #

ifoldl' :: (() -> b -> a -> b) -> b -> Maybe a -> b #

FoldableWithIndex () Par1 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (() -> a -> m) -> Par1 a -> m #

ifolded :: IndexedFold () (Par1 a) a #

ifoldr :: (() -> a -> b -> b) -> b -> Par1 a -> b #

ifoldl :: (() -> b -> a -> b) -> b -> Par1 a -> b #

ifoldr' :: (() -> a -> b -> b) -> b -> Par1 a -> b #

ifoldl' :: (() -> b -> a -> b) -> b -> Par1 a -> b #

FoldableWithIndex () Identity 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (() -> a -> m) -> Identity a -> m #

ifolded :: IndexedFold () (Identity a) a #

ifoldr :: (() -> a -> b -> b) -> b -> Identity a -> b #

ifoldl :: (() -> b -> a -> b) -> b -> Identity a -> b #

ifoldr' :: (() -> a -> b -> b) -> b -> Identity a -> b #

ifoldl' :: (() -> b -> a -> b) -> b -> Identity a -> b #

FoldableWithIndex k (Map k) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (k -> a -> m) -> Map k a -> m #

ifolded :: IndexedFold k (Map k a) a #

ifoldr :: (k -> a -> b -> b) -> b -> Map k a -> b #

ifoldl :: (k -> b -> a -> b) -> b -> Map k a -> b #

ifoldr' :: (k -> a -> b -> b) -> b -> Map k a -> b #

ifoldl' :: (k -> b -> a -> b) -> b -> Map k a -> b #

FoldableWithIndex k (HashMap k) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (k -> a -> m) -> HashMap k a -> m #

ifolded :: IndexedFold k (HashMap k a) a #

ifoldr :: (k -> a -> b -> b) -> b -> HashMap k a -> b #

ifoldl :: (k -> b -> a -> b) -> b -> HashMap k a -> b #

ifoldr' :: (k -> a -> b -> b) -> b -> HashMap k a -> b #

ifoldl' :: (k -> b -> a -> b) -> b -> HashMap k a -> b #

FoldableWithIndex k ((,) k) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (k -> a -> m) -> (k, a) -> m #

ifolded :: IndexedFold k (k, a) a #

ifoldr :: (k -> a -> b -> b) -> b -> (k, a) -> b #

ifoldl :: (k -> b -> a -> b) -> b -> (k, a) -> b #

ifoldr' :: (k -> a -> b -> b) -> b -> (k, a) -> b #

ifoldl' :: (k -> b -> a -> b) -> b -> (k, a) -> b #

FoldableWithIndex i (Level i) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (i -> a -> m) -> Level i a -> m #

ifolded :: IndexedFold i (Level i a) a #

ifoldr :: (i -> a -> b -> b) -> b -> Level i a -> b #

ifoldl :: (i -> b -> a -> b) -> b -> Level i a -> b #

ifoldr' :: (i -> a -> b -> b) -> b -> Level i a -> b #

ifoldl' :: (i -> b -> a -> b) -> b -> Level i a -> b #

Ix i => FoldableWithIndex i (Array i) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (i -> a -> m) -> Array i a -> m #

ifolded :: IndexedFold i (Array i a) a #

ifoldr :: (i -> a -> b -> b) -> b -> Array i a -> b #

ifoldl :: (i -> b -> a -> b) -> b -> Array i a -> b #

ifoldr' :: (i -> a -> b -> b) -> b -> Array i a -> b #

ifoldl' :: (i -> b -> a -> b) -> b -> Array i a -> b #

FoldableWithIndex Void (V1 :: Type -> Type) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (Void -> a -> m) -> V1 a -> m #

ifolded :: IndexedFold Void (V1 a) a #

ifoldr :: (Void -> a -> b -> b) -> b -> V1 a -> b #

ifoldl :: (Void -> b -> a -> b) -> b -> V1 a -> b #

ifoldr' :: (Void -> a -> b -> b) -> b -> V1 a -> b #

ifoldl' :: (Void -> b -> a -> b) -> b -> V1 a -> b #

FoldableWithIndex Void (U1 :: Type -> Type) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (Void -> a -> m) -> U1 a -> m #

ifolded :: IndexedFold Void (U1 a) a #

ifoldr :: (Void -> a -> b -> b) -> b -> U1 a -> b #

ifoldl :: (Void -> b -> a -> b) -> b -> U1 a -> b #

ifoldr' :: (Void -> a -> b -> b) -> b -> U1 a -> b #

ifoldl' :: (Void -> b -> a -> b) -> b -> U1 a -> b #

FoldableWithIndex Void (Proxy :: Type -> Type) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (Void -> a -> m) -> Proxy a -> m #

ifolded :: IndexedFold Void (Proxy a) a #

ifoldr :: (Void -> a -> b -> b) -> b -> Proxy a -> b #

ifoldl :: (Void -> b -> a -> b) -> b -> Proxy a -> b #

ifoldr' :: (Void -> a -> b -> b) -> b -> Proxy a -> b #

ifoldl' :: (Void -> b -> a -> b) -> b -> Proxy a -> b #

FoldableWithIndex Int (V n) 
Instance details

Defined in Linear.V

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> V n a -> m #

ifolded :: IndexedFold Int (V n a) a #

ifoldr :: (Int -> a -> b -> b) -> b -> V n a -> b #

ifoldl :: (Int -> b -> a -> b) -> b -> V n a -> b #

ifoldr' :: (Int -> a -> b -> b) -> b -> V n a -> b #

ifoldl' :: (Int -> b -> a -> b) -> b -> V n a -> b #

FoldableWithIndex () (Tagged a) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (() -> a0 -> m) -> Tagged a a0 -> m #

ifolded :: IndexedFold () (Tagged a a0) a0 #

ifoldr :: (() -> a0 -> b -> b) -> b -> Tagged a a0 -> b #

ifoldl :: (() -> b -> a0 -> b) -> b -> Tagged a a0 -> b #

ifoldr' :: (() -> a0 -> b -> b) -> b -> Tagged a a0 -> b #

ifoldl' :: (() -> b -> a0 -> b) -> b -> Tagged a a0 -> b #

FoldableWithIndex i f => FoldableWithIndex i (Reverse f) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (i -> a -> m) -> Reverse f a -> m #

ifolded :: IndexedFold i (Reverse f a) a #

ifoldr :: (i -> a -> b -> b) -> b -> Reverse f a -> b #

ifoldl :: (i -> b -> a -> b) -> b -> Reverse f a -> b #

ifoldr' :: (i -> a -> b -> b) -> b -> Reverse f a -> b #

ifoldl' :: (i -> b -> a -> b) -> b -> Reverse f a -> b #

FoldableWithIndex i f => FoldableWithIndex i (Rec1 f) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (i -> a -> m) -> Rec1 f a -> m #

ifolded :: IndexedFold i (Rec1 f a) a #

ifoldr :: (i -> a -> b -> b) -> b -> Rec1 f a -> b #

ifoldl :: (i -> b -> a -> b) -> b -> Rec1 f a -> b #

ifoldr' :: (i -> a -> b -> b) -> b -> Rec1 f a -> b #

ifoldl' :: (i -> b -> a -> b) -> b -> Rec1 f a -> b #

FoldableWithIndex i m => FoldableWithIndex i (IdentityT m) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m0 => (i -> a -> m0) -> IdentityT m a -> m0 #

ifolded :: IndexedFold i (IdentityT m a) a #

ifoldr :: (i -> a -> b -> b) -> b -> IdentityT m a -> b #

ifoldl :: (i -> b -> a -> b) -> b -> IdentityT m a -> b #

ifoldr' :: (i -> a -> b -> b) -> b -> IdentityT m a -> b #

ifoldl' :: (i -> b -> a -> b) -> b -> IdentityT m a -> b #

FoldableWithIndex i f => FoldableWithIndex i (Backwards f) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (i -> a -> m) -> Backwards f a -> m #

ifolded :: IndexedFold i (Backwards f a) a #

ifoldr :: (i -> a -> b -> b) -> b -> Backwards f a -> b #

ifoldl :: (i -> b -> a -> b) -> b -> Backwards f a -> b #

ifoldr' :: (i -> a -> b -> b) -> b -> Backwards f a -> b #

ifoldl' :: (i -> b -> a -> b) -> b -> Backwards f a -> b #

FoldableWithIndex i (Magma i t b) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (i -> a -> m) -> Magma i t b a -> m #

ifolded :: IndexedFold i (Magma i t b a) a #

ifoldr :: (i -> a -> b0 -> b0) -> b0 -> Magma i t b a -> b0 #

ifoldl :: (i -> b0 -> a -> b0) -> b0 -> Magma i t b a -> b0 #

ifoldr' :: (i -> a -> b0 -> b0) -> b0 -> Magma i t b a -> b0 #

ifoldl' :: (i -> b0 -> a -> b0) -> b0 -> Magma i t b a -> b0 #

FoldableWithIndex Void (K1 i c :: Type -> Type) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (Void -> a -> m) -> K1 i c a -> m #

ifolded :: IndexedFold Void (K1 i c a) a #

ifoldr :: (Void -> a -> b -> b) -> b -> K1 i c a -> b #

ifoldl :: (Void -> b -> a -> b) -> b -> K1 i c a -> b #

ifoldr' :: (Void -> a -> b -> b) -> b -> K1 i c a -> b #

ifoldl' :: (Void -> b -> a -> b) -> b -> K1 i c a -> b #

FoldableWithIndex [Int] Tree 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => ([Int] -> a -> m) -> Tree a -> m #

ifolded :: IndexedFold [Int] (Tree a) a #

ifoldr :: ([Int] -> a -> b -> b) -> b -> Tree a -> b #

ifoldl :: ([Int] -> b -> a -> b) -> b -> Tree a -> b #

ifoldr' :: ([Int] -> a -> b -> b) -> b -> Tree a -> b #

ifoldl' :: ([Int] -> b -> a -> b) -> b -> Tree a -> b #

FoldableWithIndex (E V2) V2 
Instance details

Defined in Linear.V2

Methods

ifoldMap :: Monoid m => (E V2 -> a -> m) -> V2 a -> m #

ifolded :: IndexedFold (E V2) (V2 a) a #

ifoldr :: (E V2 -> a -> b -> b) -> b -> V2 a -> b #

ifoldl :: (E V2 -> b -> a -> b) -> b -> V2 a -> b #

ifoldr' :: (E V2 -> a -> b -> b) -> b -> V2 a -> b #

ifoldl' :: (E V2 -> b -> a -> b) -> b -> V2 a -> b #

FoldableWithIndex (E V3) V3 
Instance details

Defined in Linear.V3

Methods

ifoldMap :: Monoid m => (E V3 -> a -> m) -> V3 a -> m #

ifolded :: IndexedFold (E V3) (V3 a) a #

ifoldr :: (E V3 -> a -> b -> b) -> b -> V3 a -> b #

ifoldl :: (E V3 -> b -> a -> b) -> b -> V3 a -> b #

ifoldr' :: (E V3 -> a -> b -> b) -> b -> V3 a -> b #

ifoldl' :: (E V3 -> b -> a -> b) -> b -> V3 a -> b #

FoldableWithIndex (E V1) V1 
Instance details

Defined in Linear.V1

Methods

ifoldMap :: Monoid m => (E V1 -> a -> m) -> V1 a -> m #

ifolded :: IndexedFold (E V1) (V1 a) a #

ifoldr :: (E V1 -> a -> b -> b) -> b -> V1 a -> b #

ifoldl :: (E V1 -> b -> a -> b) -> b -> V1 a -> b #

ifoldr' :: (E V1 -> a -> b -> b) -> b -> V1 a -> b #

ifoldl' :: (E V1 -> b -> a -> b) -> b -> V1 a -> b #

FoldableWithIndex (E Plucker) Plucker 
Instance details

Defined in Linear.Plucker

Methods

ifoldMap :: Monoid m => (E Plucker -> a -> m) -> Plucker a -> m #

ifolded :: IndexedFold (E Plucker) (Plucker a) a #

ifoldr :: (E Plucker -> a -> b -> b) -> b -> Plucker a -> b #

ifoldl :: (E Plucker -> b -> a -> b) -> b -> Plucker a -> b #

ifoldr' :: (E Plucker -> a -> b -> b) -> b -> Plucker a -> b #

ifoldl' :: (E Plucker -> b -> a -> b) -> b -> Plucker a -> b #

FoldableWithIndex (E Quaternion) Quaternion 
Instance details

Defined in Linear.Quaternion

Methods

ifoldMap :: Monoid m => (E Quaternion -> a -> m) -> Quaternion a -> m #

ifolded :: IndexedFold (E Quaternion) (Quaternion a) a #

ifoldr :: (E Quaternion -> a -> b -> b) -> b -> Quaternion a -> b #

ifoldl :: (E Quaternion -> b -> a -> b) -> b -> Quaternion a -> b #

ifoldr' :: (E Quaternion -> a -> b -> b) -> b -> Quaternion a -> b #

ifoldl' :: (E Quaternion -> b -> a -> b) -> b -> Quaternion a -> b #

FoldableWithIndex (E V0) V0 
Instance details

Defined in Linear.V0

Methods

ifoldMap :: Monoid m => (E V0 -> a -> m) -> V0 a -> m #

ifolded :: IndexedFold (E V0) (V0 a) a #

ifoldr :: (E V0 -> a -> b -> b) -> b -> V0 a -> b #

ifoldl :: (E V0 -> b -> a -> b) -> b -> V0 a -> b #

ifoldr' :: (E V0 -> a -> b -> b) -> b -> V0 a -> b #

ifoldl' :: (E V0 -> b -> a -> b) -> b -> V0 a -> b #

FoldableWithIndex (E V4) V4 
Instance details

Defined in Linear.V4

Methods

ifoldMap :: Monoid m => (E V4 -> a -> m) -> V4 a -> m #

ifolded :: IndexedFold (E V4) (V4 a) a #

ifoldr :: (E V4 -> a -> b -> b) -> b -> V4 a -> b #

ifoldl :: (E V4 -> b -> a -> b) -> b -> V4 a -> b #

ifoldr' :: (E V4 -> a -> b -> b) -> b -> V4 a -> b #

ifoldl' :: (E V4 -> b -> a -> b) -> b -> V4 a -> b #

FoldableWithIndex i f => FoldableWithIndex [i] (Free f) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => ([i] -> a -> m) -> Free f a -> m #

ifolded :: IndexedFold [i] (Free f a) a #

ifoldr :: ([i] -> a -> b -> b) -> b -> Free f a -> b #

ifoldl :: ([i] -> b -> a -> b) -> b -> Free f a -> b #

ifoldr' :: ([i] -> a -> b -> b) -> b -> Free f a -> b #

ifoldl' :: ([i] -> b -> a -> b) -> b -> Free f a -> b #

FoldableWithIndex i f => FoldableWithIndex [i] (Cofree f) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => ([i] -> a -> m) -> Cofree f a -> m #

ifolded :: IndexedFold [i] (Cofree f a) a #

ifoldr :: ([i] -> a -> b -> b) -> b -> Cofree f a -> b #

ifoldl :: ([i] -> b -> a -> b) -> b -> Cofree f a -> b #

ifoldr' :: ([i] -> a -> b -> b) -> b -> Cofree f a -> b #

ifoldl' :: ([i] -> b -> a -> b) -> b -> Cofree f a -> b #

(FoldableWithIndex i f, FoldableWithIndex j g) => FoldableWithIndex (Either i j) (Sum f g) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (Either i j -> a -> m) -> Sum f g a -> m #

ifolded :: IndexedFold (Either i j) (Sum f g a) a #

ifoldr :: (Either i j -> a -> b -> b) -> b -> Sum f g a -> b #

ifoldl :: (Either i j -> b -> a -> b) -> b -> Sum f g a -> b #

ifoldr' :: (Either i j -> a -> b -> b) -> b -> Sum f g a -> b #

ifoldl' :: (Either i j -> b -> a -> b) -> b -> Sum f g a -> b #

(FoldableWithIndex i f, FoldableWithIndex j g) => FoldableWithIndex (Either i j) (Product f g) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (Either i j -> a -> m) -> Product f g a -> m #

ifolded :: IndexedFold (Either i j) (Product f g a) a #

ifoldr :: (Either i j -> a -> b -> b) -> b -> Product f g a -> b #

ifoldl :: (Either i j -> b -> a -> b) -> b -> Product f g a -> b #

ifoldr' :: (Either i j -> a -> b -> b) -> b -> Product f g a -> b #

ifoldl' :: (Either i j -> b -> a -> b) -> b -> Product f g a -> b #

(FoldableWithIndex i f, FoldableWithIndex j g) => FoldableWithIndex (Either i j) (f :+: g) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (Either i j -> a -> m) -> (f :+: g) a -> m #

ifolded :: IndexedFold (Either i j) ((f :+: g) a) a #

ifoldr :: (Either i j -> a -> b -> b) -> b -> (f :+: g) a -> b #

ifoldl :: (Either i j -> b -> a -> b) -> b -> (f :+: g) a -> b #

ifoldr' :: (Either i j -> a -> b -> b) -> b -> (f :+: g) a -> b #

ifoldl' :: (Either i j -> b -> a -> b) -> b -> (f :+: g) a -> b #

(FoldableWithIndex i f, FoldableWithIndex j g) => FoldableWithIndex (Either i j) (f :*: g) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (Either i j -> a -> m) -> (f :*: g) a -> m #

ifolded :: IndexedFold (Either i j) ((f :*: g) a) a #

ifoldr :: (Either i j -> a -> b -> b) -> b -> (f :*: g) a -> b #

ifoldl :: (Either i j -> b -> a -> b) -> b -> (f :*: g) a -> b #

ifoldr' :: (Either i j -> a -> b -> b) -> b -> (f :*: g) a -> b #

ifoldl' :: (Either i j -> b -> a -> b) -> b -> (f :*: g) a -> b #

(FoldableWithIndex i f, FoldableWithIndex j g) => FoldableWithIndex (i, j) (Compose f g) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => ((i, j) -> a -> m) -> Compose f g a -> m #

ifolded :: IndexedFold (i, j) (Compose f g a) a #

ifoldr :: ((i, j) -> a -> b -> b) -> b -> Compose f g a -> b #

ifoldl :: ((i, j) -> b -> a -> b) -> b -> Compose f g a -> b #

ifoldr' :: ((i, j) -> a -> b -> b) -> b -> Compose f g a -> b #

ifoldl' :: ((i, j) -> b -> a -> b) -> b -> Compose f g a -> b #

(FoldableWithIndex i f, FoldableWithIndex j g) => FoldableWithIndex (i, j) (f :.: g) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => ((i, j) -> a -> m) -> (f :.: g) a -> m #

ifolded :: IndexedFold (i, j) ((f :.: g) a) a #

ifoldr :: ((i, j) -> a -> b -> b) -> b -> (f :.: g) a -> b #

ifoldl :: ((i, j) -> b -> a -> b) -> b -> (f :.: g) a -> b #

ifoldr' :: ((i, j) -> a -> b -> b) -> b -> (f :.: g) a -> b #

ifoldl' :: ((i, j) -> b -> a -> b) -> b -> (f :.: g) a -> b #

class Functor f => FunctorWithIndex i (f :: Type -> Type) | f -> i where #

Minimal complete definition

Nothing

Methods

imap :: (i -> a -> b) -> f a -> f b #

imapped :: IndexedSetter i (f a) (f b) a b #

Instances
FunctorWithIndex Int [] 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (Int -> a -> b) -> [a] -> [b] #

imapped :: IndexedSetter Int [a] [b] a b #

FunctorWithIndex Int ZipList 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (Int -> a -> b) -> ZipList a -> ZipList b #

imapped :: IndexedSetter Int (ZipList a) (ZipList b) a b #

FunctorWithIndex Int NonEmpty 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (Int -> a -> b) -> NonEmpty a -> NonEmpty b #

imapped :: IndexedSetter Int (NonEmpty a) (NonEmpty b) a b #

FunctorWithIndex Int IntMap 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (Int -> a -> b) -> IntMap a -> IntMap b #

imapped :: IndexedSetter Int (IntMap a) (IntMap b) a b #

FunctorWithIndex Int Seq 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (Int -> a -> b) -> Seq a -> Seq b #

imapped :: IndexedSetter Int (Seq a) (Seq b) a b #

FunctorWithIndex Int Vector 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (Int -> a -> b) -> Vector a -> Vector b #

imapped :: IndexedSetter Int (Vector a) (Vector b) a b #

FunctorWithIndex () Maybe 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (() -> a -> b) -> Maybe a -> Maybe b #

imapped :: IndexedSetter () (Maybe a) (Maybe b) a b #

FunctorWithIndex () Par1 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (() -> a -> b) -> Par1 a -> Par1 b #

imapped :: IndexedSetter () (Par1 a) (Par1 b) a b #

FunctorWithIndex () Identity 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (() -> a -> b) -> Identity a -> Identity b #

imapped :: IndexedSetter () (Identity a) (Identity b) a b #

FunctorWithIndex k (Map k) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (k -> a -> b) -> Map k a -> Map k b #

imapped :: IndexedSetter k (Map k a) (Map k b) a b #

FunctorWithIndex k (HashMap k) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (k -> a -> b) -> HashMap k a -> HashMap k b #

imapped :: IndexedSetter k (HashMap k a) (HashMap k b) a b #

FunctorWithIndex k ((,) k) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (k -> a -> b) -> (k, a) -> (k, b) #

imapped :: IndexedSetter k (k, a) (k, b) a b #

FunctorWithIndex i (Level i) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (i -> a -> b) -> Level i a -> Level i b #

imapped :: IndexedSetter i (Level i a) (Level i b) a b #

Ix i => FunctorWithIndex i (Array i) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (i -> a -> b) -> Array i a -> Array i b #

imapped :: IndexedSetter i (Array i a) (Array i b) a b #

FunctorWithIndex Void (V1 :: Type -> Type) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (Void -> a -> b) -> V1 a -> V1 b #

imapped :: IndexedSetter Void (V1 a) (V1 b) a b #

FunctorWithIndex Void (U1 :: Type -> Type) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (Void -> a -> b) -> U1 a -> U1 b #

imapped :: IndexedSetter Void (U1 a) (U1 b) a b #

FunctorWithIndex Void (Proxy :: Type -> Type) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (Void -> a -> b) -> Proxy a -> Proxy b #

imapped :: IndexedSetter Void (Proxy a) (Proxy b) a b #

FunctorWithIndex Int (V n) 
Instance details

Defined in Linear.V

Methods

imap :: (Int -> a -> b) -> V n a -> V n b #

imapped :: IndexedSetter Int (V n a) (V n b) a b #

FunctorWithIndex () (Tagged a) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (() -> a0 -> b) -> Tagged a a0 -> Tagged a b #

imapped :: IndexedSetter () (Tagged a a0) (Tagged a b) a0 b #

FunctorWithIndex i f => FunctorWithIndex i (Reverse f) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (i -> a -> b) -> Reverse f a -> Reverse f b #

imapped :: IndexedSetter i (Reverse f a) (Reverse f b) a b #

FunctorWithIndex i f => FunctorWithIndex i (Rec1 f) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (i -> a -> b) -> Rec1 f a -> Rec1 f b #

imapped :: IndexedSetter i (Rec1 f a) (Rec1 f b) a b #

FunctorWithIndex i m => FunctorWithIndex i (IdentityT m) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (i -> a -> b) -> IdentityT m a -> IdentityT m b #

imapped :: IndexedSetter i (IdentityT m a) (IdentityT m b) a b #

FunctorWithIndex i f => FunctorWithIndex i (Backwards f) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (i -> a -> b) -> Backwards f a -> Backwards f b #

imapped :: IndexedSetter i (Backwards f a) (Backwards f b) a b #

FunctorWithIndex r ((->) r :: Type -> Type) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (r -> a -> b) -> (r -> a) -> r -> b #

imapped :: IndexedSetter r (r -> a) (r -> b) a b #

FunctorWithIndex i (Magma i t b) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (i -> a -> b0) -> Magma i t b a -> Magma i t b b0 #

imapped :: IndexedSetter i (Magma i t b a) (Magma i t b b0) a b0 #

FunctorWithIndex Void (K1 i c :: Type -> Type) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (Void -> a -> b) -> K1 i c a -> K1 i c b #

imapped :: IndexedSetter Void (K1 i c a) (K1 i c b) a b #

FunctorWithIndex [Int] Tree 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: ([Int] -> a -> b) -> Tree a -> Tree b #

imapped :: IndexedSetter [Int] (Tree a) (Tree b) a b #

FunctorWithIndex (E V2) V2 
Instance details

Defined in Linear.V2

Methods

imap :: (E V2 -> a -> b) -> V2 a -> V2 b #

imapped :: IndexedSetter (E V2) (V2 a) (V2 b) a b #

FunctorWithIndex (E V3) V3 
Instance details

Defined in Linear.V3

Methods

imap :: (E V3 -> a -> b) -> V3 a -> V3 b #

imapped :: IndexedSetter (E V3) (V3 a) (V3 b) a b #

FunctorWithIndex (E V1) V1 
Instance details

Defined in Linear.V1

Methods

imap :: (E V1 -> a -> b) -> V1 a -> V1 b #

imapped :: IndexedSetter (E V1) (V1 a) (V1 b) a b #

FunctorWithIndex (E Plucker) Plucker 
Instance details

Defined in Linear.Plucker

Methods

imap :: (E Plucker -> a -> b) -> Plucker a -> Plucker b #

imapped :: IndexedSetter (E Plucker) (Plucker a) (Plucker b) a b #

FunctorWithIndex (E Quaternion) Quaternion 
Instance details

Defined in Linear.Quaternion

Methods

imap :: (E Quaternion -> a -> b) -> Quaternion a -> Quaternion b #

imapped :: IndexedSetter (E Quaternion) (Quaternion a) (Quaternion b) a b #

FunctorWithIndex (E V0) V0 
Instance details

Defined in Linear.V0

Methods

imap :: (E V0 -> a -> b) -> V0 a -> V0 b #

imapped :: IndexedSetter (E V0) (V0 a) (V0 b) a b #

FunctorWithIndex (E V4) V4 
Instance details

Defined in Linear.V4

Methods

imap :: (E V4 -> a -> b) -> V4 a -> V4 b #

imapped :: IndexedSetter (E V4) (V4 a) (V4 b) a b #

FunctorWithIndex i f => FunctorWithIndex [i] (Free f) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: ([i] -> a -> b) -> Free f a -> Free f b #

imapped :: IndexedSetter [i] (Free f a) (Free f b) a b #

FunctorWithIndex i f => FunctorWithIndex [i] (Cofree f) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: ([i] -> a -> b) -> Cofree f a -> Cofree f b #

imapped :: IndexedSetter [i] (Cofree f a) (Cofree f b) a b #

FunctorWithIndex i w => FunctorWithIndex (s, i) (TracedT s w) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: ((s, i) -> a -> b) -> TracedT s w a -> TracedT s w b #

imapped :: IndexedSetter (s, i) (TracedT s w a) (TracedT s w b) a b #

FunctorWithIndex i m => FunctorWithIndex (e, i) (ReaderT e m) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: ((e, i) -> a -> b) -> ReaderT e m a -> ReaderT e m b #

imapped :: IndexedSetter (e, i) (ReaderT e m a) (ReaderT e m b) a b #

(FunctorWithIndex i f, FunctorWithIndex j g) => FunctorWithIndex (Either i j) (Sum f g) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (Either i j -> a -> b) -> Sum f g a -> Sum f g b #

imapped :: IndexedSetter (Either i j) (Sum f g a) (Sum f g b) a b #

(FunctorWithIndex i f, FunctorWithIndex j g) => FunctorWithIndex (Either i j) (Product f g) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (Either i j -> a -> b) -> Product f g a -> Product f g b #

imapped :: IndexedSetter (Either i j) (Product f g a) (Product f g b) a b #

(FunctorWithIndex i f, FunctorWithIndex j g) => FunctorWithIndex (Either i j) (f :+: g) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (Either i j -> a -> b) -> (f :+: g) a -> (f :+: g) b #

imapped :: IndexedSetter (Either i j) ((f :+: g) a) ((f :+: g) b) a b #

(FunctorWithIndex i f, FunctorWithIndex j g) => FunctorWithIndex (Either i j) (f :*: g) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (Either i j -> a -> b) -> (f :*: g) a -> (f :*: g) b #

imapped :: IndexedSetter (Either i j) ((f :*: g) a) ((f :*: g) b) a b #

(FunctorWithIndex i f, FunctorWithIndex j g) => FunctorWithIndex (i, j) (Compose f g) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: ((i, j) -> a -> b) -> Compose f g a -> Compose f g b #

imapped :: IndexedSetter (i, j) (Compose f g a) (Compose f g b) a b #

(FunctorWithIndex i f, FunctorWithIndex j g) => FunctorWithIndex (i, j) (f :.: g) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: ((i, j) -> a -> b) -> (f :.: g) a -> (f :.: g) b #

imapped :: IndexedSetter (i, j) ((f :.: g) a) ((f :.: g) b) a b #

class (FunctorWithIndex i t, FoldableWithIndex i t, Traversable t) => TraversableWithIndex i (t :: Type -> Type) | t -> i where #

Minimal complete definition

Nothing

Methods

itraverse :: Applicative f => (i -> a -> f b) -> t a -> f (t b) #

itraversed :: IndexedTraversal i (t a) (t b) a b #

Instances
TraversableWithIndex Int [] 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> [a] -> f [b] #

itraversed :: IndexedTraversal Int [a] [b] a b #

TraversableWithIndex Int ZipList 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> ZipList a -> f (ZipList b) #

itraversed :: IndexedTraversal Int (ZipList a) (ZipList b) a b #

TraversableWithIndex Int NonEmpty 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> NonEmpty a -> f (NonEmpty b) #

itraversed :: IndexedTraversal Int (NonEmpty a) (NonEmpty b) a b #

TraversableWithIndex Int IntMap 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> IntMap a -> f (IntMap b) #

itraversed :: IndexedTraversal Int (IntMap a) (IntMap b) a b #

TraversableWithIndex Int Seq 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> Seq a -> f (Seq b) #

itraversed :: IndexedTraversal Int (Seq a) (Seq b) a b #

TraversableWithIndex Int Vector 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> Vector a -> f (Vector b) #

itraversed :: IndexedTraversal Int (Vector a) (Vector b) a b #

TraversableWithIndex () Maybe 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (() -> a -> f b) -> Maybe a -> f (Maybe b) #

itraversed :: IndexedTraversal () (Maybe a) (Maybe b) a b #

TraversableWithIndex () Par1 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (() -> a -> f b) -> Par1 a -> f (Par1 b) #

itraversed :: IndexedTraversal () (Par1 a) (Par1 b) a b #

TraversableWithIndex () Identity 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (() -> a -> f b) -> Identity a -> f (Identity b) #

itraversed :: IndexedTraversal () (Identity a) (Identity b) a b #

TraversableWithIndex k (Map k) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (k -> a -> f b) -> Map k a -> f (Map k b) #

itraversed :: IndexedTraversal k (Map k a) (Map k b) a b #

TraversableWithIndex k (HashMap k) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (k -> a -> f b) -> HashMap k a -> f (HashMap k b) #

itraversed :: IndexedTraversal k (HashMap k a) (HashMap k b) a b #

TraversableWithIndex k ((,) k) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (k -> a -> f b) -> (k, a) -> f (k, b) #

itraversed :: IndexedTraversal k (k, a) (k, b) a b #

TraversableWithIndex i (Level i) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (i -> a -> f b) -> Level i a -> f (Level i b) #

itraversed :: IndexedTraversal i (Level i a) (Level i b) a b #

Ix i => TraversableWithIndex i (Array i) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (i -> a -> f b) -> Array i a -> f (Array i b) #

itraversed :: IndexedTraversal i (Array i a) (Array i b) a b #

TraversableWithIndex Void (V1 :: Type -> Type) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (Void -> a -> f b) -> V1 a -> f (V1 b) #

itraversed :: IndexedTraversal Void (V1 a) (V1 b) a b #

TraversableWithIndex Void (U1 :: Type -> Type) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (Void -> a -> f b) -> U1 a -> f (U1 b) #

itraversed :: IndexedTraversal Void (U1 a) (U1 b) a b #

TraversableWithIndex Void (Proxy :: Type -> Type) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (Void -> a -> f b) -> Proxy a -> f (Proxy b) #

itraversed :: IndexedTraversal Void (Proxy a) (Proxy b) a b #

TraversableWithIndex Int (V n) 
Instance details

Defined in Linear.V

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> V n a -> f (V n b) #

itraversed :: IndexedTraversal Int (V n a) (V n b) a b #

TraversableWithIndex () (Tagged a) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (() -> a0 -> f b) -> Tagged a a0 -> f (Tagged a b) #

itraversed :: IndexedTraversal () (Tagged a a0) (Tagged a b) a0 b #

TraversableWithIndex i f => TraversableWithIndex i (Reverse f) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f0 => (i -> a -> f0 b) -> Reverse f a -> f0 (Reverse f b) #

itraversed :: IndexedTraversal i (Reverse f a) (Reverse f b) a b #

TraversableWithIndex i f => TraversableWithIndex i (Rec1 f) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f0 => (i -> a -> f0 b) -> Rec1 f a -> f0 (Rec1 f b) #

itraversed :: IndexedTraversal i (Rec1 f a) (Rec1 f b) a b #

TraversableWithIndex i m => TraversableWithIndex i (IdentityT m) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (i -> a -> f b) -> IdentityT m a -> f (IdentityT m b) #

itraversed :: IndexedTraversal i (IdentityT m a) (IdentityT m b) a b #

TraversableWithIndex i f => TraversableWithIndex i (Backwards f) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f0 => (i -> a -> f0 b) -> Backwards f a -> f0 (Backwards f b) #

itraversed :: IndexedTraversal i (Backwards f a) (Backwards f b) a b #

TraversableWithIndex i (Magma i t b) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (i -> a -> f b0) -> Magma i t b a -> f (Magma i t b b0) #

itraversed :: IndexedTraversal i (Magma i t b a) (Magma i t b b0) a b0 #

TraversableWithIndex Void (K1 i c :: Type -> Type) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (Void -> a -> f b) -> K1 i c a -> f (K1 i c b) #

itraversed :: IndexedTraversal Void (K1 i c a) (K1 i c b) a b #

TraversableWithIndex [Int] Tree 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => ([Int] -> a -> f b) -> Tree a -> f (Tree b) #

itraversed :: IndexedTraversal [Int] (Tree a) (Tree b) a b #

TraversableWithIndex (E V2) V2 
Instance details

Defined in Linear.V2

Methods

itraverse :: Applicative f => (E V2 -> a -> f b) -> V2 a -> f (V2 b) #

itraversed :: IndexedTraversal (E V2) (V2 a) (V2 b) a b #

TraversableWithIndex (E V3) V3 
Instance details

Defined in Linear.V3

Methods

itraverse :: Applicative f => (E V3 -> a -> f b) -> V3 a -> f (V3 b) #

itraversed :: IndexedTraversal (E V3) (V3 a) (V3 b) a b #

TraversableWithIndex (E V1) V1 
Instance details

Defined in Linear.V1

Methods

itraverse :: Applicative f => (E V1 -> a -> f b) -> V1 a -> f (V1 b) #

itraversed :: IndexedTraversal (E V1) (V1 a) (V1 b) a b #

TraversableWithIndex (E Plucker) Plucker 
Instance details

Defined in Linear.Plucker

Methods

itraverse :: Applicative f => (E Plucker -> a -> f b) -> Plucker a -> f (Plucker b) #

itraversed :: IndexedTraversal (E Plucker) (Plucker a) (Plucker b) a b #

TraversableWithIndex (E Quaternion) Quaternion 
Instance details

Defined in Linear.Quaternion

Methods

itraverse :: Applicative f => (E Quaternion -> a -> f b) -> Quaternion a -> f (Quaternion b) #

itraversed :: IndexedTraversal (E Quaternion) (Quaternion a) (Quaternion b) a b #

TraversableWithIndex (E V0) V0 
Instance details

Defined in Linear.V0

Methods

itraverse :: Applicative f => (E V0 -> a -> f b) -> V0 a -> f (V0 b) #

itraversed :: IndexedTraversal (E V0) (V0 a) (V0 b) a b #

TraversableWithIndex (E V4) V4 
Instance details

Defined in Linear.V4

Methods

itraverse :: Applicative f => (E V4 -> a -> f b) -> V4 a -> f (V4 b) #

itraversed :: IndexedTraversal (E V4) (V4 a) (V4 b) a b #

TraversableWithIndex i f => TraversableWithIndex [i] (Free f) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f0 => ([i] -> a -> f0 b) -> Free f a -> f0 (Free f b) #

itraversed :: IndexedTraversal [i] (Free f a) (Free f b) a b #

TraversableWithIndex i f => TraversableWithIndex [i] (Cofree f) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f0 => ([i] -> a -> f0 b) -> Cofree f a -> f0 (Cofree f b) #

itraversed :: IndexedTraversal [i] (Cofree f a) (Cofree f b) a b #

(TraversableWithIndex i f, TraversableWithIndex j g) => TraversableWithIndex (Either i j) (Sum f g) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f0 => (Either i j -> a -> f0 b) -> Sum f g a -> f0 (Sum f g b) #

itraversed :: IndexedTraversal (Either i j) (Sum f g a) (Sum f g b) a b #

(TraversableWithIndex i f, TraversableWithIndex j g) => TraversableWithIndex (Either i j) (Product f g) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f0 => (Either i j -> a -> f0 b) -> Product f g a -> f0 (Product f g b) #

itraversed :: IndexedTraversal (Either i j) (Product f g a) (Product f g b) a b #

(TraversableWithIndex i f, TraversableWithIndex j g) => TraversableWithIndex (Either i j) (f :+: g) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f0 => (Either i j -> a -> f0 b) -> (f :+: g) a -> f0 ((f :+: g) b) #

itraversed :: IndexedTraversal (Either i j) ((f :+: g) a) ((f :+: g) b) a b #

(TraversableWithIndex i f, TraversableWithIndex j g) => TraversableWithIndex (Either i j) (f :*: g) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f0 => (Either i j -> a -> f0 b) -> (f :*: g) a -> f0 ((f :*: g) b) #

itraversed :: IndexedTraversal (Either i j) ((f :*: g) a) ((f :*: g) b) a b #

(TraversableWithIndex i f, TraversableWithIndex j g) => TraversableWithIndex (i, j) (Compose f g) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f0 => ((i, j) -> a -> f0 b) -> Compose f g a -> f0 (Compose f g b) #

itraversed :: IndexedTraversal (i, j) (Compose f g a) (Compose f g b) a b #

(TraversableWithIndex i f, TraversableWithIndex j g) => TraversableWithIndex (i, j) (f :.: g) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f0 => ((i, j) -> a -> f0 b) -> (f :.: g) a -> f0 ((f :.: g) b) #

itraversed :: IndexedTraversal (i, j) ((f :.: g) a) ((f :.: g) b) a b #

newtype Bazaar (p :: Type -> Type -> Type) a b t #

Constructors

Bazaar 

Fields

Instances
Profunctor p => Bizarre p (Bazaar p) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

bazaar :: Applicative f => p a (f b) -> Bazaar p a b t -> f t

Corepresentable p => Sellable p (Bazaar p) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

sell :: p a (Bazaar p a b b)

Conjoined p => IndexedComonad (Bazaar p) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

iextract :: Bazaar p a a t -> t

iduplicate :: Bazaar p a c t -> Bazaar p a b (Bazaar p b c t)

iextend :: (Bazaar p b c t -> r) -> Bazaar p a c t -> Bazaar p a b r

IndexedFunctor (Bazaar p) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

ifmap :: (s -> t) -> Bazaar p a b s -> Bazaar p a b t

Functor (Bazaar p a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

fmap :: (a0 -> b0) -> Bazaar p a b a0 -> Bazaar p a b b0 #

(<$) :: a0 -> Bazaar p a b b0 -> Bazaar p a b a0 #

Applicative (Bazaar p a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

pure :: a0 -> Bazaar p a b a0 #

(<*>) :: Bazaar p a b (a0 -> b0) -> Bazaar p a b a0 -> Bazaar p a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b c #

(*>) :: Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b b0 #

(<*) :: Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b a0 #

(a ~ b, Conjoined p) => Comonad (Bazaar p a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

extract :: Bazaar p a b a0 -> a0 #

duplicate :: Bazaar p a b a0 -> Bazaar p a b (Bazaar p a b a0) #

extend :: (Bazaar p a b a0 -> b0) -> Bazaar p a b a0 -> Bazaar p a b b0 #

(a ~ b, Conjoined p) => ComonadApply (Bazaar p a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

(<@>) :: Bazaar p a b (a0 -> b0) -> Bazaar p a b a0 -> Bazaar p a b b0 #

(@>) :: Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b b0 #

(<@) :: Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b a0 #

Apply (Bazaar p a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

(<.>) :: Bazaar p a b (a0 -> b0) -> Bazaar p a b a0 -> Bazaar p a b b0 #

(.>) :: Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b b0 #

(<.) :: Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b a0 #

liftF2 :: (a0 -> b0 -> c) -> Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b c #

type Bazaar' (p :: Type -> Type -> Type) a = Bazaar p a a #

newtype Bazaar1 (p :: Type -> Type -> Type) a b t #

Constructors

Bazaar1 

Fields

Instances
Corepresentable p => Sellable p (Bazaar1 p) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

sell :: p a (Bazaar1 p a b b)

Profunctor p => Bizarre1 p (Bazaar1 p) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

bazaar1 :: Apply f => p a (f b) -> Bazaar1 p a b t -> f t

Conjoined p => IndexedComonad (Bazaar1 p) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

iextract :: Bazaar1 p a a t -> t

iduplicate :: Bazaar1 p a c t -> Bazaar1 p a b (Bazaar1 p b c t)

iextend :: (Bazaar1 p b c t -> r) -> Bazaar1 p a c t -> Bazaar1 p a b r

IndexedFunctor (Bazaar1 p) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

ifmap :: (s -> t) -> Bazaar1 p a b s -> Bazaar1 p a b t

Functor (Bazaar1 p a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

fmap :: (a0 -> b0) -> Bazaar1 p a b a0 -> Bazaar1 p a b b0 #

(<$) :: a0 -> Bazaar1 p a b b0 -> Bazaar1 p a b a0 #

(a ~ b, Conjoined p) => Comonad (Bazaar1 p a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

extract :: Bazaar1 p a b a0 -> a0 #

duplicate :: Bazaar1 p a b a0 -> Bazaar1 p a b (Bazaar1 p a b a0) #

extend :: (Bazaar1 p a b a0 -> b0) -> Bazaar1 p a b a0 -> Bazaar1 p a b b0 #

(a ~ b, Conjoined p) => ComonadApply (Bazaar1 p a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

(<@>) :: Bazaar1 p a b (a0 -> b0) -> Bazaar1 p a b a0 -> Bazaar1 p a b b0 #

(@>) :: Bazaar1 p a b a0 -> Bazaar1 p a b b0 -> Bazaar1 p a b b0 #

(<@) :: Bazaar1 p a b a0 -> Bazaar1 p a b b0 -> Bazaar1 p a b a0 #

Apply (Bazaar1 p a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

(<.>) :: Bazaar1 p a b (a0 -> b0) -> Bazaar1 p a b a0 -> Bazaar1 p a b b0 #

(.>) :: Bazaar1 p a b a0 -> Bazaar1 p a b b0 -> Bazaar1 p a b b0 #

(<.) :: Bazaar1 p a b a0 -> Bazaar1 p a b b0 -> Bazaar1 p a b a0 #

liftF2 :: (a0 -> b0 -> c) -> Bazaar1 p a b a0 -> Bazaar1 p a b b0 -> Bazaar1 p a b c #

type Bazaar1' (p :: Type -> Type -> Type) a = Bazaar1 p a a #

data Context a b t #

Constructors

Context (b -> t) a 
Instances
IndexedComonad Context 
Instance details

Defined in Control.Lens.Internal.Context

Methods

iextract :: Context a a t -> t

iduplicate :: Context a c t -> Context a b (Context b c t)

iextend :: (Context b c t -> r) -> Context a c t -> Context a b r

IndexedFunctor Context 
Instance details

Defined in Control.Lens.Internal.Context

Methods

ifmap :: (s -> t) -> Context a b s -> Context a b t

IndexedComonadStore Context 
Instance details

Defined in Control.Lens.Internal.Context

Methods

ipos :: Context a c t -> a

ipeek :: c -> Context a c t -> t

ipeeks :: (a -> c) -> Context a c t -> t

iseek :: b -> Context a c t -> Context b c t

iseeks :: (a -> b) -> Context a c t -> Context b c t

iexperiment :: Functor f => (b -> f c) -> Context b c t -> f t

context :: Context a b t -> Context a b t

a ~ b => ComonadStore a (Context a b) 
Instance details

Defined in Control.Lens.Internal.Context

Methods

pos :: Context a b a0 -> a #

peek :: a -> Context a b a0 -> a0 #

peeks :: (a -> a) -> Context a b a0 -> a0 #

seek :: a -> Context a b a0 -> Context a b a0 #

seeks :: (a -> a) -> Context a b a0 -> Context a b a0 #

experiment :: Functor f => (a -> f a) -> Context a b a0 -> f a0 #

Functor (Context a b) 
Instance details

Defined in Control.Lens.Internal.Context

Methods

fmap :: (a0 -> b0) -> Context a b a0 -> Context a b b0 #

(<$) :: a0 -> Context a b b0 -> Context a b a0 #

a ~ b => Comonad (Context a b) 
Instance details

Defined in Control.Lens.Internal.Context

Methods

extract :: Context a b a0 -> a0 #

duplicate :: Context a b a0 -> Context a b (Context a b a0) #

extend :: (Context a b a0 -> b0) -> Context a b a0 -> Context a b b0 #

Sellable ((->) :: Type -> Type -> Type) Context 
Instance details

Defined in Control.Lens.Internal.Context

Methods

sell :: a -> Context a b b

type Context' a = Context a a #

data DefName #

Instances
Eq DefName 
Instance details

Defined in Control.Lens.Internal.FieldTH

Methods

(==) :: DefName -> DefName -> Bool #

(/=) :: DefName -> DefName -> Bool #

Ord DefName 
Instance details

Defined in Control.Lens.Internal.FieldTH

Show DefName 
Instance details

Defined in Control.Lens.Internal.FieldTH

type FieldNamer = Name -> [Name] -> Name -> [DefName] #

data Leftmost a #

Instances
Semigroup (Leftmost a) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: Leftmost a -> Leftmost a -> Leftmost a #

sconcat :: NonEmpty (Leftmost a) -> Leftmost a #

stimes :: Integral b => b -> Leftmost a -> Leftmost a #

Monoid (Leftmost a) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

mempty :: Leftmost a #

mappend :: Leftmost a -> Leftmost a -> Leftmost a #

mconcat :: [Leftmost a] -> Leftmost a #

data Rightmost a #

Instances
Semigroup (Rightmost a) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: Rightmost a -> Rightmost a -> Rightmost a #

sconcat :: NonEmpty (Rightmost a) -> Rightmost a #

stimes :: Integral b => b -> Rightmost a -> Rightmost a #

Monoid (Rightmost a) 
Instance details

Defined in Control.Lens.Internal.Fold

data Sequenced a (m :: Type -> Type) #

Instances
Monad m => Semigroup (Sequenced a m) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: Sequenced a m -> Sequenced a m -> Sequenced a m #

sconcat :: NonEmpty (Sequenced a m) -> Sequenced a m #

stimes :: Integral b => b -> Sequenced a m -> Sequenced a m #

Monad m => Monoid (Sequenced a m) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

mempty :: Sequenced a m #

mappend :: Sequenced a m -> Sequenced a m -> Sequenced a m #

mconcat :: [Sequenced a m] -> Sequenced a m #

data Traversed a (f :: Type -> Type) #

Instances
Applicative f => Semigroup (Traversed a f) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: Traversed a f -> Traversed a f -> Traversed a f #

sconcat :: NonEmpty (Traversed a f) -> Traversed a f #

stimes :: Integral b => b -> Traversed a f -> Traversed a f #

Applicative f => Monoid (Traversed a f) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

mempty :: Traversed a f #

mappend :: Traversed a f -> Traversed a f -> Traversed a f #

mconcat :: [Traversed a f] -> Traversed a f #

class (Choice p, Corepresentable p, Comonad (Corep p), Traversable (Corep p), Strong p, Representable p, Monad (Rep p), MonadFix (Rep p), Distributive (Rep p), Costrong p, ArrowLoop p, ArrowApply p, ArrowChoice p, Closed p) => Conjoined (p :: Type -> Type -> Type) where #

Minimal complete definition

Nothing

Methods

distrib :: Functor f => p a b -> p (f a) (f b) #

conjoined :: ((p ~ ((->) :: Type -> Type -> Type)) -> q (a -> b) r) -> q (p a b) r -> q (p a b) r #

Instances
Conjoined ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Methods

distrib :: Functor f => ReifiedGetter a b -> ReifiedGetter (f a) (f b) #

conjoined :: ((ReifiedGetter ~ (->)) -> q (a -> b) r) -> q (ReifiedGetter a b) r -> q (ReifiedGetter a b) r #

Conjoined (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

distrib :: Functor f => Indexed i a b -> Indexed i (f a) (f b) #

conjoined :: ((Indexed i ~ (->)) -> q (a -> b) r) -> q (Indexed i a b) r -> q (Indexed i a b) r #

Conjoined ((->) :: Type -> Type -> Type) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

distrib :: Functor f => (a -> b) -> f a -> f b #

conjoined :: (((->) ~ (->)) -> q (a -> b) r) -> q (a -> b) r -> q (a -> b) r #

class Conjoined p => Indexable i (p :: Type -> Type -> Type) where #

Methods

indexed :: p a b -> i -> a -> b #

Instances
i ~ j => Indexable i (Indexed j) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

indexed :: Indexed j a b -> i -> a -> b #

Indexable i ((->) :: Type -> Type -> Type) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

indexed :: (a -> b) -> i -> a -> b #

newtype Indexed i a b #

Constructors

Indexed 

Fields

Instances
i ~ j => Indexable i (Indexed j) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

indexed :: Indexed j a b -> i -> a -> b #

Arrow (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

arr :: (b -> c) -> Indexed i b c #

first :: Indexed i b c -> Indexed i (b, d) (c, d) #

second :: Indexed i b c -> Indexed i (d, b) (d, c) #

(***) :: Indexed i b c -> Indexed i b' c' -> Indexed i (b, b') (c, c') #

(&&&) :: Indexed i b c -> Indexed i b c' -> Indexed i b (c, c') #

ArrowChoice (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

left :: Indexed i b c -> Indexed i (Either b d) (Either c d) #

right :: Indexed i b c -> Indexed i (Either d b) (Either d c) #

(+++) :: Indexed i b c -> Indexed i b' c' -> Indexed i (Either b b') (Either c c') #

(|||) :: Indexed i b d -> Indexed i c d -> Indexed i (Either b c) d #

ArrowApply (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

app :: Indexed i (Indexed i b c, b) c #

ArrowLoop (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

loop :: Indexed i (b, d) (c, d) -> Indexed i b c #

Profunctor (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

dimap :: (a -> b) -> (c -> d) -> Indexed i b c -> Indexed i a d #

lmap :: (a -> b) -> Indexed i b c -> Indexed i a c #

rmap :: (b -> c) -> Indexed i a b -> Indexed i a c #

(#.) :: Coercible c b => q b c -> Indexed i a b -> Indexed i a c #

(.#) :: Coercible b a => Indexed i b c -> q a b -> Indexed i a c #

Representable (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Associated Types

type Rep (Indexed i) :: Type -> Type #

Methods

tabulate :: (d -> Rep (Indexed i) c) -> Indexed i d c #

Corepresentable (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Associated Types

type Corep (Indexed i) :: Type -> Type #

Methods

cotabulate :: (Corep (Indexed i) d -> c) -> Indexed i d c #

Choice (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

left' :: Indexed i a b -> Indexed i (Either a c) (Either b c) #

right' :: Indexed i a b -> Indexed i (Either c a) (Either c b) #

Closed (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

closed :: Indexed i a b -> Indexed i (x -> a) (x -> b) #

Strong (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

first' :: Indexed i a b -> Indexed i (a, c) (b, c) #

second' :: Indexed i a b -> Indexed i (c, a) (c, b) #

Costrong (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

unfirst :: Indexed i (a, d) (b, d) -> Indexed i a b #

unsecond :: Indexed i (d, a) (d, b) -> Indexed i a b #

Conjoined (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

distrib :: Functor f => Indexed i a b -> Indexed i (f a) (f b) #

conjoined :: ((Indexed i ~ (->)) -> q (a -> b) r) -> q (Indexed i a b) r -> q (Indexed i a b) r #

Bizarre (Indexed Int) Mafic 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

bazaar :: Applicative f => Indexed Int a (f b) -> Mafic a b t -> f t

Category (Indexed i :: Type -> Type -> Type) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

id :: Indexed i a a #

(.) :: Indexed i b c -> Indexed i a b -> Indexed i a c #

Cosieve (Indexed i) ((,) i) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

cosieve :: Indexed i a b -> (i, a) -> b #

Bizarre (Indexed i) (Molten i) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

bazaar :: Applicative f => Indexed i a (f b) -> Molten i a b t -> f t

Sellable (Indexed i) (Molten i) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

sell :: Indexed i a (Molten i a b b)

Sieve (Indexed i) ((->) i :: Type -> Type) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

sieve :: Indexed i a b -> a -> i -> b #

Monad (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

(>>=) :: Indexed i a a0 -> (a0 -> Indexed i a b) -> Indexed i a b #

(>>) :: Indexed i a a0 -> Indexed i a b -> Indexed i a b #

return :: a0 -> Indexed i a a0 #

fail :: String -> Indexed i a a0 #

Functor (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

fmap :: (a0 -> b) -> Indexed i a a0 -> Indexed i a b #

(<$) :: a0 -> Indexed i a b -> Indexed i a a0 #

MonadFix (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

mfix :: (a0 -> Indexed i a a0) -> Indexed i a a0 #

Applicative (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

pure :: a0 -> Indexed i a a0 #

(<*>) :: Indexed i a (a0 -> b) -> Indexed i a a0 -> Indexed i a b #

liftA2 :: (a0 -> b -> c) -> Indexed i a a0 -> Indexed i a b -> Indexed i a c #

(*>) :: Indexed i a a0 -> Indexed i a b -> Indexed i a b #

(<*) :: Indexed i a a0 -> Indexed i a b -> Indexed i a a0 #

Apply (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

(<.>) :: Indexed i a (a0 -> b) -> Indexed i a a0 -> Indexed i a b #

(.>) :: Indexed i a a0 -> Indexed i a b -> Indexed i a b #

(<.) :: Indexed i a a0 -> Indexed i a b -> Indexed i a a0 #

liftF2 :: (a0 -> b -> c) -> Indexed i a a0 -> Indexed i a b -> Indexed i a c #

Bind (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

(>>-) :: Indexed i a a0 -> (a0 -> Indexed i a b) -> Indexed i a b #

join :: Indexed i a (Indexed i a a0) -> Indexed i a a0 #

type Rep (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

type Rep (Indexed i) = ((->) i :: Type -> Type)
type Corep (Indexed i) 
Instance details

Defined in Control.Lens.Internal.Indexed

type Corep (Indexed i) = (,) i

data Level i a #

Instances
FoldableWithIndex i (Level i) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (i -> a -> m) -> Level i a -> m #

ifolded :: IndexedFold i (Level i a) a #

ifoldr :: (i -> a -> b -> b) -> b -> Level i a -> b #

ifoldl :: (i -> b -> a -> b) -> b -> Level i a -> b #

ifoldr' :: (i -> a -> b -> b) -> b -> Level i a -> b #

ifoldl' :: (i -> b -> a -> b) -> b -> Level i a -> b #

FunctorWithIndex i (Level i) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (i -> a -> b) -> Level i a -> Level i b #

imapped :: IndexedSetter i (Level i a) (Level i b) a b #

TraversableWithIndex i (Level i) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (i -> a -> f b) -> Level i a -> f (Level i b) #

itraversed :: IndexedTraversal i (Level i a) (Level i b) a b #

Functor (Level i) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

fmap :: (a -> b) -> Level i a -> Level i b #

(<$) :: a -> Level i b -> Level i a #

Foldable (Level i) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

fold :: Monoid m => Level i m -> m #

foldMap :: Monoid m => (a -> m) -> Level i a -> m #

foldr :: (a -> b -> b) -> b -> Level i a -> b #

foldr' :: (a -> b -> b) -> b -> Level i a -> b #

foldl :: (b -> a -> b) -> b -> Level i a -> b #

foldl' :: (b -> a -> b) -> b -> Level i a -> b #

foldr1 :: (a -> a -> a) -> Level i a -> a #

foldl1 :: (a -> a -> a) -> Level i a -> a #

toList :: Level i a -> [a] #

null :: Level i a -> Bool #

length :: Level i a -> Int #

elem :: Eq a => a -> Level i a -> Bool #

maximum :: Ord a => Level i a -> a #

minimum :: Ord a => Level i a -> a #

sum :: Num a => Level i a -> a #

product :: Num a => Level i a -> a #

Traversable (Level i) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

traverse :: Applicative f => (a -> f b) -> Level i a -> f (Level i b) #

sequenceA :: Applicative f => Level i (f a) -> f (Level i a) #

mapM :: Monad m => (a -> m b) -> Level i a -> m (Level i b) #

sequence :: Monad m => Level i (m a) -> m (Level i a) #

(Eq i, Eq a) => Eq (Level i a) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

(==) :: Level i a -> Level i a -> Bool #

(/=) :: Level i a -> Level i a -> Bool #

(Ord i, Ord a) => Ord (Level i a) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

compare :: Level i a -> Level i a -> Ordering #

(<) :: Level i a -> Level i a -> Bool #

(<=) :: Level i a -> Level i a -> Bool #

(>) :: Level i a -> Level i a -> Bool #

(>=) :: Level i a -> Level i a -> Bool #

max :: Level i a -> Level i a -> Level i a #

min :: Level i a -> Level i a -> Level i a #

(Read i, Read a) => Read (Level i a) 
Instance details

Defined in Control.Lens.Internal.Level

(Show i, Show a) => Show (Level i a) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

showsPrec :: Int -> Level i a -> ShowS #

show :: Level i a -> String #

showList :: [Level i a] -> ShowS #

data Magma i t b a #

Instances
FoldableWithIndex i (Magma i t b) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (i -> a -> m) -> Magma i t b a -> m #

ifolded :: IndexedFold i (Magma i t b a) a #

ifoldr :: (i -> a -> b0 -> b0) -> b0 -> Magma i t b a -> b0 #

ifoldl :: (i -> b0 -> a -> b0) -> b0 -> Magma i t b a -> b0 #

ifoldr' :: (i -> a -> b0 -> b0) -> b0 -> Magma i t b a -> b0 #

ifoldl' :: (i -> b0 -> a -> b0) -> b0 -> Magma i t b a -> b0 #

FunctorWithIndex i (Magma i t b) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (i -> a -> b0) -> Magma i t b a -> Magma i t b b0 #

imapped :: IndexedSetter i (Magma i t b a) (Magma i t b b0) a b0 #

TraversableWithIndex i (Magma i t b) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (i -> a -> f b0) -> Magma i t b a -> f (Magma i t b b0) #

itraversed :: IndexedTraversal i (Magma i t b a) (Magma i t b b0) a b0 #

Functor (Magma i t b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

fmap :: (a -> b0) -> Magma i t b a -> Magma i t b b0 #

(<$) :: a -> Magma i t b b0 -> Magma i t b a #

Foldable (Magma i t b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

fold :: Monoid m => Magma i t b m -> m #

foldMap :: Monoid m => (a -> m) -> Magma i t b a -> m #

foldr :: (a -> b0 -> b0) -> b0 -> Magma i t b a -> b0 #

foldr' :: (a -> b0 -> b0) -> b0 -> Magma i t b a -> b0 #

foldl :: (b0 -> a -> b0) -> b0 -> Magma i t b a -> b0 #

foldl' :: (b0 -> a -> b0) -> b0 -> Magma i t b a -> b0 #

foldr1 :: (a -> a -> a) -> Magma i t b a -> a #

foldl1 :: (a -> a -> a) -> Magma i t b a -> a #

toList :: Magma i t b a -> [a] #

null :: Magma i t b a -> Bool #

length :: Magma i t b a -> Int #

elem :: Eq a => a -> Magma i t b a -> Bool #

maximum :: Ord a => Magma i t b a -> a #

minimum :: Ord a => Magma i t b a -> a #

sum :: Num a => Magma i t b a -> a #

product :: Num a => Magma i t b a -> a #

Traversable (Magma i t b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

traverse :: Applicative f => (a -> f b0) -> Magma i t b a -> f (Magma i t b b0) #

sequenceA :: Applicative f => Magma i t b (f a) -> f (Magma i t b a) #

mapM :: Monad m => (a -> m b0) -> Magma i t b a -> m (Magma i t b b0) #

sequence :: Monad m => Magma i t b (m a) -> m (Magma i t b a) #

(Show i, Show a) => Show (Magma i t b a) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

showsPrec :: Int -> Magma i t b a -> ShowS #

show :: Magma i t b a -> String #

showList :: [Magma i t b a] -> ShowS #

class (Profunctor p, Bifunctor p) => Reviewable (p :: Type -> Type -> Type) #

Instances
(Profunctor p, Bifunctor p) => Reviewable p 
Instance details

Defined in Control.Lens.Internal.Review

class (Applicative f, Distributive f, Traversable f) => Settable (f :: Type -> Type) #

Minimal complete definition

untainted

Instances
Settable Identity 
Instance details

Defined in Control.Lens.Internal.Setter

Methods

untainted :: Identity a -> a

untaintedDot :: Profunctor p => p a (Identity b) -> p a b

taintedDot :: Profunctor p => p a b -> p a (Identity b)

Settable f => Settable (Backwards f) 
Instance details

Defined in Control.Lens.Internal.Setter

Methods

untainted :: Backwards f a -> a

untaintedDot :: Profunctor p => p a (Backwards f b) -> p a b

taintedDot :: Profunctor p => p a b -> p a (Backwards f b)

(Settable f, Settable g) => Settable (Compose f g) 
Instance details

Defined in Control.Lens.Internal.Setter

Methods

untainted :: Compose f g a -> a

untaintedDot :: Profunctor p => p a (Compose f g b) -> p a b

taintedDot :: Profunctor p => p a b -> p a (Compose f g b)

type AnIso s t a b = Exchange a b a (Identity b) -> Exchange a b s (Identity t) #

type AnIso' s a = AnIso s s a a #

class Strict lazy strict | lazy -> strict, strict -> lazy where #

Methods

strict :: Iso' lazy strict #

Instances
Strict ByteString ByteString 
Instance details

Defined in Control.Lens.Iso

Strict Text Text 
Instance details

Defined in Control.Lens.Iso

Methods

strict :: Iso' Text Text0 #

Strict (ST s a) (ST s a) 
Instance details

Defined in Control.Lens.Iso

Methods

strict :: Iso' (ST s a) (ST0 s a) #

Strict (WriterT w m a) (WriterT w m a) 
Instance details

Defined in Control.Lens.Iso

Methods

strict :: Iso' (WriterT0 w m a) (WriterT w m a) #

Strict (StateT s m a) (StateT s m a) 
Instance details

Defined in Control.Lens.Iso

Methods

strict :: Iso' (StateT0 s m a) (StateT s m a) #

Strict (RWST r w s m a) (RWST r w s m a) 
Instance details

Defined in Control.Lens.Iso

Methods

strict :: Iso' (RWST0 r w s m a) (RWST r w s m a) #

class Bifunctor p => Swapped (p :: Type -> Type -> Type) where #

Methods

swapped :: Iso (p a b) (p c d) (p b a) (p d c) #

Instances
Swapped Either 
Instance details

Defined in Control.Lens.Iso

Methods

swapped :: Iso (Either a b) (Either c d) (Either b a) (Either d c) #

Swapped (,) 
Instance details

Defined in Control.Lens.Iso

Methods

swapped :: Iso (a, b) (c, d) (b, a) (d, c) #

type ALens s t a b = LensLike (Pretext ((->) :: Type -> Type -> Type) a b) s t a b #

type ALens' s a = ALens s s a a #

type AnIndexedLens i s t a b = Optical (Indexed i) ((->) :: Type -> Type -> Type) (Pretext (Indexed i) a b) s t a b #

type AnIndexedLens' i s a = AnIndexedLens i s s a a #

class GPlated a (g :: k -> Type) #

Minimal complete definition

gplate'

Instances
GPlated a (V1 :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate' :: Traversal' (V1 p) a

GPlated a (U1 :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate' :: Traversal' (U1 p) a

GPlated a (URec b :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate' :: Traversal' (URec b p) a

GPlated a (K1 i a :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate' :: Traversal' (K1 i a p) a

GPlated a (K1 i b :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate' :: Traversal' (K1 i b p) a

(GPlated a f, GPlated a g) => GPlated a (f :+: g :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate' :: Traversal' ((f :+: g) p) a

(GPlated a f, GPlated a g) => GPlated a (f :*: g :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate' :: Traversal' ((f :*: g) p) a

GPlated a f => GPlated a (M1 i c f :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate' :: Traversal' (M1 i c f p) a

class GPlated1 (f :: k -> Type) (g :: k -> Type) #

Minimal complete definition

gplate1'

Instances
GPlated1 (f :: k -> Type) (V1 :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate1' :: Traversal' (V1 a) (f a)

GPlated1 (f :: k -> Type) (U1 :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate1' :: Traversal' (U1 a) (f a)

GPlated1 (f :: k -> Type) (URec a :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate1' :: Traversal' (URec a a0) (f a0)

GPlated1 (f :: k -> Type) (Rec1 f :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate1' :: Traversal' (Rec1 f a) (f a)

GPlated1 (f :: k -> Type) (Rec1 g :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate1' :: Traversal' (Rec1 g a) (f a)

GPlated1 (f :: k -> Type) (K1 i a :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate1' :: Traversal' (K1 i a a0) (f a0)

(GPlated1 f g, GPlated1 f h) => GPlated1 (f :: k -> Type) (g :+: h :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate1' :: Traversal' ((g :+: h) a) (f a)

(GPlated1 f g, GPlated1 f h) => GPlated1 (f :: k -> Type) (g :*: h :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate1' :: Traversal' ((g :*: h) a) (f a)

GPlated1 f g => GPlated1 (f :: k -> Type) (M1 i c g :: k -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate1' :: Traversal' (M1 i c g a) (f a)

(Traversable t, GPlated1 f g) => GPlated1 (f :: k1 -> Type) (t :.: g :: k1 -> Type) 
Instance details

Defined in Control.Lens.Plated

Methods

gplate1' :: Traversal' ((t :.: g) a) (f a)

GPlated1 (f :: Type -> Type) Par1 
Instance details

Defined in Control.Lens.Plated

Methods

gplate1' :: Traversal' (Par1 a) (f a)

class Plated a where #

Minimal complete definition

Nothing

Methods

plate :: Traversal' a a #

Instances
Plated Exp 
Instance details

Defined in Control.Lens.Plated

Plated Pat 
Instance details

Defined in Control.Lens.Plated

Plated Type 
Instance details

Defined in Control.Lens.Plated

Plated Dec 
Instance details

Defined in Control.Lens.Plated

Plated Con 
Instance details

Defined in Control.Lens.Plated

Plated Stmt 
Instance details

Defined in Control.Lens.Plated

Plated [a] 
Instance details

Defined in Control.Lens.Plated

Methods

plate :: Traversal' [a] [a] #

Plated (Tree a) 
Instance details

Defined in Control.Lens.Plated

Methods

plate :: Traversal' (Tree a) (Tree a) #

Traversable f => Plated (Cofree f a) 
Instance details

Defined in Control.Lens.Plated

Methods

plate :: Traversal' (Cofree f a) (Cofree f a) #

Traversable f => Plated (F f a) 
Instance details

Defined in Control.Lens.Plated

Methods

plate :: Traversal' (F f a) (F f a) #

Traversable f => Plated (Free f a) 
Instance details

Defined in Control.Lens.Plated

Methods

plate :: Traversal' (Free f a) (Free f a) #

(Traversable f, Traversable w) => Plated (CofreeT f w a) 
Instance details

Defined in Control.Lens.Plated

Methods

plate :: Traversal' (CofreeT f w a) (CofreeT f w a) #

(Traversable f, Traversable m) => Plated (FreeT f m a) 
Instance details

Defined in Control.Lens.Plated

Methods

plate :: Traversal' (FreeT f m a) (FreeT f m a) #

type APrism s t a b = Market a b a (Identity b) -> Market a b s (Identity t) #

type APrism' s a = APrism s s a a #

newtype ReifiedFold s a #

Constructors

Fold 

Fields

Instances
Arrow ReifiedFold 
Instance details

Defined in Control.Lens.Reified

Methods

arr :: (b -> c) -> ReifiedFold b c #

first :: ReifiedFold b c -> ReifiedFold (b, d) (c, d) #

second :: ReifiedFold b c -> ReifiedFold (d, b) (d, c) #

(***) :: ReifiedFold b c -> ReifiedFold b' c' -> ReifiedFold (b, b') (c, c') #

(&&&) :: ReifiedFold b c -> ReifiedFold b c' -> ReifiedFold b (c, c') #

ArrowChoice ReifiedFold 
Instance details

Defined in Control.Lens.Reified

Methods

left :: ReifiedFold b c -> ReifiedFold (Either b d) (Either c d) #

right :: ReifiedFold b c -> ReifiedFold (Either d b) (Either d c) #

(+++) :: ReifiedFold b c -> ReifiedFold b' c' -> ReifiedFold (Either b b') (Either c c') #

(|||) :: ReifiedFold b d -> ReifiedFold c d -> ReifiedFold (Either b c) d #

ArrowApply ReifiedFold 
Instance details

Defined in Control.Lens.Reified

Methods

app :: ReifiedFold (ReifiedFold b c, b) c #

Profunctor ReifiedFold 
Instance details

Defined in Control.Lens.Reified

Methods

dimap :: (a -> b) -> (c -> d) -> ReifiedFold b c -> ReifiedFold a d #

lmap :: (a -> b) -> ReifiedFold b c -> ReifiedFold a c #

rmap :: (b -> c) -> ReifiedFold a b -> ReifiedFold a c #

(#.) :: Coercible c b => q b c -> ReifiedFold a b -> ReifiedFold a c #

(.#) :: Coercible b a => ReifiedFold b c -> q a b -> ReifiedFold a c #

Representable ReifiedFold 
Instance details

Defined in Control.Lens.Reified

Associated Types

type Rep ReifiedFold :: Type -> Type #

Methods

tabulate :: (d -> Rep ReifiedFold c) -> ReifiedFold d c #

Choice ReifiedFold 
Instance details

Defined in Control.Lens.Reified

Methods

left' :: ReifiedFold a b -> ReifiedFold (Either a c) (Either b c) #

right' :: ReifiedFold a b -> ReifiedFold (Either c a) (Either c b) #

Strong ReifiedFold 
Instance details

Defined in Control.Lens.Reified

Methods

first' :: ReifiedFold a b -> ReifiedFold (a, c) (b, c) #

second' :: ReifiedFold a b -> ReifiedFold (c, a) (c, b) #

Sieve ReifiedFold [] 
Instance details

Defined in Control.Lens.Reified

Methods

sieve :: ReifiedFold a b -> a -> [b] #

MonadReader s (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

ask :: ReifiedFold s s #

local :: (s -> s) -> ReifiedFold s a -> ReifiedFold s a #

reader :: (s -> a) -> ReifiedFold s a #

Monad (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

(>>=) :: ReifiedFold s a -> (a -> ReifiedFold s b) -> ReifiedFold s b #

(>>) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s b #

return :: a -> ReifiedFold s a #

fail :: String -> ReifiedFold s a #

Functor (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedFold s a -> ReifiedFold s b #

(<$) :: a -> ReifiedFold s b -> ReifiedFold s a #

Applicative (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

pure :: a -> ReifiedFold s a #

(<*>) :: ReifiedFold s (a -> b) -> ReifiedFold s a -> ReifiedFold s b #

liftA2 :: (a -> b -> c) -> ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s c #

(*>) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s b #

(<*) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s a #

MonadPlus (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

mzero :: ReifiedFold s a #

mplus :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

Alternative (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

empty :: ReifiedFold s a #

(<|>) :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

some :: ReifiedFold s a -> ReifiedFold s [a] #

many :: ReifiedFold s a -> ReifiedFold s [a] #

Plus (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

zero :: ReifiedFold s a #

Alt (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Apply (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

(<.>) :: ReifiedFold s (a -> b) -> ReifiedFold s a -> ReifiedFold s b #

(.>) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s b #

(<.) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s a #

liftF2 :: (a -> b -> c) -> ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s c #

Bind (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

(>>-) :: ReifiedFold s a -> (a -> ReifiedFold s b) -> ReifiedFold s b #

join :: ReifiedFold s (ReifiedFold s a) -> ReifiedFold s a #

Category ReifiedFold 
Instance details

Defined in Control.Lens.Reified

Methods

id :: ReifiedFold a a #

(.) :: ReifiedFold b c -> ReifiedFold a b -> ReifiedFold a c #

Semigroup (ReifiedFold s a) 
Instance details

Defined in Control.Lens.Reified

Methods

(<>) :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

sconcat :: NonEmpty (ReifiedFold s a) -> ReifiedFold s a #

stimes :: Integral b => b -> ReifiedFold s a -> ReifiedFold s a #

Monoid (ReifiedFold s a) 
Instance details

Defined in Control.Lens.Reified

Methods

mempty :: ReifiedFold s a #

mappend :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

mconcat :: [ReifiedFold s a] -> ReifiedFold s a #

type Rep ReifiedFold 
Instance details

Defined in Control.Lens.Reified

type Rep ReifiedFold = []

newtype ReifiedGetter s a #

Constructors

Getter 

Fields

Instances
Arrow ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Methods

arr :: (b -> c) -> ReifiedGetter b c #

first :: ReifiedGetter b c -> ReifiedGetter (b, d) (c, d) #

second :: ReifiedGetter b c -> ReifiedGetter (d, b) (d, c) #

(***) :: ReifiedGetter b c -> ReifiedGetter b' c' -> ReifiedGetter (b, b') (c, c') #

(&&&) :: ReifiedGetter b c -> ReifiedGetter b c' -> ReifiedGetter b (c, c') #

ArrowChoice ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Methods

left :: ReifiedGetter b c -> ReifiedGetter (Either b d) (Either c d) #

right :: ReifiedGetter b c -> ReifiedGetter (Either d b) (Either d c) #

(+++) :: ReifiedGetter b c -> ReifiedGetter b' c' -> ReifiedGetter (Either b b') (Either c c') #

(|||) :: ReifiedGetter b d -> ReifiedGetter c d -> ReifiedGetter (Either b c) d #

ArrowApply ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Methods

app :: ReifiedGetter (ReifiedGetter b c, b) c #

ArrowLoop ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Methods

loop :: ReifiedGetter (b, d) (c, d) -> ReifiedGetter b c #

Profunctor ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Methods

dimap :: (a -> b) -> (c -> d) -> ReifiedGetter b c -> ReifiedGetter a d #

lmap :: (a -> b) -> ReifiedGetter b c -> ReifiedGetter a c #

rmap :: (b -> c) -> ReifiedGetter a b -> ReifiedGetter a c #

(#.) :: Coercible c b => q b c -> ReifiedGetter a b -> ReifiedGetter a c #

(.#) :: Coercible b a => ReifiedGetter b c -> q a b -> ReifiedGetter a c #

Representable ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Associated Types

type Rep ReifiedGetter :: Type -> Type #

Methods

tabulate :: (d -> Rep ReifiedGetter c) -> ReifiedGetter d c #

Corepresentable ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Associated Types

type Corep ReifiedGetter :: Type -> Type #

Methods

cotabulate :: (Corep ReifiedGetter d -> c) -> ReifiedGetter d c #

Choice ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Methods

left' :: ReifiedGetter a b -> ReifiedGetter (Either a c) (Either b c) #

right' :: ReifiedGetter a b -> ReifiedGetter (Either c a) (Either c b) #

Closed ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Methods

closed :: ReifiedGetter a b -> ReifiedGetter (x -> a) (x -> b) #

Strong ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Methods

first' :: ReifiedGetter a b -> ReifiedGetter (a, c) (b, c) #

second' :: ReifiedGetter a b -> ReifiedGetter (c, a) (c, b) #

Costrong ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Methods

unfirst :: ReifiedGetter (a, d) (b, d) -> ReifiedGetter a b #

unsecond :: ReifiedGetter (d, a) (d, b) -> ReifiedGetter a b #

Conjoined ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Methods

distrib :: Functor f => ReifiedGetter a b -> ReifiedGetter (f a) (f b) #

conjoined :: ((ReifiedGetter ~ (->)) -> q (a -> b) r) -> q (ReifiedGetter a b) r -> q (ReifiedGetter a b) r #

Sieve ReifiedGetter Identity 
Instance details

Defined in Control.Lens.Reified

Methods

sieve :: ReifiedGetter a b -> a -> Identity b #

Cosieve ReifiedGetter Identity 
Instance details

Defined in Control.Lens.Reified

Methods

cosieve :: ReifiedGetter a b -> Identity a -> b #

MonadReader s (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

ask :: ReifiedGetter s s #

local :: (s -> s) -> ReifiedGetter s a -> ReifiedGetter s a #

reader :: (s -> a) -> ReifiedGetter s a #

Monad (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

(>>=) :: ReifiedGetter s a -> (a -> ReifiedGetter s b) -> ReifiedGetter s b #

(>>) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s b #

return :: a -> ReifiedGetter s a #

fail :: String -> ReifiedGetter s a #

Functor (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedGetter s a -> ReifiedGetter s b #

(<$) :: a -> ReifiedGetter s b -> ReifiedGetter s a #

Applicative (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

pure :: a -> ReifiedGetter s a #

(<*>) :: ReifiedGetter s (a -> b) -> ReifiedGetter s a -> ReifiedGetter s b #

liftA2 :: (a -> b -> c) -> ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s c #

(*>) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s b #

(<*) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s a #

Monoid s => Comonad (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Monoid s => ComonadApply (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

(<@>) :: ReifiedGetter s (a -> b) -> ReifiedGetter s a -> ReifiedGetter s b #

(@>) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s b #

(<@) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s a #

Distributive (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

distribute :: Functor f => f (ReifiedGetter s a) -> ReifiedGetter s (f a) #

collect :: Functor f => (a -> ReifiedGetter s b) -> f a -> ReifiedGetter s (f b) #

distributeM :: Monad m => m (ReifiedGetter s a) -> ReifiedGetter s (m a) #

collectM :: Monad m => (a -> ReifiedGetter s b) -> m a -> ReifiedGetter s (m b) #

Apply (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

(<.>) :: ReifiedGetter s (a -> b) -> ReifiedGetter s a -> ReifiedGetter s b #

(.>) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s b #

(<.) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s a #

liftF2 :: (a -> b -> c) -> ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s c #

Bind (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

(>>-) :: ReifiedGetter s a -> (a -> ReifiedGetter s b) -> ReifiedGetter s b #

join :: ReifiedGetter s (ReifiedGetter s a) -> ReifiedGetter s a #

Semigroup s => Extend (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Category ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

Methods

id :: ReifiedGetter a a #

(.) :: ReifiedGetter b c -> ReifiedGetter a b -> ReifiedGetter a c #

type Rep ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

type Corep ReifiedGetter 
Instance details

Defined in Control.Lens.Reified

newtype ReifiedIndexedFold i s a #

Constructors

IndexedFold 

Fields

Instances
Profunctor (ReifiedIndexedFold i) 
Instance details

Defined in Control.Lens.Reified

Methods

dimap :: (a -> b) -> (c -> d) -> ReifiedIndexedFold i b c -> ReifiedIndexedFold i a d #

lmap :: (a -> b) -> ReifiedIndexedFold i b c -> ReifiedIndexedFold i a c #

rmap :: (b -> c) -> ReifiedIndexedFold i a b -> ReifiedIndexedFold i a c #

(#.) :: Coercible c b => q b c -> ReifiedIndexedFold i a b -> ReifiedIndexedFold i a c #

(.#) :: Coercible b a => ReifiedIndexedFold i b c -> q a b -> ReifiedIndexedFold i a c #

Representable (ReifiedIndexedFold i) 
Instance details

Defined in Control.Lens.Reified

Associated Types

type Rep (ReifiedIndexedFold i) :: Type -> Type #

Methods

tabulate :: (d -> Rep (ReifiedIndexedFold i) c) -> ReifiedIndexedFold i d c #

Strong (ReifiedIndexedFold i) 
Instance details

Defined in Control.Lens.Reified

Methods

first' :: ReifiedIndexedFold i a b -> ReifiedIndexedFold i (a, c) (b, c) #

second' :: ReifiedIndexedFold i a b -> ReifiedIndexedFold i (c, a) (c, b) #

Sieve (ReifiedIndexedFold i) (Compose [] ((,) i)) 
Instance details

Defined in Control.Lens.Reified

Methods

sieve :: ReifiedIndexedFold i a b -> a -> Compose [] ((,) i) b #

Functor (ReifiedIndexedFold i s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedIndexedFold i s a -> ReifiedIndexedFold i s b #

(<$) :: a -> ReifiedIndexedFold i s b -> ReifiedIndexedFold i s a #

Plus (ReifiedIndexedFold i s) 
Instance details

Defined in Control.Lens.Reified

Methods

zero :: ReifiedIndexedFold i s a #

Alt (ReifiedIndexedFold i s) 
Instance details

Defined in Control.Lens.Reified

Semigroup (ReifiedIndexedFold i s a) 
Instance details

Defined in Control.Lens.Reified

Monoid (ReifiedIndexedFold i s a) 
Instance details

Defined in Control.Lens.Reified

type Rep (ReifiedIndexedFold i) 
Instance details

Defined in Control.Lens.Reified

type Rep (ReifiedIndexedFold i) = Compose [] ((,) i)

newtype ReifiedIndexedGetter i s a #

Constructors

IndexedGetter 
Instances
Profunctor (ReifiedIndexedGetter i) 
Instance details

Defined in Control.Lens.Reified

Methods

dimap :: (a -> b) -> (c -> d) -> ReifiedIndexedGetter i b c -> ReifiedIndexedGetter i a d #

lmap :: (a -> b) -> ReifiedIndexedGetter i b c -> ReifiedIndexedGetter i a c #

rmap :: (b -> c) -> ReifiedIndexedGetter i a b -> ReifiedIndexedGetter i a c #

(#.) :: Coercible c b => q b c -> ReifiedIndexedGetter i a b -> ReifiedIndexedGetter i a c #

(.#) :: Coercible b a => ReifiedIndexedGetter i b c -> q a b -> ReifiedIndexedGetter i a c #

Representable (ReifiedIndexedGetter i) 
Instance details

Defined in Control.Lens.Reified

Associated Types

type Rep (ReifiedIndexedGetter i) :: Type -> Type #

Methods

tabulate :: (d -> Rep (ReifiedIndexedGetter i) c) -> ReifiedIndexedGetter i d c #

Strong (ReifiedIndexedGetter i) 
Instance details

Defined in Control.Lens.Reified

Methods

first' :: ReifiedIndexedGetter i a b -> ReifiedIndexedGetter i (a, c) (b, c) #

second' :: ReifiedIndexedGetter i a b -> ReifiedIndexedGetter i (c, a) (c, b) #

Sieve (ReifiedIndexedGetter i) ((,) i) 
Instance details

Defined in Control.Lens.Reified

Methods

sieve :: ReifiedIndexedGetter i a b -> a -> (i, b) #

Functor (ReifiedIndexedGetter i s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedIndexedGetter i s a -> ReifiedIndexedGetter i s b #

(<$) :: a -> ReifiedIndexedGetter i s b -> ReifiedIndexedGetter i s a #

Semigroup i => Apply (ReifiedIndexedGetter i s) 
Instance details

Defined in Control.Lens.Reified

type Rep (ReifiedIndexedGetter i) 
Instance details

Defined in Control.Lens.Reified

newtype ReifiedIndexedLens i s t a b #

Constructors

IndexedLens 

Fields

newtype ReifiedIndexedSetter i s t a b #

Constructors

IndexedSetter 

Fields

newtype ReifiedIndexedTraversal i s t a b #

Constructors

IndexedTraversal 

newtype ReifiedIso s t a b #

Constructors

Iso 

Fields

type ReifiedIso' s a = ReifiedIso s s a a #

newtype ReifiedLens s t a b #

Constructors

Lens 

Fields

type ReifiedLens' s a = ReifiedLens s s a a #

newtype ReifiedPrism s t a b #

Constructors

Prism 

Fields

type ReifiedPrism' s a = ReifiedPrism s s a a #

newtype ReifiedSetter s t a b #

Constructors

Setter 

Fields

type ReifiedSetter' s a = ReifiedSetter s s a a #

newtype ReifiedTraversal s t a b #

Constructors

Traversal 

Fields

type ASetter s t a b = (a -> Identity b) -> s -> Identity t #

type ASetter' s a = ASetter s s a a #

type AnIndexedSetter i s t a b = Indexed i a (Identity b) -> s -> Identity t #

type AnIndexedSetter' i s a = AnIndexedSetter i s s a a #

type Setting (p :: Type -> Type -> Type) s t a b = p a (Identity b) -> s -> Identity t #

type Setting' (p :: Type -> Type -> Type) s a = Setting p s s a a #

type ATraversal s t a b = LensLike (Bazaar ((->) :: Type -> Type -> Type) a b) s t a b #

type ATraversal' s a = ATraversal s s a a #

type ATraversal1 s t a b = LensLike (Bazaar1 ((->) :: Type -> Type -> Type) a b) s t a b #

type ATraversal1' s a = ATraversal1 s s a a #

type AnIndexedTraversal i s t a b = Over (Indexed i) (Bazaar (Indexed i) a b) s t a b #

type AnIndexedTraversal1 i s t a b = Over (Indexed i) (Bazaar1 (Indexed i) a b) s t a b #

class Ord k => TraverseMax k (m :: Type -> Type) | m -> k where #

Methods

traverseMax :: IndexedTraversal' k (m v) v #

Instances
TraverseMax Int IntMap 
Instance details

Defined in Control.Lens.Traversal

Ord k => TraverseMax k (Map k) 
Instance details

Defined in Control.Lens.Traversal

Methods

traverseMax :: IndexedTraversal' k (Map k v) v #

class Ord k => TraverseMin k (m :: Type -> Type) | m -> k where #

Methods

traverseMin :: IndexedTraversal' k (m v) v #

Instances
TraverseMin Int IntMap 
Instance details

Defined in Control.Lens.Traversal

Ord k => TraverseMin k (Map k) 
Instance details

Defined in Control.Lens.Traversal

Methods

traverseMin :: IndexedTraversal' k (Map k v) v #

type Traversing (p :: Type -> Type -> Type) (f :: Type -> Type) s t a b = Over p (BazaarT p f a b) s t a b #

type Traversing' (p :: Type -> Type -> Type) (f :: Type -> Type) s a = Traversing p f s s a a #

type Traversing1 (p :: Type -> Type -> Type) (f :: Type -> Type) s t a b = Over p (BazaarT1 p f a b) s t a b #

type Traversing1' (p :: Type -> Type -> Type) (f :: Type -> Type) s a = Traversing1 p f s s a a #

class Field1 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_1 :: Lens s t a b #

Instances
Field1 (Identity a) (Identity b) a b 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (Identity a) (Identity b) a b #

Field1 (V2 a) (V2 a) a a 
Instance details

Defined in Linear.V2

Methods

_1 :: Lens (V2 a) (V2 a) a a #

Field1 (V3 a) (V3 a) a a 
Instance details

Defined in Linear.V3

Methods

_1 :: Lens (V3 a) (V3 a) a a #

Field1 (V1 a) (V1 b) a b 
Instance details

Defined in Linear.V1

Methods

_1 :: Lens (V1 a) (V1 b) a b #

Field1 (Plucker a) (Plucker a) a a 
Instance details

Defined in Linear.Plucker

Methods

_1 :: Lens (Plucker a) (Plucker a) a a #

Field1 (Quaternion a) (Quaternion a) a a 
Instance details

Defined in Linear.Quaternion

Methods

_1 :: Lens (Quaternion a) (Quaternion a) a a #

Field1 (V4 a) (V4 a) a a 
Instance details

Defined in Linear.V4

Methods

_1 :: Lens (V4 a) (V4 a) a a #

Field1 (a, b) (a', b) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b) (a', b) a a' #

Field1 (a, b, c) (a', b, c) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c) (a', b, c) a a' #

1 <= n => Field1 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_1 :: Lens (V n a) (V n a) a a #

Field1 (a, b, c, d) (a', b, c, d) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c, d) (a', b, c, d) a a' #

Field1 ((f :*: g) p) ((f' :*: g) p) (f p) (f' p) 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens ((f :*: g) p) ((f' :*: g) p) (f p) (f' p) #

Field1 (Product f g a) (Product f' g a) (f a) (f' a) 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (Product f g a) (Product f' g a) (f a) (f' a) #

Field1 (a, b, c, d, e) (a', b, c, d, e) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c, d, e) (a', b, c, d, e) a a' #

Field1 (a, b, c, d, e, f) (a', b, c, d, e, f) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c, d, e, f) (a', b, c, d, e, f) a a' #

Field1 (a, b, c, d, e, f, g) (a', b, c, d, e, f, g) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c, d, e, f, g) (a', b, c, d, e, f, g) a a' #

Field1 (a, b, c, d, e, f, g, h) (a', b, c, d, e, f, g, h) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c, d, e, f, g, h) (a', b, c, d, e, f, g, h) a a' #

Field1 (a, b, c, d, e, f, g, h, i) (a', b, c, d, e, f, g, h, i) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c, d, e, f, g, h, i) (a', b, c, d, e, f, g, h, i) a a' #

Field1 (a, b, c, d, e, f, g, h, i, j) (a', b, c, d, e, f, g, h, i, j) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c, d, e, f, g, h, i, j) (a', b, c, d, e, f, g, h, i, j) a a' #

Field1 (a, b, c, d, e, f, g, h, i, j, kk) (a', b, c, d, e, f, g, h, i, j, kk) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c, d, e, f, g, h, i, j, kk) (a', b, c, d, e, f, g, h, i, j, kk) a a' #

Field1 (a, b, c, d, e, f, g, h, i, j, kk, l) (a', b, c, d, e, f, g, h, i, j, kk, l) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l) (a', b, c, d, e, f, g, h, i, j, kk, l) a a' #

Field1 (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a', b, c, d, e, f, g, h, i, j, kk, l, m) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a', b, c, d, e, f, g, h, i, j, kk, l, m) a a' #

Field1 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a', b, c, d, e, f, g, h, i, j, kk, l, m, n) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a', b, c, d, e, f, g, h, i, j, kk, l, m, n) a a' #

Field1 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a', b, c, d, e, f, g, h, i, j, kk, l, m, n, o) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a', b, c, d, e, f, g, h, i, j, kk, l, m, n, o) a a' #

Field1 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a', b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a', b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) a a' #

Field1 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a', b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a', b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) a a' #

Field1 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a', b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a', b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) a a' #

Field1 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a', b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) a a' 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a', b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) a a' #

class Field10 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_10 :: Lens s t a b #

Instances
10 <= n => Field10 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_10 :: Lens (V n a) (V n a) a a #

Field10 (a, b, c, d, e, f, g, h, i, j) (a, b, c, d, e, f, g, h, i, j') j j' 
Instance details

Defined in Control.Lens.Tuple

Methods

_10 :: Lens (a, b, c, d, e, f, g, h, i, j) (a, b, c, d, e, f, g, h, i, j') j j' #

Field10 (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c, d, e, f, g, h, i, j', kk) j j' 
Instance details

Defined in Control.Lens.Tuple

Methods

_10 :: Lens (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c, d, e, f, g, h, i, j', kk) j j' #

Field10 (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d, e, f, g, h, i, j', kk, l) j j' 
Instance details

Defined in Control.Lens.Tuple

Methods

_10 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d, e, f, g, h, i, j', kk, l) j j' #

Field10 (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e, f, g, h, i, j', kk, l, m) j j' 
Instance details

Defined in Control.Lens.Tuple

Methods

_10 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e, f, g, h, i, j', kk, l, m) j j' #

Field10 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f, g, h, i, j', kk, l, m, n) j j' 
Instance details

Defined in Control.Lens.Tuple

Methods

_10 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f, g, h, i, j', kk, l, m, n) j j' #

Field10 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g, h, i, j', kk, l, m, n, o) j j' 
Instance details

Defined in Control.Lens.Tuple

Methods

_10 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g, h, i, j', kk, l, m, n, o) j j' #

Field10 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h, i, j', kk, l, m, n, o, p) j j' 
Instance details

Defined in Control.Lens.Tuple

Methods

_10 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h, i, j', kk, l, m, n, o, p) j j' #

Field10 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i, j', kk, l, m, n, o, p, q) j j' 
Instance details

Defined in Control.Lens.Tuple

Methods

_10 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i, j', kk, l, m, n, o, p, q) j j' #

Field10 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j', kk, l, m, n, o, p, q, r) j j' 
Instance details

Defined in Control.Lens.Tuple

Methods

_10 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j', kk, l, m, n, o, p, q, r) j j' #

Field10 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j', kk, l, m, n, o, p, q, r, s) j j' 
Instance details

Defined in Control.Lens.Tuple

Methods

_10 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j', kk, l, m, n, o, p, q, r, s) j j' #

class Field11 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_11 :: Lens s t a b #

Instances
11 <= n => Field11 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_11 :: Lens (V n a) (V n a) a a #

Field11 (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c, d, e, f, g, h, i, j, kk') kk kk' 
Instance details

Defined in Control.Lens.Tuple

Methods

_11 :: Lens (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c, d, e, f, g, h, i, j, kk') kk kk' #

Field11 (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d, e, f, g, h, i, j, kk', l) kk kk' 
Instance details

Defined in Control.Lens.Tuple

Methods

_11 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d, e, f, g, h, i, j, kk', l) kk kk' #

Field11 (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e, f, g, h, i, j, kk', l, m) kk kk' 
Instance details

Defined in Control.Lens.Tuple

Methods

_11 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e, f, g, h, i, j, kk', l, m) kk kk' #

Field11 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f, g, h, i, j, kk', l, m, n) kk kk' 
Instance details

Defined in Control.Lens.Tuple

Methods

_11 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f, g, h, i, j, kk', l, m, n) kk kk' #

Field11 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g, h, i, j, kk', l, m, n, o) kk kk' 
Instance details

Defined in Control.Lens.Tuple

Methods

_11 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g, h, i, j, kk', l, m, n, o) kk kk' #

Field11 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h, i, j, kk', l, m, n, o, p) kk kk' 
Instance details

Defined in Control.Lens.Tuple

Methods

_11 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h, i, j, kk', l, m, n, o, p) kk kk' #

Field11 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i, j, kk', l, m, n, o, p, q) kk kk' 
Instance details

Defined in Control.Lens.Tuple

Methods

_11 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i, j, kk', l, m, n, o, p, q) kk kk' #

Field11 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j, kk', l, m, n, o, p, q, r) kk kk' 
Instance details

Defined in Control.Lens.Tuple

Methods

_11 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j, kk', l, m, n, o, p, q, r) kk kk' #

Field11 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk', l, m, n, o, p, q, r, s) kk kk' 
Instance details

Defined in Control.Lens.Tuple

Methods

_11 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk', l, m, n, o, p, q, r, s) kk kk' #

class Field12 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_12 :: Lens s t a b #

Instances
12 <= n => Field12 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_12 :: Lens (V n a) (V n a) a a #

Field12 (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d, e, f, g, h, i, j, kk, l') l l' 
Instance details

Defined in Control.Lens.Tuple

Methods

_12 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d, e, f, g, h, i, j, kk, l') l l' #

Field12 (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e, f, g, h, i, j, kk, l', m) l l' 
Instance details

Defined in Control.Lens.Tuple

Methods

_12 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e, f, g, h, i, j, kk, l', m) l l' #

Field12 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f, g, h, i, j, kk, l', m, n) l l' 
Instance details

Defined in Control.Lens.Tuple

Methods

_12 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f, g, h, i, j, kk, l', m, n) l l' #

Field12 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g, h, i, j, kk, l', m, n, o) l l' 
Instance details

Defined in Control.Lens.Tuple

Methods

_12 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g, h, i, j, kk, l', m, n, o) l l' #

Field12 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h, i, j, kk, l', m, n, o, p) l l' 
Instance details

Defined in Control.Lens.Tuple

Methods

_12 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h, i, j, kk, l', m, n, o, p) l l' #

Field12 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i, j, kk, l', m, n, o, p, q) l l' 
Instance details

Defined in Control.Lens.Tuple

Methods

_12 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i, j, kk, l', m, n, o, p, q) l l' #

Field12 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j, kk, l', m, n, o, p, q, r) l l' 
Instance details

Defined in Control.Lens.Tuple

Methods

_12 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j, kk, l', m, n, o, p, q, r) l l' #

Field12 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk, l', m, n, o, p, q, r, s) l l' 
Instance details

Defined in Control.Lens.Tuple

Methods

_12 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk, l', m, n, o, p, q, r, s) l l' #

class Field13 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_13 :: Lens s t a b #

Instances
13 <= n => Field13 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_13 :: Lens (V n a) (V n a) a a #

Field13 (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e, f, g, h, i, j, kk, l, m') m m' 
Instance details

Defined in Control.Lens.Tuple

Methods

_13 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e, f, g, h, i, j, kk, l, m') m m' #

Field13 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f, g, h, i, j, kk, l, m', n) m m' 
Instance details

Defined in Control.Lens.Tuple

Methods

_13 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f, g, h, i, j, kk, l, m', n) m m' #

Field13 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g, h, i, j, kk, l, m', n, o) m m' 
Instance details

Defined in Control.Lens.Tuple

Methods

_13 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g, h, i, j, kk, l, m', n, o) m m' #

Field13 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h, i, j, kk, l, m', n, o, p) m m' 
Instance details

Defined in Control.Lens.Tuple

Methods

_13 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h, i, j, kk, l, m', n, o, p) m m' #

Field13 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i, j, kk, l, m', n, o, p, q) m m' 
Instance details

Defined in Control.Lens.Tuple

Methods

_13 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i, j, kk, l, m', n, o, p, q) m m' #

Field13 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j, kk, l, m', n, o, p, q, r) m m' 
Instance details

Defined in Control.Lens.Tuple

Methods

_13 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j, kk, l, m', n, o, p, q, r) m m' #

Field13 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk, l, m', n, o, p, q, r, s) m m' 
Instance details

Defined in Control.Lens.Tuple

Methods

_13 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk, l, m', n, o, p, q, r, s) m m' #

class Field14 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_14 :: Lens s t a b #

Instances
14 <= n => Field14 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_14 :: Lens (V n a) (V n a) a a #

Field14 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n') n n' 
Instance details

Defined in Control.Lens.Tuple

Methods

_14 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n') n n' #

Field14 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n', o) n n' 
Instance details

Defined in Control.Lens.Tuple

Methods

_14 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n', o) n n' #

Field14 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n', o, p) n n' 
Instance details

Defined in Control.Lens.Tuple

Methods

_14 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n', o, p) n n' #

Field14 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n', o, p, q) n n' 
Instance details

Defined in Control.Lens.Tuple

Methods

_14 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n', o, p, q) n n' #

Field14 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n', o, p, q, r) n n' 
Instance details

Defined in Control.Lens.Tuple

Methods

_14 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n', o, p, q, r) n n' #

Field14 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n', o, p, q, r, s) n n' 
Instance details

Defined in Control.Lens.Tuple

Methods

_14 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n', o, p, q, r, s) n n' #

class Field15 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_15 :: Lens s t a b #

Instances
15 <= n => Field15 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_15 :: Lens (V n a) (V n a) a a #

Field15 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o') o o' 
Instance details

Defined in Control.Lens.Tuple

Methods

_15 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o') o o' #

Field15 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o', p) o o' 
Instance details

Defined in Control.Lens.Tuple

Methods

_15 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o', p) o o' #

Field15 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o', p, q) o o' 
Instance details

Defined in Control.Lens.Tuple

Methods

_15 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o', p, q) o o' #

Field15 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o', p, q, r) o o' 
Instance details

Defined in Control.Lens.Tuple

Methods

_15 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o', p, q, r) o o' #

Field15 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o', p, q, r, s) o o' 
Instance details

Defined in Control.Lens.Tuple

Methods

_15 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o', p, q, r, s) o o' #

class Field16 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_16 :: Lens s t a b #

Instances
16 <= n => Field16 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_16 :: Lens (V n a) (V n a) a a #

Field16 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p') p p' 
Instance details

Defined in Control.Lens.Tuple

Methods

_16 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p') p p' #

Field16 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p', q) p p' 
Instance details

Defined in Control.Lens.Tuple

Methods

_16 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p', q) p p' #

Field16 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p', q, r) p p' 
Instance details

Defined in Control.Lens.Tuple

Methods

_16 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p', q, r) p p' #

Field16 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p', q, r, s) p p' 
Instance details

Defined in Control.Lens.Tuple

Methods

_16 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p', q, r, s) p p' #

class Field17 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_17 :: Lens s t a b #

Instances
17 <= n => Field17 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_17 :: Lens (V n a) (V n a) a a #

Field17 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q') q q' 
Instance details

Defined in Control.Lens.Tuple

Methods

_17 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q') q q' #

Field17 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q', r) q q' 
Instance details

Defined in Control.Lens.Tuple

Methods

_17 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q', r) q q' #

Field17 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q', r, s) q q' 
Instance details

Defined in Control.Lens.Tuple

Methods

_17 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q', r, s) q q' #

class Field18 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_18 :: Lens s t a b #

Instances
18 <= n => Field18 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_18 :: Lens (V n a) (V n a) a a #

Field18 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r') r r' 
Instance details

Defined in Control.Lens.Tuple

Methods

_18 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r') r r' #

Field18 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r', s) r r' 
Instance details

Defined in Control.Lens.Tuple

Methods

_18 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r', s) r r' #

class Field19 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_19 :: Lens s t a b #

Instances
19 <= n => Field19 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_19 :: Lens (V n a) (V n a) a a #

Field19 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s') s s' 
Instance details

Defined in Control.Lens.Tuple

Methods

_19 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s') s s' #

class Field2 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_2 :: Lens s t a b #

Instances
Field2 (V2 a) (V2 a) a a 
Instance details

Defined in Linear.V2

Methods

_2 :: Lens (V2 a) (V2 a) a a #

Field2 (V3 a) (V3 a) a a 
Instance details

Defined in Linear.V3

Methods

_2 :: Lens (V3 a) (V3 a) a a #

Field2 (Plucker a) (Plucker a) a a 
Instance details

Defined in Linear.Plucker

Methods

_2 :: Lens (Plucker a) (Plucker a) a a #

Field2 (Quaternion a) (Quaternion a) a a 
Instance details

Defined in Linear.Quaternion

Methods

_2 :: Lens (Quaternion a) (Quaternion a) a a #

Field2 (V4 a) (V4 a) a a 
Instance details

Defined in Linear.V4

Methods

_2 :: Lens (V4 a) (V4 a) a a #

Field2 (a, b) (a, b') b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b) (a, b') b b' #

Field2 (a, b, c) (a, b', c) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c) (a, b', c) b b' #

2 <= n => Field2 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_2 :: Lens (V n a) (V n a) a a #

Field2 (a, b, c, d) (a, b', c, d) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c, d) (a, b', c, d) b b' #

Field2 ((f :*: g) p) ((f :*: g') p) (g p) (g' p) 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens ((f :*: g) p) ((f :*: g') p) (g p) (g' p) #

Field2 (Product f g a) (Product f g' a) (g a) (g' a) 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (Product f g a) (Product f g' a) (g a) (g' a) #

Field2 (a, b, c, d, e) (a, b', c, d, e) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c, d, e) (a, b', c, d, e) b b' #

Field2 (a, b, c, d, e, f) (a, b', c, d, e, f) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c, d, e, f) (a, b', c, d, e, f) b b' #

Field2 (a, b, c, d, e, f, g) (a, b', c, d, e, f, g) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c, d, e, f, g) (a, b', c, d, e, f, g) b b' #

Field2 (a, b, c, d, e, f, g, h) (a, b', c, d, e, f, g, h) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c, d, e, f, g, h) (a, b', c, d, e, f, g, h) b b' #

Field2 (a, b, c, d, e, f, g, h, i) (a, b', c, d, e, f, g, h, i) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c, d, e, f, g, h, i) (a, b', c, d, e, f, g, h, i) b b' #

Field2 (a, b, c, d, e, f, g, h, i, j) (a, b', c, d, e, f, g, h, i, j) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c, d, e, f, g, h, i, j) (a, b', c, d, e, f, g, h, i, j) b b' #

Field2 (a, b, c, d, e, f, g, h, i, j, kk) (a, b', c, d, e, f, g, h, i, j, kk) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c, d, e, f, g, h, i, j, kk) (a, b', c, d, e, f, g, h, i, j, kk) b b' #

Field2 (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b', c, d, e, f, g, h, i, j, kk, l) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b', c, d, e, f, g, h, i, j, kk, l) b b' #

Field2 (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b', c, d, e, f, g, h, i, j, kk, l, m) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b', c, d, e, f, g, h, i, j, kk, l, m) b b' #

Field2 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b', c, d, e, f, g, h, i, j, kk, l, m, n) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b', c, d, e, f, g, h, i, j, kk, l, m, n) b b' #

Field2 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b', c, d, e, f, g, h, i, j, kk, l, m, n, o) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b', c, d, e, f, g, h, i, j, kk, l, m, n, o) b b' #

Field2 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b', c, d, e, f, g, h, i, j, kk, l, m, n, o, p) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b', c, d, e, f, g, h, i, j, kk, l, m, n, o, p) b b' #

Field2 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b', c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b', c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) b b' #

Field2 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b', c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b', c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) b b' #

Field2 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b', c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) b b' 
Instance details

Defined in Control.Lens.Tuple

Methods

_2 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b', c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) b b' #

class Field3 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_3 :: Lens s t a b #

Instances
Field3 (V3 a) (V3 a) a a 
Instance details

Defined in Linear.V3

Methods

_3 :: Lens (V3 a) (V3 a) a a #

Field3 (Plucker a) (Plucker a) a a 
Instance details

Defined in Linear.Plucker

Methods

_3 :: Lens (Plucker a) (Plucker a) a a #

Field3 (Quaternion a) (Quaternion a) a a 
Instance details

Defined in Linear.Quaternion

Methods

_3 :: Lens (Quaternion a) (Quaternion a) a a #

Field3 (V4 a) (V4 a) a a 
Instance details

Defined in Linear.V4

Methods

_3 :: Lens (V4 a) (V4 a) a a #

Field3 (a, b, c) (a, b, c') c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c) (a, b, c') c c' #

3 <= n => Field3 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_3 :: Lens (V n a) (V n a) a a #

Field3 (a, b, c, d) (a, b, c', d) c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c, d) (a, b, c', d) c c' #

Field3 (a, b, c, d, e) (a, b, c', d, e) c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c, d, e) (a, b, c', d, e) c c' #

Field3 (a, b, c, d, e, f) (a, b, c', d, e, f) c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c, d, e, f) (a, b, c', d, e, f) c c' #

Field3 (a, b, c, d, e, f, g) (a, b, c', d, e, f, g) c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c, d, e, f, g) (a, b, c', d, e, f, g) c c' #

Field3 (a, b, c, d, e, f, g, h) (a, b, c', d, e, f, g, h) c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c, d, e, f, g, h) (a, b, c', d, e, f, g, h) c c' #

Field3 (a, b, c, d, e, f, g, h, i) (a, b, c', d, e, f, g, h, i) c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c, d, e, f, g, h, i) (a, b, c', d, e, f, g, h, i) c c' #

Field3 (a, b, c, d, e, f, g, h, i, j) (a, b, c', d, e, f, g, h, i, j) c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c, d, e, f, g, h, i, j) (a, b, c', d, e, f, g, h, i, j) c c' #

Field3 (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c', d, e, f, g, h, i, j, kk) c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c', d, e, f, g, h, i, j, kk) c c' #

Field3 (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c', d, e, f, g, h, i, j, kk, l) c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c', d, e, f, g, h, i, j, kk, l) c c' #

Field3 (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c', d, e, f, g, h, i, j, kk, l, m) c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c', d, e, f, g, h, i, j, kk, l, m) c c' #

Field3 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c', d, e, f, g, h, i, j, kk, l, m, n) c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c', d, e, f, g, h, i, j, kk, l, m, n) c c' #

Field3 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c', d, e, f, g, h, i, j, kk, l, m, n, o) c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c', d, e, f, g, h, i, j, kk, l, m, n, o) c c' #

Field3 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c', d, e, f, g, h, i, j, kk, l, m, n, o, p) c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c', d, e, f, g, h, i, j, kk, l, m, n, o, p) c c' #

Field3 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c', d, e, f, g, h, i, j, kk, l, m, n, o, p, q) c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c', d, e, f, g, h, i, j, kk, l, m, n, o, p, q) c c' #

Field3 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c', d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c', d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) c c' #

Field3 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c', d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) c c' 
Instance details

Defined in Control.Lens.Tuple

Methods

_3 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c', d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) c c' #

class Field4 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_4 :: Lens s t a b #

Instances
Field4 (Plucker a) (Plucker a) a a 
Instance details

Defined in Linear.Plucker

Methods

_4 :: Lens (Plucker a) (Plucker a) a a #

Field4 (Quaternion a) (Quaternion a) a a 
Instance details

Defined in Linear.Quaternion

Methods

_4 :: Lens (Quaternion a) (Quaternion a) a a #

Field4 (V4 a) (V4 a) a a 
Instance details

Defined in Linear.V4

Methods

_4 :: Lens (V4 a) (V4 a) a a #

4 <= n => Field4 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_4 :: Lens (V n a) (V n a) a a #

Field4 (a, b, c, d) (a, b, c, d') d d' 
Instance details

Defined in Control.Lens.Tuple

Methods

_4 :: Lens (a, b, c, d) (a, b, c, d') d d' #

Field4 (a, b, c, d, e) (a, b, c, d', e) d d' 
Instance details

Defined in Control.Lens.Tuple

Methods

_4 :: Lens (a, b, c, d, e) (a, b, c, d', e) d d' #

Field4 (a, b, c, d, e, f) (a, b, c, d', e, f) d d' 
Instance details

Defined in Control.Lens.Tuple

Methods

_4 :: Lens (a, b, c, d, e, f) (a, b, c, d', e, f) d d' #

Field4 (a, b, c, d, e, f, g) (a, b, c, d', e, f, g) d d' 
Instance details

Defined in Control.Lens.Tuple

Methods

_4 :: Lens (a, b, c, d, e, f, g) (a, b, c, d', e, f, g) d d' #

Field4 (a, b, c, d, e, f, g, h) (a, b, c, d', e, f, g, h) d d' 
Instance details

Defined in Control.Lens.Tuple

Methods

_4 :: Lens (a, b, c, d, e, f, g, h) (a, b, c, d', e, f, g, h) d d' #

Field4 (a, b, c, d, e, f, g, h, i) (a, b, c, d', e, f, g, h, i) d d' 
Instance details

Defined in Control.Lens.Tuple

Methods

_4 :: Lens (a, b, c, d, e, f, g, h, i) (a, b, c, d', e, f, g, h, i) d d' #

Field4 (a, b, c, d, e, f, g, h, i, j) (a, b, c, d', e, f, g, h, i, j) d d' 
Instance details

Defined in Control.Lens.Tuple

Methods

_4 :: Lens (a, b, c, d, e, f, g, h, i, j) (a, b, c, d', e, f, g, h, i, j) d d' #

Field4 (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c, d', e, f, g, h, i, j, kk) d d' 
Instance details

Defined in Control.Lens.Tuple

Methods

_4 :: Lens (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c, d', e, f, g, h, i, j, kk) d d' #

Field4 (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d', e, f, g, h, i, j, kk, l) d d' 
Instance details

Defined in Control.Lens.Tuple

Methods

_4 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d', e, f, g, h, i, j, kk, l) d d' #

Field4 (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d', e, f, g, h, i, j, kk, l, m) d d' 
Instance details

Defined in Control.Lens.Tuple

Methods

_4 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d', e, f, g, h, i, j, kk, l, m) d d' #

Field4 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d', e, f, g, h, i, j, kk, l, m, n) d d' 
Instance details

Defined in Control.Lens.Tuple

Methods

_4 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d', e, f, g, h, i, j, kk, l, m, n) d d' #

Field4 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d', e, f, g, h, i, j, kk, l, m, n, o) d d' 
Instance details

Defined in Control.Lens.Tuple

Methods

_4 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d', e, f, g, h, i, j, kk, l, m, n, o) d d' #

Field4 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d', e, f, g, h, i, j, kk, l, m, n, o, p) d d' 
Instance details

Defined in Control.Lens.Tuple

Methods

_4 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d', e, f, g, h, i, j, kk, l, m, n, o, p) d d' #

Field4 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d', e, f, g, h, i, j, kk, l, m, n, o, p, q) d d' 
Instance details

Defined in Control.Lens.Tuple

Methods

_4 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d', e, f, g, h, i, j, kk, l, m, n, o, p, q) d d' #

Field4 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d', e, f, g, h, i, j, kk, l, m, n, o, p, q, r) d d' 
Instance details

Defined in Control.Lens.Tuple

Methods

_4 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d', e, f, g, h, i, j, kk, l, m, n, o, p, q, r) d d' #

Field4 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d', e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) d d' 
Instance details

Defined in Control.Lens.Tuple

Methods

_4 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d', e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) d d' #

class Field5 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_5 :: Lens s t a b #

Instances
Field5 (Plucker a) (Plucker a) a a 
Instance details

Defined in Linear.Plucker

Methods

_5 :: Lens (Plucker a) (Plucker a) a a #

5 <= n => Field5 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_5 :: Lens (V n a) (V n a) a a #

Field5 (a, b, c, d, e) (a, b, c, d, e') e e' 
Instance details

Defined in Control.Lens.Tuple

Methods

_5 :: Lens (a, b, c, d, e) (a, b, c, d, e') e e' #

Field5 (a, b, c, d, e, f) (a, b, c, d, e', f) e e' 
Instance details

Defined in Control.Lens.Tuple

Methods

_5 :: Lens (a, b, c, d, e, f) (a, b, c, d, e', f) e e' #

Field5 (a, b, c, d, e, f, g) (a, b, c, d, e', f, g) e e' 
Instance details

Defined in Control.Lens.Tuple

Methods

_5 :: Lens (a, b, c, d, e, f, g) (a, b, c, d, e', f, g) e e' #

Field5 (a, b, c, d, e, f, g, h) (a, b, c, d, e', f, g, h) e e' 
Instance details

Defined in Control.Lens.Tuple

Methods

_5 :: Lens (a, b, c, d, e, f, g, h) (a, b, c, d, e', f, g, h) e e' #

Field5 (a, b, c, d, e, f, g, h, i) (a, b, c, d, e', f, g, h, i) e e' 
Instance details

Defined in Control.Lens.Tuple

Methods

_5 :: Lens (a, b, c, d, e, f, g, h, i) (a, b, c, d, e', f, g, h, i) e e' #

Field5 (a, b, c, d, e, f, g, h, i, j) (a, b, c, d, e', f, g, h, i, j) e e' 
Instance details

Defined in Control.Lens.Tuple

Methods

_5 :: Lens (a, b, c, d, e, f, g, h, i, j) (a, b, c, d, e', f, g, h, i, j) e e' #

Field5 (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c, d, e', f, g, h, i, j, kk) e e' 
Instance details

Defined in Control.Lens.Tuple

Methods

_5 :: Lens (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c, d, e', f, g, h, i, j, kk) e e' #

Field5 (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d, e', f, g, h, i, j, kk, l) e e' 
Instance details

Defined in Control.Lens.Tuple

Methods

_5 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d, e', f, g, h, i, j, kk, l) e e' #

Field5 (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e', f, g, h, i, j, kk, l, m) e e' 
Instance details

Defined in Control.Lens.Tuple

Methods

_5 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e', f, g, h, i, j, kk, l, m) e e' #

Field5 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e', f, g, h, i, j, kk, l, m, n) e e' 
Instance details

Defined in Control.Lens.Tuple

Methods

_5 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e', f, g, h, i, j, kk, l, m, n) e e' #

Field5 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e', f, g, h, i, j, kk, l, m, n, o) e e' 
Instance details

Defined in Control.Lens.Tuple

Methods

_5 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e', f, g, h, i, j, kk, l, m, n, o) e e' #

Field5 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e', f, g, h, i, j, kk, l, m, n, o, p) e e' 
Instance details

Defined in Control.Lens.Tuple

Methods

_5 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e', f, g, h, i, j, kk, l, m, n, o, p) e e' #

Field5 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e', f, g, h, i, j, kk, l, m, n, o, p, q) e e' 
Instance details

Defined in Control.Lens.Tuple

Methods

_5 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e', f, g, h, i, j, kk, l, m, n, o, p, q) e e' #

Field5 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e', f, g, h, i, j, kk, l, m, n, o, p, q, r) e e' 
Instance details

Defined in Control.Lens.Tuple

Methods

_5 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e', f, g, h, i, j, kk, l, m, n, o, p, q, r) e e' #

Field5 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e', f, g, h, i, j, kk, l, m, n, o, p, q, r, s) e e' 
Instance details

Defined in Control.Lens.Tuple

Methods

_5 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e', f, g, h, i, j, kk, l, m, n, o, p, q, r, s) e e' #

class Field6 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_6 :: Lens s t a b #

Instances
Field6 (Plucker a) (Plucker a) a a 
Instance details

Defined in Linear.Plucker

Methods

_6 :: Lens (Plucker a) (Plucker a) a a #

6 <= n => Field6 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_6 :: Lens (V n a) (V n a) a a #

Field6 (a, b, c, d, e, f) (a, b, c, d, e, f') f f' 
Instance details

Defined in Control.Lens.Tuple

Methods

_6 :: Lens (a, b, c, d, e, f) (a, b, c, d, e, f') f f' #

Field6 (a, b, c, d, e, f, g) (a, b, c, d, e, f', g) f f' 
Instance details

Defined in Control.Lens.Tuple

Methods

_6 :: Lens (a, b, c, d, e, f, g) (a, b, c, d, e, f', g) f f' #

Field6 (a, b, c, d, e, f, g, h) (a, b, c, d, e, f', g, h) f f' 
Instance details

Defined in Control.Lens.Tuple

Methods

_6 :: Lens (a, b, c, d, e, f, g, h) (a, b, c, d, e, f', g, h) f f' #

Field6 (a, b, c, d, e, f, g, h, i) (a, b, c, d, e, f', g, h, i) f f' 
Instance details

Defined in Control.Lens.Tuple

Methods

_6 :: Lens (a, b, c, d, e, f, g, h, i) (a, b, c, d, e, f', g, h, i) f f' #

Field6 (a, b, c, d, e, f, g, h, i, j) (a, b, c, d, e, f', g, h, i, j) f f' 
Instance details

Defined in Control.Lens.Tuple

Methods

_6 :: Lens (a, b, c, d, e, f, g, h, i, j) (a, b, c, d, e, f', g, h, i, j) f f' #

Field6 (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c, d, e, f', g, h, i, j, kk) f f' 
Instance details

Defined in Control.Lens.Tuple

Methods

_6 :: Lens (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c, d, e, f', g, h, i, j, kk) f f' #

Field6 (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d, e, f', g, h, i, j, kk, l) f f' 
Instance details

Defined in Control.Lens.Tuple

Methods

_6 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d, e, f', g, h, i, j, kk, l) f f' #

Field6 (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e, f', g, h, i, j, kk, l, m) f f' 
Instance details

Defined in Control.Lens.Tuple

Methods

_6 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e, f', g, h, i, j, kk, l, m) f f' #

Field6 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f', g, h, i, j, kk, l, m, n) f f' 
Instance details

Defined in Control.Lens.Tuple

Methods

_6 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f', g, h, i, j, kk, l, m, n) f f' #

Field6 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f', g, h, i, j, kk, l, m, n, o) f f' 
Instance details

Defined in Control.Lens.Tuple

Methods

_6 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f', g, h, i, j, kk, l, m, n, o) f f' #

Field6 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f', g, h, i, j, kk, l, m, n, o, p) f f' 
Instance details

Defined in Control.Lens.Tuple

Methods

_6 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f', g, h, i, j, kk, l, m, n, o, p) f f' #

Field6 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f', g, h, i, j, kk, l, m, n, o, p, q) f f' 
Instance details

Defined in Control.Lens.Tuple

Methods

_6 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f', g, h, i, j, kk, l, m, n, o, p, q) f f' #

Field6 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f', g, h, i, j, kk, l, m, n, o, p, q, r) f f' 
Instance details

Defined in Control.Lens.Tuple

Methods

_6 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f', g, h, i, j, kk, l, m, n, o, p, q, r) f f' #

Field6 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f', g, h, i, j, kk, l, m, n, o, p, q, r, s) f f' 
Instance details

Defined in Control.Lens.Tuple

Methods

_6 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f', g, h, i, j, kk, l, m, n, o, p, q, r, s) f f' #

class Field7 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_7 :: Lens s t a b #

Instances
7 <= n => Field7 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_7 :: Lens (V n a) (V n a) a a #

Field7 (a, b, c, d, e, f, g) (a, b, c, d, e, f, g') g g' 
Instance details

Defined in Control.Lens.Tuple

Methods

_7 :: Lens (a, b, c, d, e, f, g) (a, b, c, d, e, f, g') g g' #

Field7 (a, b, c, d, e, f, g, h) (a, b, c, d, e, f, g', h) g g' 
Instance details

Defined in Control.Lens.Tuple

Methods

_7 :: Lens (a, b, c, d, e, f, g, h) (a, b, c, d, e, f, g', h) g g' #

Field7 (a, b, c, d, e, f, g, h, i) (a, b, c, d, e, f, g', h, i) g g' 
Instance details

Defined in Control.Lens.Tuple

Methods

_7 :: Lens (a, b, c, d, e, f, g, h, i) (a, b, c, d, e, f, g', h, i) g g' #

Field7 (a, b, c, d, e, f, g, h, i, j) (a, b, c, d, e, f, g', h, i, j) g g' 
Instance details

Defined in Control.Lens.Tuple

Methods

_7 :: Lens (a, b, c, d, e, f, g, h, i, j) (a, b, c, d, e, f, g', h, i, j) g g' #

Field7 (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c, d, e, f, g', h, i, j, kk) g g' 
Instance details

Defined in Control.Lens.Tuple

Methods

_7 :: Lens (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c, d, e, f, g', h, i, j, kk) g g' #

Field7 (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d, e, f, g', h, i, j, kk, l) g g' 
Instance details

Defined in Control.Lens.Tuple

Methods

_7 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d, e, f, g', h, i, j, kk, l) g g' #

Field7 (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e, f, g', h, i, j, kk, l, m) g g' 
Instance details

Defined in Control.Lens.Tuple

Methods

_7 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e, f, g', h, i, j, kk, l, m) g g' #

Field7 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f, g', h, i, j, kk, l, m, n) g g' 
Instance details

Defined in Control.Lens.Tuple

Methods

_7 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f, g', h, i, j, kk, l, m, n) g g' #

Field7 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g', h, i, j, kk, l, m, n, o) g g' 
Instance details

Defined in Control.Lens.Tuple

Methods

_7 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g', h, i, j, kk, l, m, n, o) g g' #

Field7 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g', h, i, j, kk, l, m, n, o, p) g g' 
Instance details

Defined in Control.Lens.Tuple

Methods

_7 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g', h, i, j, kk, l, m, n, o, p) g g' #

Field7 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g', h, i, j, kk, l, m, n, o, p, q) g g' 
Instance details

Defined in Control.Lens.Tuple

Methods

_7 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g', h, i, j, kk, l, m, n, o, p, q) g g' #

Field7 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g', h, i, j, kk, l, m, n, o, p, q, r) g g' 
Instance details

Defined in Control.Lens.Tuple

Methods

_7 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g', h, i, j, kk, l, m, n, o, p, q, r) g g' #

Field7 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g', h, i, j, kk, l, m, n, o, p, q, r, s) g g' 
Instance details

Defined in Control.Lens.Tuple

Methods

_7 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g', h, i, j, kk, l, m, n, o, p, q, r, s) g g' #

class Field8 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_8 :: Lens s t a b #

Instances
8 <= n => Field8 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_8 :: Lens (V n a) (V n a) a a #

Field8 (a, b, c, d, e, f, g, h) (a, b, c, d, e, f, g, h') h h' 
Instance details

Defined in Control.Lens.Tuple

Methods

_8 :: Lens (a, b, c, d, e, f, g, h) (a, b, c, d, e, f, g, h') h h' #

Field8 (a, b, c, d, e, f, g, h, i) (a, b, c, d, e, f, g, h', i) h h' 
Instance details

Defined in Control.Lens.Tuple

Methods

_8 :: Lens (a, b, c, d, e, f, g, h, i) (a, b, c, d, e, f, g, h', i) h h' #

Field8 (a, b, c, d, e, f, g, h, i, j) (a, b, c, d, e, f, g, h', i, j) h h' 
Instance details

Defined in Control.Lens.Tuple

Methods

_8 :: Lens (a, b, c, d, e, f, g, h, i, j) (a, b, c, d, e, f, g, h', i, j) h h' #

Field8 (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c, d, e, f, g, h', i, j, kk) h h' 
Instance details

Defined in Control.Lens.Tuple

Methods

_8 :: Lens (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c, d, e, f, g, h', i, j, kk) h h' #

Field8 (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d, e, f, g, h', i, j, kk, l) h h' 
Instance details

Defined in Control.Lens.Tuple

Methods

_8 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d, e, f, g, h', i, j, kk, l) h h' #

Field8 (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e, f, g, h', i, j, kk, l, m) h h' 
Instance details

Defined in Control.Lens.Tuple

Methods

_8 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e, f, g, h', i, j, kk, l, m) h h' #

Field8 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f, g, h', i, j, kk, l, m, n) h h' 
Instance details

Defined in Control.Lens.Tuple

Methods

_8 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f, g, h', i, j, kk, l, m, n) h h' #

Field8 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g, h', i, j, kk, l, m, n, o) h h' 
Instance details

Defined in Control.Lens.Tuple

Methods

_8 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g, h', i, j, kk, l, m, n, o) h h' #

Field8 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h', i, j, kk, l, m, n, o, p) h h' 
Instance details

Defined in Control.Lens.Tuple

Methods

_8 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h', i, j, kk, l, m, n, o, p) h h' #

Field8 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h', i, j, kk, l, m, n, o, p, q) h h' 
Instance details

Defined in Control.Lens.Tuple

Methods

_8 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h', i, j, kk, l, m, n, o, p, q) h h' #

Field8 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h', i, j, kk, l, m, n, o, p, q, r) h h' 
Instance details

Defined in Control.Lens.Tuple

Methods

_8 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h', i, j, kk, l, m, n, o, p, q, r) h h' #

Field8 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h', i, j, kk, l, m, n, o, p, q, r, s) h h' 
Instance details

Defined in Control.Lens.Tuple

Methods

_8 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h', i, j, kk, l, m, n, o, p, q, r, s) h h' #

class Field9 s t a b | s -> a, t -> b, s b -> t, t a -> s where #

Minimal complete definition

Nothing

Methods

_9 :: Lens s t a b #

Instances
9 <= n => Field9 (V n a) (V n a) a a 
Instance details

Defined in Linear.V

Methods

_9 :: Lens (V n a) (V n a) a a #

Field9 (a, b, c, d, e, f, g, h, i) (a, b, c, d, e, f, g, h, i') i i' 
Instance details

Defined in Control.Lens.Tuple

Methods

_9 :: Lens (a, b, c, d, e, f, g, h, i) (a, b, c, d, e, f, g, h, i') i i' #

Field9 (a, b, c, d, e, f, g, h, i, j) (a, b, c, d, e, f, g, h, i', j) i i' 
Instance details

Defined in Control.Lens.Tuple

Methods

_9 :: Lens (a, b, c, d, e, f, g, h, i, j) (a, b, c, d, e, f, g, h, i', j) i i' #

Field9 (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c, d, e, f, g, h, i', j, kk) i i' 
Instance details

Defined in Control.Lens.Tuple

Methods

_9 :: Lens (a, b, c, d, e, f, g, h, i, j, kk) (a, b, c, d, e, f, g, h, i', j, kk) i i' #

Field9 (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d, e, f, g, h, i', j, kk, l) i i' 
Instance details

Defined in Control.Lens.Tuple

Methods

_9 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l) (a, b, c, d, e, f, g, h, i', j, kk, l) i i' #

Field9 (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e, f, g, h, i', j, kk, l, m) i i' 
Instance details

Defined in Control.Lens.Tuple

Methods

_9 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m) (a, b, c, d, e, f, g, h, i', j, kk, l, m) i i' #

Field9 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f, g, h, i', j, kk, l, m, n) i i' 
Instance details

Defined in Control.Lens.Tuple

Methods

_9 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n) (a, b, c, d, e, f, g, h, i', j, kk, l, m, n) i i' #

Field9 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g, h, i', j, kk, l, m, n, o) i i' 
Instance details

Defined in Control.Lens.Tuple

Methods

_9 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o) (a, b, c, d, e, f, g, h, i', j, kk, l, m, n, o) i i' #

Field9 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h, i', j, kk, l, m, n, o, p) i i' 
Instance details

Defined in Control.Lens.Tuple

Methods

_9 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p) (a, b, c, d, e, f, g, h, i', j, kk, l, m, n, o, p) i i' #

Field9 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i', j, kk, l, m, n, o, p, q) i i' 
Instance details

Defined in Control.Lens.Tuple

Methods

_9 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q) (a, b, c, d, e, f, g, h, i', j, kk, l, m, n, o, p, q) i i' #

Field9 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i', j, kk, l, m, n, o, p, q, r) i i' 
Instance details

Defined in Control.Lens.Tuple

Methods

_9 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r) (a, b, c, d, e, f, g, h, i', j, kk, l, m, n, o, p, q, r) i i' #

Field9 (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i', j, kk, l, m, n, o, p, q, r, s) i i' 
Instance details

Defined in Control.Lens.Tuple

Methods

_9 :: Lens (a, b, c, d, e, f, g, h, i, j, kk, l, m, n, o, p, q, r, s) (a, b, c, d, e, f, g, h, i', j, kk, l, m, n, o, p, q, r, s) i i' #

type AReview t b = Optic' (Tagged :: Type -> Type -> Type) Identity t b #

type As (a :: k2) = Equality' a a #

type Equality (s :: k1) (t :: k2) (a :: k1) (b :: k2) = forall k3 (p :: k1 -> k3 -> Type) (f :: k2 -> k3). p a (f b) -> p s (f t) #

type Equality' (s :: k2) (a :: k2) = Equality s s a a #

type Fold s a = forall (f :: Type -> Type). (Contravariant f, Applicative f) => (a -> f a) -> s -> f s #

type Fold1 s a = forall (f :: Type -> Type). (Contravariant f, Apply f) => (a -> f a) -> s -> f s #

type Getter s a = forall (f :: Type -> Type). (Contravariant f, Functor f) => (a -> f a) -> s -> f s #

type IndexPreservingFold s a = forall (p :: Type -> Type -> Type) (f :: Type -> Type). (Conjoined p, Contravariant f, Applicative f) => p a (f a) -> p s (f s) #

type IndexPreservingFold1 s a = forall (p :: Type -> Type -> Type) (f :: Type -> Type). (Conjoined p, Contravariant f, Apply f) => p a (f a) -> p s (f s) #

type IndexPreservingGetter s a = forall (p :: Type -> Type -> Type) (f :: Type -> Type). (Conjoined p, Contravariant f, Functor f) => p a (f a) -> p s (f s) #

type IndexPreservingLens s t a b = forall (p :: Type -> Type -> Type) (f :: Type -> Type). (Conjoined p, Functor f) => p a (f b) -> p s (f t) #

type IndexPreservingSetter s t a b = forall (p :: Type -> Type -> Type) (f :: Type -> Type). (Conjoined p, Settable f) => p a (f b) -> p s (f t) #

type IndexPreservingTraversal s t a b = forall (p :: Type -> Type -> Type) (f :: Type -> Type). (Conjoined p, Applicative f) => p a (f b) -> p s (f t) #

type IndexPreservingTraversal1 s t a b = forall (p :: Type -> Type -> Type) (f :: Type -> Type). (Conjoined p, Apply f) => p a (f b) -> p s (f t) #

type IndexedFold i s a = forall (p :: Type -> Type -> Type) (f :: Type -> Type). (Indexable i p, Contravariant f, Applicative f) => p a (f a) -> s -> f s #

type IndexedFold1 i s a = forall (p :: Type -> Type -> Type) (f :: Type -> Type). (Indexable i p, Contravariant f, Apply f) => p a (f a) -> s -> f s #

type IndexedGetter i s a = forall (p :: Type -> Type -> Type) (f :: Type -> Type). (Indexable i p, Contravariant f, Functor f) => p a (f a) -> s -> f s #

type IndexedLens i s t a b = forall (f :: Type -> Type) (p :: Type -> Type -> Type). (Indexable i p, Functor f) => p a (f b) -> s -> f t #

type IndexedLens' i s a = IndexedLens i s s a a #

type IndexedLensLike i (f :: k -> Type) s (t :: k) a (b :: k) = forall (p :: Type -> Type -> Type). Indexable i p => p a (f b) -> s -> f t #

type IndexedLensLike' i (f :: Type -> Type) s a = IndexedLensLike i f s s a a #

type IndexedSetter i s t a b = forall (f :: Type -> Type) (p :: Type -> Type -> Type). (Indexable i p, Settable f) => p a (f b) -> s -> f t #

type IndexedSetter' i s a = IndexedSetter i s s a a #

type IndexedTraversal i s t a b = forall (p :: Type -> Type -> Type) (f :: Type -> Type). (Indexable i p, Applicative f) => p a (f b) -> s -> f t #

type IndexedTraversal' i s a = IndexedTraversal i s s a a #

type IndexedTraversal1 i s t a b = forall (p :: Type -> Type -> Type) (f :: Type -> Type). (Indexable i p, Apply f) => p a (f b) -> s -> f t #

type IndexedTraversal1' i s a = IndexedTraversal1 i s s a a #

type Iso s t a b = forall (p :: Type -> Type -> Type) (f :: Type -> Type). (Profunctor p, Functor f) => p a (f b) -> p s (f t) #

type Iso' s a = Iso s s a a #

type Lens s t a b = forall (f :: Type -> Type). Functor f => (a -> f b) -> s -> f t #

type LensLike (f :: k -> Type) s (t :: k) a (b :: k) = (a -> f b) -> s -> f t #

type LensLike' (f :: Type -> Type) s a = LensLike f s s a a #

type Optic (p :: k1 -> k -> Type) (f :: k2 -> k) (s :: k1) (t :: k2) (a :: k1) (b :: k2) = p a (f b) -> p s (f t) #

type Optic' (p :: k1 -> k -> Type) (f :: k1 -> k) (s :: k1) (a :: k1) = Optic p f s s a a #

type Optical (p :: k2 -> k -> Type) (q :: k1 -> k -> Type) (f :: k3 -> k) (s :: k1) (t :: k3) (a :: k2) (b :: k3) = p a (f b) -> q s (f t) #

type Optical' (p :: k1 -> k -> Type) (q :: k1 -> k -> Type) (f :: k1 -> k) (s :: k1) (a :: k1) = Optical p q f s s a a #

type Over (p :: k -> Type -> Type) (f :: k1 -> Type) s (t :: k1) (a :: k) (b :: k1) = p a (f b) -> s -> f t #

type Over' (p :: Type -> Type -> Type) (f :: Type -> Type) s a = Over p f s s a a #

type Review t b = forall (p :: Type -> Type -> Type) (f :: Type -> Type). (Choice p, Bifunctor p, Settable f) => Optic' p f t b #

type Setter s t a b = forall (f :: Type -> Type). Settable f => (a -> f b) -> s -> f t #

type Setter' s a = Setter s s a a #

type Simple (f :: k -> k -> k1 -> k1 -> k2) (s :: k) (a :: k1) = f s s a a #

type Traversal' s a = Traversal s s a a #

type Traversal1 s t a b = forall (f :: Type -> Type). Apply f => (a -> f b) -> s -> f t #

type Traversal1' s a = Traversal1 s s a a #

class (Rewrapped s t, Rewrapped t s) => Rewrapping s t #

Instances
(Rewrapped s t, Rewrapped t s) => Rewrapping s t 
Instance details

Defined in Control.Lens.Wrapped

type family Magnified (m :: Type -> Type) :: Type -> Type -> Type #

Instances
type Magnified (IdentityT m) 
Instance details

Defined in Control.Lens.Zoom

type Magnified (ReaderT b m) 
Instance details

Defined in Control.Lens.Zoom

type Magnified (ReaderT b m) = Effect m
type Magnified ((->) b :: Type -> Type) 
Instance details

Defined in Control.Lens.Zoom

type Magnified ((->) b :: Type -> Type) = (Const :: Type -> Type -> Type)
type Magnified (RWST a w s m) 
Instance details

Defined in Control.Lens.Zoom

type Magnified (RWST a w s m) = EffectRWS w s m
type Magnified (RWST a w s m) 
Instance details

Defined in Control.Lens.Zoom

type Magnified (RWST a w s m) = EffectRWS w s m

class (Magnified m ~ Magnified n, MonadReader b m, MonadReader a n) => Magnify (m :: Type -> Type) (n :: Type -> Type) b a | m -> b, n -> a, m a -> n, n b -> m where #

Methods

magnify :: LensLike' (Magnified m c) a b -> m c -> n c #

Instances
Magnify m n b a => Magnify (IdentityT m) (IdentityT n) b a 
Instance details

Defined in Control.Lens.Zoom

Methods

magnify :: LensLike' (Magnified (IdentityT m) c) a b -> IdentityT m c -> IdentityT n c #

Monad m => Magnify (ReaderT b m) (ReaderT a m) b a 
Instance details

Defined in Control.Lens.Zoom

Methods

magnify :: LensLike' (Magnified (ReaderT b m) c) a b -> ReaderT b m c -> ReaderT a m c #

Magnify ((->) b :: Type -> Type) ((->) a :: Type -> Type) b a 
Instance details

Defined in Control.Lens.Zoom

Methods

magnify :: LensLike' (Magnified ((->) b) c) a b -> (b -> c) -> a -> c #

(Monad m, Monoid w) => Magnify (RWST b w s m) (RWST a w s m) b a 
Instance details

Defined in Control.Lens.Zoom

Methods

magnify :: LensLike' (Magnified (RWST b w s m) c) a b -> RWST b w s m c -> RWST a w s m c #

(Monad m, Monoid w) => Magnify (RWST b w s m) (RWST a w s m) b a 
Instance details

Defined in Control.Lens.Zoom

Methods

magnify :: LensLike' (Magnified (RWST b w s m) c) a b -> RWST b w s m c -> RWST a w s m c #

class (MonadState s m, MonadState t n) => Zoom (m :: Type -> Type) (n :: Type -> Type) s t | m -> s, n -> t, m t -> n, n s -> m where #

Methods

zoom :: LensLike' (Zoomed m c) t s -> m c -> n c #

Instances
Zoom m n s t => Zoom (MaybeT m) (MaybeT n) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (MaybeT m) c) t s -> MaybeT m c -> MaybeT n c #

Zoom m n s t => Zoom (ListT m) (ListT n) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (ListT m) c) t s -> ListT m c -> ListT n c #

Zoom m n s t => Zoom (IdentityT m) (IdentityT n) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (IdentityT m) c) t s -> IdentityT m c -> IdentityT n c #

Zoom m n s t => Zoom (ExceptT e m) (ExceptT e n) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (ExceptT e m) c) t s -> ExceptT e m c -> ExceptT e n c #

(Monoid w, Zoom m n s t) => Zoom (WriterT w m) (WriterT w n) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (WriterT w m) c) t s -> WriterT w m c -> WriterT w n c #

Monad z => Zoom (StateT s z) (StateT t z) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (StateT s z) c) t s -> StateT s z c -> StateT t z c #

Zoom m n s t => Zoom (ReaderT e m) (ReaderT e n) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (ReaderT e m) c) t s -> ReaderT e m c -> ReaderT e n c #

(Error e, Zoom m n s t) => Zoom (ErrorT e m) (ErrorT e n) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (ErrorT e m) c) t s -> ErrorT e m c -> ErrorT e n c #

Monad z => Zoom (StateT s z) (StateT t z) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (StateT s z) c) t s -> StateT s z c -> StateT t z c #

(Monoid w, Zoom m n s t) => Zoom (WriterT w m) (WriterT w n) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (WriterT w m) c) t s -> WriterT w m c -> WriterT w n c #

(Functor f, Zoom m n s t) => Zoom (FreeT f m) (FreeT f n) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (FreeT f m) c) t s -> FreeT f m c -> FreeT f n c #

(Monoid w, Monad z) => Zoom (RWST r w s z) (RWST r w t z) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (RWST r w s z) c) t s -> RWST r w s z c -> RWST r w t z c #

(Monoid w, Monad z) => Zoom (RWST r w s z) (RWST r w t z) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (RWST r w s z) c) t s -> RWST r w s z c -> RWST r w t z c #

type family Zoomed (m :: Type -> Type) :: Type -> Type -> Type #

Instances
type Zoomed (MaybeT m) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (MaybeT m) = FocusingMay (Zoomed m)
type Zoomed (ListT m) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (ListT m) = FocusingOn [] (Zoomed m)
type Zoomed (IdentityT m) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (IdentityT m) = Zoomed m
type Zoomed (ExceptT e m) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (ExceptT e m) = FocusingErr e (Zoomed m)
type Zoomed (WriterT w m) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (WriterT w m) = FocusingPlus w (Zoomed m)
type Zoomed (StateT s z) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (StateT s z) = Focusing z
type Zoomed (ReaderT e m) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (ReaderT e m) = Zoomed m
type Zoomed (ErrorT e m) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (ErrorT e m) = FocusingErr e (Zoomed m)
type Zoomed (StateT s z) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (StateT s z) = Focusing z
type Zoomed (WriterT w m) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (WriterT w m) = FocusingPlus w (Zoomed m)
type Zoomed (FreeT f m) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (FreeT f m) = FocusingFree f m (Zoomed m)
type Zoomed (RWST r w s z) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (RWST r w s z) = FocusingWith w z
type Zoomed (RWST r w s z) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (RWST r w s z) = FocusingWith w z

Plots

class HasR (t :: Type -> Type) where #

Methods

_r :: RealFloat n => Lens' (t n) n #

Instances
HasR V2 
Instance details

Defined in Diagrams.TwoD.Types

Methods

_r :: RealFloat n => Lens' (V2 n) n #

HasR Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

_r :: RealFloat n => Lens' (Polar n) n #

HasR v => HasR (Point v) 
Instance details

Defined in Diagrams.TwoD.Types

Methods

_r :: RealFloat n => Lens' (Point v n) n #

er :: Radial v => E v #

etheta :: Circle v => E v #

:: Circle v => E v #

interpPolar :: Num n => n -> Polar n -> Polar n -> Polar n #

mkPolar :: n -> Angle n -> Polar n #

polar :: (n, Angle n) -> Polar n #

polarIso :: Iso' (Polar n) (n, Angle n) #

polarV2 :: RealFloat n => Iso' (Polar n) (V2 n) #

unpolar :: Polar n -> (n, Angle n) #

addPlot :: (InSpace (BaseSpace c) n p, MonadState (Axis b c n) m, Plotable p b) => Plot p b -> m () #

addPlotable :: (InSpace (BaseSpace c) n p, MonadState (Axis b c n) m, Plotable p b) => p -> State (Plot p b) () -> m () #

addPlotable' :: (InSpace (BaseSpace v) n p, MonadState (Axis b v n) m, Plotable p b) => p -> m () #

axes :: (v ~ BaseSpace c, v ~ BaseSpace c') => Lens (Axis b c n) (Axis b c' n) (c (SingleAxis b v n)) (c' (SingleAxis b v n)) #

axisPlots :: BaseSpace c ~ v => Lens' (Axis b c n) [DynamicPlot b v n] #

axisSize :: (HasLinearMap c, Num n, Ord n) => Lens' (Axis b c n) (SizeSpec c n) #

colourBarRange :: Lens' (Axis b v n) (n, n) #

currentPlots :: BaseSpace c ~ v => Traversal' (Axis b c n) (DynamicPlot b v n) #

finalPlots :: BaseSpace c ~ v => Setter' (Axis b c n) (StyledPlot b v n) #

plotModifier :: BaseSpace c ~ v => Lens' (Axis b c n) (Endo (StyledPlot b v n)) #

polarAxis :: (TypeableFloat n, Renderable (Text n) b, Renderable (Path V2 n) b) => Axis b Polar n #

r2Axis :: (TypeableFloat n, Renderable (Text n) b, Renderable (Path V2 n) b) => Axis b V2 n #

rAxis :: Radial c => Lens' (Axis b c n) (SingleAxis b (BaseSpace c) n) #

rLabel :: Radial c => Lens' (Axis b c n) String #

rMax :: Radial c => Lens' (Axis b c n) (Maybe n) #

thetaAxis :: Circle c => Lens' (Axis b c n) (SingleAxis b (BaseSpace c) n) #

xAxis :: R1 c => Lens' (Axis b c n) (SingleAxis b (BaseSpace c) n) #

xLabel :: R1 c => Lens' (Axis b c n) String #

xMax :: R1 c => Lens' (Axis b c n) (Maybe n) #

xMin :: R1 c => Lens' (Axis b c n) (Maybe n) #

yAxis :: R2 c => Lens' (Axis b c n) (SingleAxis b (BaseSpace c) n) #

yLabel :: R2 c => Lens' (Axis b c n) String #

yMax :: R2 c => Lens' (Axis b c n) (Maybe n) #

yMin :: R2 c => Lens' (Axis b c n) (Maybe n) #

zAxis :: R3 c => Lens' (Axis b c n) (SingleAxis b (BaseSpace c) n) #

zLabel :: R3 c => Lens' (Axis b c n) String #

zMax :: R3 c => Lens' (Axis b c n) (Maybe n) #

zMin :: R3 c => Lens' (Axis b c n) (Maybe n) #

addColourBar :: (TypeableFloat n, Renderable (Path V2 n) b) => BoundingBox V2 n -> ColourBar b n -> ColourMap -> (n, n) -> QDiagram b V2 n Any #

defColourBar :: (Renderable (Text n) b, Renderable (Path V2 n) b, TypeableFloat n) => ColourBar b n #

gradientColourBar :: (TypeableFloat n, Renderable (Path V2 n) b) => ColourMap -> QDiagram b V2 n Any #

pathColourBar :: (TypeableFloat n, Renderable (Path V2 n) b) => Int -> ColourMap -> QDiagram b V2 n Any #

renderColourBar :: (TypeableFloat n, Renderable (Path V2 n) b) => ColourBar b n -> ColourMap -> (n, n) -> n -> QDiagram b V2 n Any #

gridLinesStyle :: (HasGridLines f a, Applicative f) => LensLike' f a (Style (V a) (N a)) #

atMajorTicks :: (n -> String) -> [n] -> (n, n) -> [(n, String)] #

buildPlots :: BaseSpace c ~ v => Axis b c n -> [StyledPlot b v n] #

r2AxisMain :: (Parseable (MainOpts (QDiagram b V2 Double Any)), Mainable (Axis b V2 Double)) => Axis b V2 Double -> IO () #

calculateBounds :: OrderedField n => AxisScaling n -> Maybe (n, n) -> (n, n) #

calculateScaling :: (HasLinearMap v, OrderedField n, Applicative v) => v (AxisScaling n) -> BoundingBox v n -> (v (n, n), Transformation v n, Transformation v n) #

logDeform :: (InSpace v n a, Foldable v, Floating n, Deformable a a) => v LogScale -> a -> a #

logNumber :: Floating a => LogScale -> a -> a #

logPoint :: (Additive v, Floating n) => v LogScale -> Point v n -> Point v n #

hideTicks :: HasTicks Identity a => a -> a #

linearMajorTicks :: (RealFrac n, Floating n) => n -> (n, n) -> [n] #

logMajorTicks :: (RealFrac n, Floating n) => n -> (n, n) -> [n] #

majorTicksHelper :: (RealFrac n, Floating n) => [n] -> n -> (n, n) -> [n] #

minorTicksHelper :: Fractional n => Int -> [n] -> (n, n) -> [n] #

ticksStyle :: (HasTicks f a, Applicative f) => LensLike' f a (Style (V a) (N a)) #

drawTitle :: TypeableFloat n => BoundingBox V2 n -> Title b V2 n -> QDiagram b V2 n Any #

drawLegend :: (TypeableFloat n, Renderable (Path V2 n) b) => BoundingBox V2 n -> [(QDiagram b V2 n Any, String)] -> Legend b n -> QDiagram b V2 n Any #

applyAreaStyle :: (SameSpace a t, HasPlotStyle (Const (PlotStyle b (V a) (N a)) :: Type -> Type) a b, HasStyle t) => a -> t -> t #

applyLineStyle :: (SameSpace a t, HasPlotStyle (Const (PlotStyle b (V a) (N a)) :: Type -> Type) a b, HasStyle t) => a -> t -> t #

applyMarkerStyle :: (SameSpace a t, HasPlotStyle (Const (PlotStyle b (V a) (N a)) :: Type -> Type) a b, HasStyle t) => a -> t -> t #

applyTextStyle :: (SameSpace a t, HasPlotStyle (Const (PlotStyle b (V a) (N a)) :: Type -> Type) a b, HasStyle t) => a -> t -> t #

asterisk :: OrderedField n => Int -> n -> Path V2 n #

blackAndWhite :: (TypeableFloat n, Renderable (Path V2 n) b) => AxisStyle b V2 n #

colours1 :: OrderedField n => [Colour n] #

colours2 :: OrderedField n => [Colour n] #

crossShape :: (InSpace V2 n t, TrailLike t) => n -> t #

diamond :: (InSpace V2 n t, TrailLike t) => n -> t #

fadedColours :: (TypeableFloat n, Renderable (Path V2 n) b) => AxisStyle b V2 n #

lineMarkers :: OrderedField n => [Path V2 n] #

plus :: (InSpace V2 n t, TrailLike t) => n -> t #

star' :: (InSpace V2 n t, TrailLike t) => n -> t #

toStops :: Fractional n => ColourMap -> [GradientStop n] #

vividColours :: (TypeableFloat n, Renderable (Path V2 n) b) => AxisStyle b V2 n #

_DynamicPlot :: (Plotable p b, Typeable b) => Prism' (DynamicPlot b (V p) (N p)) (Plot p b) #

addLegendEntry :: (HasPlotOptions Identity a b, MonadState a m) => LegendEntry b (V a) (N a) -> m () #

display :: (MonadState s m, HasVisibility a) => ASetter' s a -> m () #

dynamicPlot :: (Typeable p, Typeable b) => Traversal' (DynamicPlot b (V p) (N p)) (Plot p b) #

hide :: (MonadState s m, HasVisibility a) => ASetter' s a -> m () #

key :: (HasPlotOptions Identity a b, MonadState a m, Num (N a)) => String -> m () #

mkPlot :: (Additive (V p), Num (N p)) => p -> Plot p b #

orient :: HasOrientation o => o -> a -> a -> a #

placeAgainst :: (InSpace V2 n a, SameSpace a b, Enveloped a, HasOrigin b, Alignable b) => a -> Placement -> n -> b -> b #

plotMods :: Lens' (Plot p b) (PlotMods b (V p) (N p)) #

rawPlot :: SameSpace p p' => Lens (Plot p b) (Plot p' b) p p' #

renderStyledPlot :: TypeableFloat n => AxisSpec V2 n -> StyledPlot b V2 n -> QDiagram b V2 n Any #

scaleNum :: Floating n => (n, n) -> LogScale -> n -> n #

singleStyledPlotLegend :: StyledPlot b v n -> [(n, QDiagram b v n Any, String)] #

specBounds :: Lens' (AxisSpec v n) (v (n, n)) #

specPoint :: (Applicative v, Additive v, Floating n) => AxisSpec v n -> Point v n -> Point v n #

specTrans :: Lens' (AxisSpec v n) (Transformation v n) #

styleDynamic :: PlotStyle b v n -> DynamicPlot b v n -> StyledPlot b v n #

styledPlot :: Typeable p => Traversal' (StyledPlot b (V p) (N p)) p #

styledPlotLegends :: Ord n => [StyledPlot b v n] -> [(QDiagram b v n Any, String)] #

barPlot :: (MonadState (Axis b V2 n) m, Plotable (BarPlot n) b, Foldable f) => f n -> State (Plot (BarPlot n) b) () -> m () #

barPlot' :: (MonadState (Axis b V2 n) m, Plotable (BarPlot n) b, Foldable f) => f n -> m () #

floatingBarPlot :: (MonadState (Axis b V2 n) m, Plotable (BarPlot n) b, Foldable f) => f (n, n) -> State (Plot (BarPlot n) b) () -> m () #

groupedBars' :: Fractional n => n -> State (MultiBarState b n a) () #

labelBars :: HasLabels a => [String] -> State a () #

mkBars :: (Foldable f, Num n) => BarLayout n -> f n -> BarPlot n #

mkFloatingBars :: Foldable f => BarLayout n -> f (n, n) -> BarPlot n #

mkGroupedBars :: Fractional n => n -> BarLayout n -> [[n]] -> [BarPlot n] #

mkRunningBars :: Num n => BarLayout n -> [[(n, n)]] -> [BarPlot n] #

mkStackedBars :: Num n => BarLayout n -> [[n]] -> [BarPlot n] #

mkStackedEqualBars :: Fractional n => n -> BarLayout n -> [[n]] -> [BarPlot n] #

multiBars :: (MonadState (Axis b V2 n) m, Plotable (BarPlot n) b, Foldable f, Foldable g) => f a -> (a -> g n) -> State (MultiBarState b n a) () -> m () #

namedBarPlot :: (MonadState (Axis b V2 n) m, Plotable (BarPlot n) b, Foldable f) => f (String, n) -> State (Plot (BarPlot n) b) () -> m () #

namedBarPlot' :: (MonadState (Axis b V2 n) m, Plotable (BarPlot n) b, Foldable f) => f (String, n) -> m () #

onBars :: (a -> State (PlotMods b V2 n) ()) -> State (MultiBarState b n a) () #

runningBars :: Num n => State (MultiBarState b n a) () #

stackedBars :: Num n => State (MultiBarState b n a) () #

heatMap :: (Foldable f, Foldable g, TypeableFloat n, Typeable b, MonadState (Axis b V2 n) m, Renderable (Path V2 n) b) => f (g Double) -> State (Plot (HeatMap b n) b) () -> m () #

heatMap' :: (Foldable f, Foldable g, TypeableFloat n, Typeable b, MonadState (Axis b V2 n) m, Renderable (Path V2 n) b) => f (g Double) -> m () #

heatMapIndexed :: (VectorLike V2 Int i, TypeableFloat n, Typeable b, MonadState (Axis b V2 n) m, Renderable (Path V2 n) b) => i -> (i -> Double) -> State (Plot (HeatMap b n) b) () -> m () #

heatMapIndexed' :: (VectorLike V2 Int i, TypeableFloat n, Typeable b, MonadState (Axis b V2 n) m, Renderable (Path V2 n) b) => i -> (i -> Double) -> m () #

mkHeatMap :: (Renderable (Path V2 n) b, TypeableFloat n) => HeatMatrix -> HeatMap b n #

mkHeatMatrix :: V2 Int -> (V2 Int -> Double) -> HeatMatrix #

pathHeatRender :: (Renderable (Path V2 n) b, TypeableFloat n) => HeatMatrix -> ColourMap -> QDiagram b V2 n Any #

pixelHeatRender :: (Renderable (DImage n Embedded) b, TypeableFloat n) => HeatMatrix -> ColourMap -> QDiagram b V2 n Any #

pixelHeatRender' :: (Renderable (DImage n Embedded) b, TypeableFloat n) => Int -> HeatMatrix -> ColourMap -> QDiagram b V2 n Any #

computedHistogram :: (MonadState (Axis b V2 n) m, Plotable (HistogramPlot n) b, Foldable f) => n -> n -> f n -> State (Plot (HistogramPlot n) b) () -> m () #

histogramPlot :: (MonadState (Axis b V2 n) m, Plotable (HistogramPlot n) b, Foldable f, RealFrac n) => f n -> State (Plot (HistogramOptions n) b) () -> m () #

histogramPlot' :: (MonadState (Axis b V2 n) m, Plotable (HistogramPlot n) b, Foldable f, RealFrac n) => f n -> m () #

histogramPlotOf :: (MonadState (Axis b V2 n) m, Plotable (HistogramPlot n) b, RealFrac n) => Fold s n -> s -> State (Plot (HistogramOptions n) b) () -> m () #

histogramPlotOf' :: (MonadState (Axis b V2 n) m, Plotable (HistogramPlot n) b, RealFrac n) => Fold s n -> s -> m () #

mkComputedHistogram :: Foldable f => n -> n -> f n -> HistogramPlot n #

linePlot :: (BaseSpace c ~ v, Metric v, Foldable f, PointLike v n p, Plotable (Path v n) b, MonadState (Axis b c n) m) => f p -> State (Plot (Path v n) b) () -> m () #

linePlot' :: (BaseSpace c ~ v, Metric v, Foldable f, PointLike v n p, Plotable (Path v n) b, MonadState (Axis b c n) m) => f p -> m () #

mkPath :: (PointLike v n p, OrderedField n, Foldable f, Foldable g) => g (f p) -> Path v n #

mkPathOf :: (PointLike v n p, OrderedField n) => Fold s t -> Fold t p -> s -> Path v n #

mkTrail :: (PointLike v n p, OrderedField n, Foldable f) => f p -> Located (Trail v n) #

mkTrailOf :: (PointLike v n p, OrderedField n) => Fold s p -> s -> Located (Trail v n) #

pathPlot :: (BaseSpace c ~ v, Plotable (Path v n) b, MonadState (Axis b c n) m) => Path v n -> State (Plot (Path v n) b) () -> m () #

pathPlot' :: (BaseSpace c ~ v, Plotable (Path v n) b, MonadState (Axis b c n) m) => Path v n -> m () #

smoothLinePlot :: (BaseSpace c ~ v, Foldable f, Metric v, PointLike v n p, Plotable (Path v n) b, Fractional (v n), MonadState (Axis b c n) m) => f p -> State (Plot (Path v n) b) () -> m () #

smoothLinePlot' :: (BaseSpace c ~ v, Foldable f, PointLike v n p, Plotable (Path v n) b, Fractional (v n), MonadState (Axis b c n) m) => f p -> m () #

trailPlot :: (BaseSpace c ~ v, Plotable (Path v n) b, MonadState (Axis b c n) m) => Trail v n -> State (Plot (Path v n) b) () -> m () #

trailPlot' :: (BaseSpace c ~ v, Plotable (Path v n) b, MonadState (Axis b c n) m) => Trail v n -> m () #

mkWedge :: Num n => Direction V2 n -> Angle n -> Wedge n #

onWedges :: (a -> State (Plot (Wedge n) b) ()) -> State (PieState b n a) () #

piePlot :: (MonadState (Axis b Polar n) m, Plotable (Wedge n) b, Foldable f) => f a -> (a -> n) -> State (PieState b n a) () -> m () #

piePlot' :: (MonadState (Axis b Polar n) m, Plotable (Wedge n) b, Foldable f) => f n -> m () #

wedgeKeys :: Num n => (a -> String) -> State (PieState b n a) () #

wedgePlot :: (v ~ BaseSpace c, v ~ V2, PointLike v n (Polar n), MonadState (Axis b c n) m, Plotable (Wedge n) b) => Direction V2 n -> Angle n -> State (Plot (Wedge n) b) () -> m () #

bubbleOptions :: (InSpace v n a, HasScatterOptions f a (n, Point v n)) => LensLike' f a (BubbleOptions v n) #

bubblePlot :: (BaseSpace c ~ v, PointLike v n p, MonadState (Axis b c n) m, Plotable (ScatterPlot v n) b, Typeable n, Foldable f) => f (n, p) -> State (Plot (BubbleOptions v n) b) () -> m () #

bubblePlot' :: (v ~ BaseSpace c, PointLike v n p, Typeable n, MonadState (Axis b c n) m, Plotable (ScatterPlot v n) b, Foldable f) => f (n, p) -> m () #

bubblePlotOf :: (BaseSpace c ~ v, PointLike v n p, MonadState (Axis b c n) m, Plotable (ScatterPlot v n) b, Typeable n) => Fold s (n, p) -> s -> State (Plot (BubbleOptions v n) b) () -> m () #

bubblePlotOf' :: (BaseSpace c ~ v, PointLike v n p, MonadState (Axis b c n) m, Plotable (ScatterPlot v n) b, Typeable n) => Fold s (n, p) -> s -> State (Plot (BubbleOptions v n) b) () -> m () #

bubbleStyle :: (InSpace v n a, Settable f, HasScatterOptions f a (n, Point v n)) => LensLike' f a (n -> Style v n) #

bubbleTransform :: (InSpace v n a, HasScatterOptions f a (n, Point v n), Settable f) => LensLike' f a (n -> Transformation v n) #

gscatterOptionsFor :: (InSpace v n a, HasScatterOptions f a d) => proxy d -> LensLike' f a (ScatterOptions v n d) #

gscatterPlot :: (BaseSpace c ~ v, PointLike v n p, MonadState (Axis b c n) m, Plotable (ScatterPlot v n) b, Typeable d, Foldable f) => f d -> (d -> p) -> State (Plot (ScatterOptions v n d) b) () -> m () #

mkScatterOptions :: (PointLike v n p, Foldable f, Fractional n) => f a -> (a -> p) -> ScatterOptions v n a #

scatterOptions :: (InSpace v n a, HasScatterOptions f a (Point v n)) => LensLike' f a (ScatterOptions v n (Point v n)) #

scatterPlot :: (BaseSpace c ~ v, PointLike v n p, Typeable n, MonadState (Axis b c n) m, Plotable (ScatterPlot v n) b, Foldable f) => f p -> State (Plot (ScatterOptions v n (Point v n)) b) () -> m () #

scatterPlot' :: (BaseSpace c ~ v, PointLike v n p, Typeable n, MonadState (Axis b c n) m, Plotable (ScatterPlot v n) b, Foldable f) => f p -> m () #

scatterPlotOf :: (BaseSpace c ~ v, PointLike v n p, Typeable n, MonadState (Axis b c n) m, Plotable (ScatterPlot v n) b) => Fold s p -> s -> State (Plot (ScatterOptions v n (Point v n)) b) () -> m () #

scatterPlotOf' :: (BaseSpace c ~ v, PointLike v n p, Typeable n, MonadState (Axis b c n) m, Plotable (ScatterPlot v n) b) => Fold s p -> s -> m () #

(&=) :: MonadState s m => ASetter' s b -> State b a -> m () #

(&~~) :: Monad m => s -> StateT s m a -> m s #

class Radial t => Circle (t :: Type -> Type) where #

Methods

_azimuth :: Lens' (t a) (Angle a) #

_polar :: Lens' (t a) (Polar a) #

Instances
Circle Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

_azimuth :: Lens' (Polar a) (Angle a) #

_polar :: Lens' (Polar a) (Polar a) #

class HasX (t :: Type -> Type) where #

Methods

x_ :: RealFloat n => Lens' (t n) n #

Instances
HasX V2 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

x_ :: RealFloat n => Lens' (V2 n) n #

HasX Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

x_ :: RealFloat n => Lens' (Polar n) n #

HasX V3 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

x_ :: RealFloat n => Lens' (V3 n) n #

HasX v => HasX (Point v) 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

x_ :: RealFloat n => Lens' (Point v n) n #

class HasX t => HasY (t :: Type -> Type) where #

Minimal complete definition

xy_

Methods

y_ :: RealFloat n => Lens' (t n) n #

xy_ :: RealFloat n => Lens' (t n) (V2 n) #

Instances
HasY V2 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

y_ :: RealFloat n => Lens' (V2 n) n #

xy_ :: RealFloat n => Lens' (V2 n) (V2 n) #

HasY Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

y_ :: RealFloat n => Lens' (Polar n) n #

xy_ :: RealFloat n => Lens' (Polar n) (V2 n) #

HasY V3 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

y_ :: RealFloat n => Lens' (V3 n) n #

xy_ :: RealFloat n => Lens' (V3 n) (V2 n) #

HasY v => HasY (Point v) 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

y_ :: RealFloat n => Lens' (Point v n) n #

xy_ :: RealFloat n => Lens' (Point v n) (V2 n) #

newtype Polar a #

Constructors

Polar (V2 a) 
Instances
Monad Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

(>>=) :: Polar a -> (a -> Polar b) -> Polar b #

(>>) :: Polar a -> Polar b -> Polar b #

return :: a -> Polar a #

fail :: String -> Polar a #

Functor Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

fmap :: (a -> b) -> Polar a -> Polar b #

(<$) :: a -> Polar b -> Polar a #

MonadFix Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

mfix :: (a -> Polar a) -> Polar a #

Applicative Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

pure :: a -> Polar a #

(<*>) :: Polar (a -> b) -> Polar a -> Polar b #

liftA2 :: (a -> b -> c) -> Polar a -> Polar b -> Polar c #

(*>) :: Polar a -> Polar b -> Polar b #

(<*) :: Polar a -> Polar b -> Polar a #

Foldable Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

fold :: Monoid m => Polar m -> m #

foldMap :: Monoid m => (a -> m) -> Polar a -> m #

foldr :: (a -> b -> b) -> b -> Polar a -> b #

foldr' :: (a -> b -> b) -> b -> Polar a -> b #

foldl :: (b -> a -> b) -> b -> Polar a -> b #

foldl' :: (b -> a -> b) -> b -> Polar a -> b #

foldr1 :: (a -> a -> a) -> Polar a -> a #

foldl1 :: (a -> a -> a) -> Polar a -> a #

toList :: Polar a -> [a] #

null :: Polar a -> Bool #

length :: Polar a -> Int #

elem :: Eq a => a -> Polar a -> Bool #

maximum :: Ord a => Polar a -> a #

minimum :: Ord a => Polar a -> a #

sum :: Num a => Polar a -> a #

product :: Num a => Polar a -> a #

Traversable Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

traverse :: Applicative f => (a -> f b) -> Polar a -> f (Polar b) #

sequenceA :: Applicative f => Polar (f a) -> f (Polar a) #

mapM :: Monad m => (a -> m b) -> Polar a -> m (Polar b) #

sequence :: Monad m => Polar (m a) -> m (Polar a) #

MonadZip Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

mzip :: Polar a -> Polar b -> Polar (a, b) #

mzipWith :: (a -> b -> c) -> Polar a -> Polar b -> Polar c #

munzip :: Polar (a, b) -> (Polar a, Polar b) #

Distributive Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

distribute :: Functor f => f (Polar a) -> Polar (f a) #

collect :: Functor f => (a -> Polar b) -> f a -> Polar (f b) #

distributeM :: Monad m => m (Polar a) -> Polar (m a) #

collectM :: Monad m => (a -> Polar b) -> m a -> Polar (m b) #

Representable Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Associated Types

type Rep Polar :: Type

Methods

tabulate :: (Rep Polar -> a) -> Polar a

index :: Polar a -> Rep Polar -> a

HasR Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

_r :: RealFloat n => Lens' (Polar n) n #

Circle Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

_azimuth :: Lens' (Polar a) (Angle a) #

_polar :: Lens' (Polar a) (Polar a) #

HasX Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

x_ :: RealFloat n => Lens' (Polar n) n #

HasY Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

y_ :: RealFloat n => Lens' (Polar n) n #

xy_ :: RealFloat n => Lens' (Polar n) (V2 n) #

Radial Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

_radial :: Lens' (Polar a) a #

(TypeableFloat n, Renderable (Path V2 n) b) => RenderAxis b Polar n 
Instance details

Defined in Plots.Axis.Render

Methods

renderAxis :: Axis b Polar n -> QDiagram b (BaseSpace Polar) n Any #

RealFloat n => PointLike V2 n (Polar n) 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

pointLike :: Iso' (Point V2 n) (Polar n)

unpointLike :: Iso' (Polar n) (Point V2 n)

Wrapped (Polar a) 
Instance details

Defined in Diagrams.Coordinates.Polar

Associated Types

type Unwrapped (Polar a) :: Type #

Methods

_Wrapped' :: Iso' (Polar a) (Unwrapped (Polar a)) #

Generic1 Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Associated Types

type Rep1 Polar :: k -> Type #

Methods

from1 :: Polar a -> Rep1 Polar a #

to1 :: Rep1 Polar a -> Polar a #

Polar a1 ~ t => Rewrapped (Polar a2) t 
Instance details

Defined in Diagrams.Coordinates.Polar

type Rep Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

type Rep Polar = E Polar
type BaseSpace Polar 
Instance details

Defined in Plots.Axis

type BaseSpace Polar = V2
type Unwrapped (Polar a) 
Instance details

Defined in Diagrams.Coordinates.Polar

type Unwrapped (Polar a) = V2 a
type Rep1 Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

type Rep1 Polar = D1 (MetaData "Polar" "Diagrams.Coordinates.Polar" "plots-0.1.1.2-DPOSHgcPwPk1g20TDFjDd7" True) (C1 (MetaCons "Polar" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 V2)))
type MainOpts (Axis b Polar n) 
Instance details

Defined in Plots.Axis.Render

type MainOpts (Axis b Polar n) = MainOpts (QDiagram b V2 n Any)

class Radial (t :: Type -> Type) where #

Methods

_radial :: Lens' (t a) a #

Instances
Radial Polar 
Instance details

Defined in Diagrams.Coordinates.Polar

Methods

_radial :: Lens' (Polar a) a #

data Axis b (c :: Type -> Type) n #

Instances
(Applicative f, Traversable c) => HasGridLines f (Axis b c n) 
Instance details

Defined in Plots.Axis

Methods

gridLines :: LensLike' f (Axis b c n) (GridLines (V (Axis b c n)) (N (Axis b c n))) #

(Applicative f, Traversable c) => HasMajorGridLines f (Axis b c n) 
Instance details

Defined in Plots.Axis

Methods

majorGridLines :: LensLike' f (Axis b c n) (MajorGridLines (V (Axis b c n)) (N (Axis b c n))) #

majorGridLinesFunction :: LensLike' f (Axis b c n) (GridLineFunction (N (Axis b c n))) #

majorGridLinesStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

(Applicative f, Traversable c) => HasMinorGridLines f (Axis b c n) 
Instance details

Defined in Plots.Axis

Methods

minorGridLines :: LensLike' f (Axis b c n) (MinorGridLines (V (Axis b c n)) (N (Axis b c n))) #

minorGridLinesFunction :: LensLike' f (Axis b c n) (GridLineFunction (N (Axis b c n))) #

minorGridLinesStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

(Applicative f, Traversable c) => HasAxisScaling f (Axis b c n) 
Instance details

Defined in Plots.Axis

Methods

axisScaling :: LensLike' f (Axis b c n) (AxisScaling (N (Axis b c n))) #

scaleAspectRatio :: LensLike' f (Axis b c n) (Maybe (N (Axis b c n))) #

scaleMode :: LensLike' f (Axis b c n) ScaleMode #

logScale :: LensLike' f (Axis b c n) LogScale #

axisExtend :: LensLike' f (Axis b c n) (Extending (N (Axis b c n))) #

boundMin :: LensLike' f (Axis b c n) (Maybe (N (Axis b c n))) #

boundMax :: LensLike' f (Axis b c n) (Maybe (N (Axis b c n))) #

renderSize :: LensLike' f (Axis b c n) (Maybe (N (Axis b c n))) #

(Applicative f, Traversable c) => HasMajorTicks f (Axis b c n) 
Instance details

Defined in Plots.Axis

Methods

majorTicks :: LensLike' f (Axis b c n) (MajorTicks (V (Axis b c n)) (N (Axis b c n))) #

majorTicksFunction :: LensLike' f (Axis b c n) ((N (Axis b c n), N (Axis b c n)) -> [N (Axis b c n)]) #

majorTicksAlignment :: LensLike' f (Axis b c n) TicksAlignment #

majorTicksLength :: LensLike' f (Axis b c n) (N (Axis b c n)) #

majorTicksStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

(Applicative f, Traversable c) => HasMinorTicks f (Axis b c n) 
Instance details

Defined in Plots.Axis

Methods

minorTicks :: LensLike' f (Axis b c n) (MinorTicks (V (Axis b c n)) (N (Axis b c n))) #

minorTicksFunction :: LensLike' f (Axis b c n) ([N (Axis b c n)] -> (N (Axis b c n), N (Axis b c n)) -> [N (Axis b c n)]) #

minorTicksAlignment :: LensLike' f (Axis b c n) TicksAlignment #

minorTicksLength :: LensLike' f (Axis b c n) (N (Axis b c n)) #

minorTicksStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

(Applicative f, Traversable c) => HasTicks f (Axis b c n) 
Instance details

Defined in Plots.Axis

Methods

bothTicks :: LensLike' f (Axis b c n) (Ticks (V (Axis b c n)) (N (Axis b c n))) #

(BaseSpace c ~ V2, Settable f, Typeable n) => HasWedge f (Axis b c n) 
Instance details

Defined in Plots.Types.Pie

Methods

pieWedge :: LensLike' f (Axis b c n) (Wedge (N (Axis b c n))) #

wedgeOuterRadius :: LensLike' f (Axis b c n) (N (Axis b c n)) #

wedgeInnerRadius :: LensLike' f (Axis b c n) (N (Axis b c n)) #

wedgeOffset :: LensLike' f (Axis b c n) (N (Axis b c n)) #

wedgeWidth :: LensLike' f (Axis b c n) (Angle (N (Axis b c n))) #

wedgeDirection :: LensLike' f (Axis b c n) (Direction V2 (N (Axis b c n))) #

(Settable f, Typeable (BaseSpace c), Typeable n) => HasConnectingLine f (Axis b c n) 
Instance details

Defined in Plots.Types.Scatter

Methods

connectingLine :: LensLike' f (Axis b c n) Bool #

(Applicative f, Traversable c) => HasAxisLabel f (Axis b c n) b 
Instance details

Defined in Plots.Axis

Methods

axisLabel :: LensLike' f (Axis b c n) (AxisLabel b (V (Axis b c n)) (N (Axis b c n))) #

axisLabelText :: LensLike' f (Axis b c n) String #

axisLabelTextFunction :: LensLike' f (Axis b c n) (TextFunction b (V (Axis b c n)) (N (Axis b c n))) #

axisLabelGap :: LensLike' f (Axis b c n) (N (Axis b c n)) #

axisLabelStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

axisLabelPosition :: LensLike' f (Axis b c n) AxisLabelPosition #

axisLabelPlacement :: LensLike' f (Axis b c n) AxisLabelPosition #

(Applicative f, Traversable c) => HasTickLabels f (Axis b c n) b 
Instance details

Defined in Plots.Axis

Methods

tickLabel :: LensLike' f (Axis b c n) (TickLabels b (V (Axis b c n)) (N (Axis b c n))) #

tickLabelTextFunction :: LensLike' f (Axis b c n) (TextFunction b (V (Axis b c n)) (N (Axis b c n))) #

tickLabelFunction :: LensLike' f (Axis b c n) ([N (Axis b c n)] -> (N (Axis b c n), N (Axis b c n)) -> [(N (Axis b c n), String)]) #

tickLabelStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

tickLabelGap :: LensLike' f (Axis b c n) (N (Axis b c n)) #

Settable f => HasPlotStyle f (Axis b c n) b 
Instance details

Defined in Plots.Axis

Methods

plotStyle :: LensLike' f (Axis b c n) (PlotStyle b (V (Axis b c n)) (N (Axis b c n))) #

plotColour :: LensLike' f (Axis b c n) (Colour Double) #

plotColor :: LensLike' f (Axis b c n) (Colour Double) #

lineStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

lineStyleFunction :: LensLike' f (Axis b c n) (Colour Double -> Style (V (Axis b c n)) (N (Axis b c n))) #

markerStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

markerStyleFunction :: LensLike' f (Axis b c n) (Colour Double -> Style (V (Axis b c n)) (N (Axis b c n))) #

areaStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

areaStyleFunction :: LensLike' f (Axis b c n) (Colour Double -> Style (V (Axis b c n)) (N (Axis b c n))) #

textStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

textStyleFunction :: LensLike' f (Axis b c n) (Colour Double -> Style (V (Axis b c n)) (N (Axis b c n))) #

plotMarker :: LensLike' f (Axis b c n) (QDiagram b (V (Axis b c n)) (N (Axis b c n)) Any) #

plotStyles :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

plotStyleFunctions :: LensLike' f (Axis b c n) (Colour Double -> Style (V (Axis b c n)) (N (Axis b c n))) #

Settable f => HasPlotOptions f (Axis b c n) b 
Instance details

Defined in Plots.Axis

Methods

plotOptions :: LensLike' f (Axis b c n) (PlotOptions b (V (Axis b c n)) (N (Axis b c n))) #

plotName :: LensLike' f (Axis b c n) Name #

clipPlot :: LensLike' f (Axis b c n) Bool #

legendEntries :: LensLike' f (Axis b c n) [LegendEntry b (V (Axis b c n)) (N (Axis b c n))] #

plotTransform :: LensLike' f (Axis b c n) (Transformation (V (Axis b c n)) (N (Axis b c n))) #

plotVisible :: LensLike' f (Axis b c n) Bool #

(Applicative f, Typeable b, Typeable (BaseSpace c), Typeable n, Typeable a) => HasScatterOptions f (Axis b c n) a 
Instance details

Defined in Plots.Types.Scatter

Methods

gscatterOptions :: LensLike' f (Axis b c n) (ScatterOptions (V (Axis b c n)) (N (Axis b c n)) a) #

scatterTransform :: LensLike' f (Axis b c n) (a -> Transformation (V (Axis b c n)) (N (Axis b c n))) #

scatterStyle :: LensLike' f (Axis b c n) (a -> Style (V (Axis b c n)) (N (Axis b c n))) #

scatterPosition :: LensLike' f (Axis b c n) (a -> Point (V (Axis b c n)) (N (Axis b c n))) #

HasColourBar (Axis b v n) b 
Instance details

Defined in Plots.Axis

Methods

colourBar :: Lens' (Axis b v n) (ColourBar b (N (Axis b v n))) #

colourBarDraw :: Lens' (Axis b v n) (ColourMap -> QDiagram b V2 (N (Axis b v n)) Any) #

colourBarWidth :: Lens' (Axis b v n) (N (Axis b v n)) #

colourBarLengthFunction :: Lens' (Axis b v n) (N (Axis b v n) -> N (Axis b v n)) #

colourBarGap :: Lens' (Axis b v n) (N (Axis b v n)) #

colourBarStyle :: Lens' (Axis b v n) (Style V2 (N (Axis b v n))) #

HasTitle (Axis b c n) b 
Instance details

Defined in Plots.Axis

Methods

title :: Lens' (Axis b c n) (Title b (V (Axis b c n)) (N (Axis b c n))) #

titleText :: Lens' (Axis b c n) String #

titleStyle :: Lens' (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

titlePlacement :: Lens' (Axis b c n) Placement #

titleTextFunction :: Lens' (Axis b c n) (TextAlignment (N (Axis b c n)) -> String -> QDiagram b (V (Axis b c n)) (N (Axis b c n)) Any) #

titleAlignment :: Lens' (Axis b c n) (TextAlignment (N (Axis b c n))) #

titleGap :: Lens' (Axis b c n) (N (Axis b c n)) #

HasLegend (Axis b c n) b 
Instance details

Defined in Plots.Axis

Methods

legend :: Lens' (Axis b c n) (Legend b (N (Axis b c n))) #

legendPlacement :: Lens' (Axis b c n) Placement #

legendGap :: Lens' (Axis b c n) (N (Axis b c n)) #

legendStyle :: Lens' (Axis b c n) (Style V2 (N (Axis b c n))) #

legendSpacing :: Lens' (Axis b c n) (N (Axis b c n)) #

legendTextWidth :: Lens' (Axis b c n) (N (Axis b c n)) #

legendTextFunction :: Lens' (Axis b c n) (String -> QDiagram b V2 (N (Axis b c n)) Any) #

legendTextStyle :: Lens' (Axis b c n) (Style V2 (N (Axis b c n))) #

legendOrientation :: Lens' (Axis b c n) Orientation #

HasAxisStyle (Axis b v n) b 
Instance details

Defined in Plots.Axis

Methods

axisStyle :: Lens' (Axis b v n) (AxisStyle b (V (Axis b v n)) (N (Axis b v n))) #

axisColourMap :: Lens' (Axis b v n) ColourMap #

axisStyles :: IndexedTraversal' Int (Axis b v n) (PlotStyle b (V (Axis b v n)) (N (Axis b v n))) #

type N (Axis b v n) 
Instance details

Defined in Plots.Axis

type N (Axis b v n) = n
type V (Axis b v n) 
Instance details

Defined in Plots.Axis

type V (Axis b v n) = BaseSpace v
type MainOpts (Axis b V2 n) 
Instance details

Defined in Plots.Axis.Render

type MainOpts (Axis b V2 n) = MainOpts (QDiagram b V2 n Any)
type MainOpts (Axis b Polar n) 
Instance details

Defined in Plots.Axis.Render

type MainOpts (Axis b Polar n) = MainOpts (QDiagram b V2 n Any)
type Args (Axis b v n) 
Instance details

Defined in Plots.Axis.Render

type Args (Axis b v n) = ()
type ResultOf (Axis b v n) 
Instance details

Defined in Plots.Axis.Render

type ResultOf (Axis b v n) = Axis b v n

type family BaseSpace (c :: Type -> Type) :: Type -> Type #

Instances
type BaseSpace Complex 
Instance details

Defined in Plots.Axis

type BaseSpace Complex = V2
type BaseSpace V2 
Instance details

Defined in Plots.Axis

type BaseSpace V2 = V2
type BaseSpace Polar 
Instance details

Defined in Plots.Axis

type BaseSpace Polar = V2
type BaseSpace V3 
Instance details

Defined in Plots.Axis

type BaseSpace V3 = V3

data SingleAxis b (v :: Type -> Type) n #

Instances
Functor f => HasGridLines f (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

Methods

gridLines :: LensLike' f (SingleAxis b v n) (GridLines (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

Functor f => HasMajorGridLines f (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

Methods

majorGridLines :: LensLike' f (SingleAxis b v n) (MajorGridLines (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

majorGridLinesFunction :: LensLike' f (SingleAxis b v n) (GridLineFunction (N (SingleAxis b v n))) #

majorGridLinesStyle :: LensLike' f (SingleAxis b v n) (Style (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

Functor f => HasMinorGridLines f (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

Methods

minorGridLines :: LensLike' f (SingleAxis b v n) (MinorGridLines (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

minorGridLinesFunction :: LensLike' f (SingleAxis b v n) (GridLineFunction (N (SingleAxis b v n))) #

minorGridLinesStyle :: LensLike' f (SingleAxis b v n) (Style (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

Functor f => HasAxisScaling f (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

Functor f => HasMajorTicks f (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

Methods

majorTicks :: LensLike' f (SingleAxis b v n) (MajorTicks (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

majorTicksFunction :: LensLike' f (SingleAxis b v n) ((N (SingleAxis b v n), N (SingleAxis b v n)) -> [N (SingleAxis b v n)]) #

majorTicksAlignment :: LensLike' f (SingleAxis b v n) TicksAlignment #

majorTicksLength :: LensLike' f (SingleAxis b v n) (N (SingleAxis b v n)) #

majorTicksStyle :: LensLike' f (SingleAxis b v n) (Style (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

Functor f => HasMinorTicks f (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

Methods

minorTicks :: LensLike' f (SingleAxis b v n) (MinorTicks (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

minorTicksFunction :: LensLike' f (SingleAxis b v n) ([N (SingleAxis b v n)] -> (N (SingleAxis b v n), N (SingleAxis b v n)) -> [N (SingleAxis b v n)]) #

minorTicksAlignment :: LensLike' f (SingleAxis b v n) TicksAlignment #

minorTicksLength :: LensLike' f (SingleAxis b v n) (N (SingleAxis b v n)) #

minorTicksStyle :: LensLike' f (SingleAxis b v n) (Style (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

Functor f => HasTicks f (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

Methods

bothTicks :: LensLike' f (SingleAxis b v n) (Ticks (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

Functor f => HasAxisLine f (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

Methods

axisLine :: LensLike' f (SingleAxis b v n) (AxisLine (V (SingleAxis b v n)) (N (SingleAxis b v n)))

axisLineType :: LensLike' f (SingleAxis b v n) AxisLineType

axisLineArrowOpts :: LensLike' f (SingleAxis b v n) (Maybe (ArrowOpts (N (SingleAxis b v n))))

axisLineStyle :: LensLike' f (SingleAxis b v n) (Style (V (SingleAxis b v n)) (N (SingleAxis b v n)))

Functor f => HasAxisLabel f (SingleAxis b v n) b 
Instance details

Defined in Plots.Axis

Functor f => HasTickLabels f (SingleAxis b v n) b 
Instance details

Defined in Plots.Axis

Methods

tickLabel :: LensLike' f (SingleAxis b v n) (TickLabels b (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

tickLabelTextFunction :: LensLike' f (SingleAxis b v n) (TextFunction b (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

tickLabelFunction :: LensLike' f (SingleAxis b v n) ([N (SingleAxis b v n)] -> (N (SingleAxis b v n), N (SingleAxis b v n)) -> [(N (SingleAxis b v n), String)]) #

tickLabelStyle :: LensLike' f (SingleAxis b v n) (Style (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

tickLabelGap :: LensLike' f (SingleAxis b v n) (N (SingleAxis b v n)) #

(TypeableFloat n, Renderable (Text n) b) => Default (SingleAxis b V2 n) 
Instance details

Defined in Plots.Axis

Methods

def :: SingleAxis b V2 n #

HasVisibility (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

Methods

visible :: Lens' (SingleAxis b v n) Bool #

hidden :: Lens' (SingleAxis b v n) Bool #

type N (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

type N (SingleAxis b v n) = n
type V (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

type V (SingleAxis b v n) = v

data ColourBar b n #

Instances
Functor f => HasMajorGridLines f (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

Functor f => HasMajorTicks f (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

Methods

majorTicks :: LensLike' f (ColourBar b n) (MajorTicks (V (ColourBar b n)) (N (ColourBar b n))) #

majorTicksFunction :: LensLike' f (ColourBar b n) ((N (ColourBar b n), N (ColourBar b n)) -> [N (ColourBar b n)]) #

majorTicksAlignment :: LensLike' f (ColourBar b n) TicksAlignment #

majorTicksLength :: LensLike' f (ColourBar b n) (N (ColourBar b n)) #

majorTicksStyle :: LensLike' f (ColourBar b n) (Style (V (ColourBar b n)) (N (ColourBar b n))) #

Functor f => HasMinorTicks f (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

Methods

minorTicks :: LensLike' f (ColourBar b n) (MinorTicks (V (ColourBar b n)) (N (ColourBar b n))) #

minorTicksFunction :: LensLike' f (ColourBar b n) ([N (ColourBar b n)] -> (N (ColourBar b n), N (ColourBar b n)) -> [N (ColourBar b n)]) #

minorTicksAlignment :: LensLike' f (ColourBar b n) TicksAlignment #

minorTicksLength :: LensLike' f (ColourBar b n) (N (ColourBar b n)) #

minorTicksStyle :: LensLike' f (ColourBar b n) (Style (V (ColourBar b n)) (N (ColourBar b n))) #

Functor f => HasTickLabels f (ColourBar b n) b 
Instance details

Defined in Plots.Axis.ColourBar

Methods

tickLabel :: LensLike' f (ColourBar b n) (TickLabels b (V (ColourBar b n)) (N (ColourBar b n))) #

tickLabelTextFunction :: LensLike' f (ColourBar b n) (TextFunction b (V (ColourBar b n)) (N (ColourBar b n))) #

tickLabelFunction :: LensLike' f (ColourBar b n) ([N (ColourBar b n)] -> (N (ColourBar b n), N (ColourBar b n)) -> [(N (ColourBar b n), String)]) #

tickLabelStyle :: LensLike' f (ColourBar b n) (Style (V (ColourBar b n)) (N (ColourBar b n))) #

tickLabelGap :: LensLike' f (ColourBar b n) (N (ColourBar b n)) #

Typeable n => HasStyle (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

Methods

applyStyle :: Style (V (ColourBar b n)) (N (ColourBar b n)) -> ColourBar b n -> ColourBar b n

HasGap (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

Methods

gap :: Lens' (ColourBar b n) (N (ColourBar b n)) #

HasOrientation (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

HasPlacement (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

HasVisibility (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

HasColourBar (ColourBar b n) b 
Instance details

Defined in Plots.Axis.ColourBar

Methods

colourBar :: Lens' (ColourBar b n) (ColourBar b (N (ColourBar b n))) #

colourBarDraw :: Lens' (ColourBar b n) (ColourMap -> QDiagram b V2 (N (ColourBar b n)) Any) #

colourBarWidth :: Lens' (ColourBar b n) (N (ColourBar b n)) #

colourBarLengthFunction :: Lens' (ColourBar b n) (N (ColourBar b n) -> N (ColourBar b n)) #

colourBarGap :: Lens' (ColourBar b n) (N (ColourBar b n)) #

colourBarStyle :: Lens' (ColourBar b n) (Style V2 (N (ColourBar b n))) #

type N (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

type N (ColourBar b n) = n
type V (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

type V (ColourBar b n) = V2

class HasColourBar a b | a -> b where #

Minimal complete definition

colourBar

Methods

colourBar :: Lens' a (ColourBar b (N a)) #

colourBarDraw :: Lens' a (ColourMap -> QDiagram b V2 (N a) Any) #

colourBarWidth :: Lens' a (N a) #

colourBarLengthFunction :: Lens' a (N a -> N a) #

colourBarGap :: Lens' a (N a) #

colourBarStyle :: Lens' a (Style V2 (N a)) #

Instances
HasColourBar (ColourBar b n) b 
Instance details

Defined in Plots.Axis.ColourBar

Methods

colourBar :: Lens' (ColourBar b n) (ColourBar b (N (ColourBar b n))) #

colourBarDraw :: Lens' (ColourBar b n) (ColourMap -> QDiagram b V2 (N (ColourBar b n)) Any) #

colourBarWidth :: Lens' (ColourBar b n) (N (ColourBar b n)) #

colourBarLengthFunction :: Lens' (ColourBar b n) (N (ColourBar b n) -> N (ColourBar b n)) #

colourBarGap :: Lens' (ColourBar b n) (N (ColourBar b n)) #

colourBarStyle :: Lens' (ColourBar b n) (Style V2 (N (ColourBar b n))) #

HasColourBar (Axis b v n) b 
Instance details

Defined in Plots.Axis

Methods

colourBar :: Lens' (Axis b v n) (ColourBar b (N (Axis b v n))) #

colourBarDraw :: Lens' (Axis b v n) (ColourMap -> QDiagram b V2 (N (Axis b v n)) Any) #

colourBarWidth :: Lens' (Axis b v n) (N (Axis b v n)) #

colourBarLengthFunction :: Lens' (Axis b v n) (N (Axis b v n) -> N (Axis b v n)) #

colourBarGap :: Lens' (Axis b v n) (N (Axis b v n)) #

colourBarStyle :: Lens' (Axis b v n) (Style V2 (N (Axis b v n))) #

type GridLineFunction n = [n] -> (n, n) -> [n] #

data GridLines (v :: Type -> Type) n #

Instances
Functor f => HasGridLines f (GridLines v n) 
Instance details

Defined in Plots.Axis.Grid

Methods

gridLines :: LensLike' f (GridLines v n) (GridLines (V (GridLines v n)) (N (GridLines v n))) #

Functor f => HasMajorGridLines f (GridLines v n) 
Instance details

Defined in Plots.Axis.Grid

Functor f => HasMinorGridLines f (GridLines v n) 
Instance details

Defined in Plots.Axis.Grid

(Typeable n, Floating n) => Default (GridLines v n) 
Instance details

Defined in Plots.Axis.Grid

Methods

def :: GridLines v n #

Typeable n => HasStyle (GridLines v n) 
Instance details

Defined in Plots.Axis.Grid

Methods

applyStyle :: Style (V (GridLines v n)) (N (GridLines v n)) -> GridLines v n -> GridLines v n

type N (GridLines v n) 
Instance details

Defined in Plots.Axis.Grid

type N (GridLines v n) = n
type V (GridLines v n) 
Instance details

Defined in Plots.Axis.Grid

type V (GridLines v n) = v

class (HasMinorGridLines f a, HasMajorGridLines f a) => HasGridLines (f :: Type -> Type) a where #

Methods

gridLines :: LensLike' f a (GridLines (V a) (N a)) #

Instances
Functor f => HasGridLines f (GridLines v n) 
Instance details

Defined in Plots.Axis.Grid

Methods

gridLines :: LensLike' f (GridLines v n) (GridLines (V (GridLines v n)) (N (GridLines v n))) #

Functor f => HasGridLines f (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

Methods

gridLines :: LensLike' f (SingleAxis b v n) (GridLines (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

(Applicative f, Traversable c) => HasGridLines f (Axis b c n) 
Instance details

Defined in Plots.Axis

Methods

gridLines :: LensLike' f (Axis b c n) (GridLines (V (Axis b c n)) (N (Axis b c n))) #

class HasMajorGridLines (f :: Type -> Type) a where #

Minimal complete definition

majorGridLines

Methods

majorGridLines :: LensLike' f a (MajorGridLines (V a) (N a)) #

majorGridLinesFunction :: LensLike' f a (GridLineFunction (N a)) #

majorGridLinesStyle :: LensLike' f a (Style (V a) (N a)) #

Instances
HasMajorGridLines f (MajorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

Functor f => HasMajorGridLines f (GridLines v n) 
Instance details

Defined in Plots.Axis.Grid

Functor f => HasMajorGridLines f (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

Functor f => HasMajorGridLines f (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

Methods

majorGridLines :: LensLike' f (SingleAxis b v n) (MajorGridLines (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

majorGridLinesFunction :: LensLike' f (SingleAxis b v n) (GridLineFunction (N (SingleAxis b v n))) #

majorGridLinesStyle :: LensLike' f (SingleAxis b v n) (Style (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

(Applicative f, Traversable c) => HasMajorGridLines f (Axis b c n) 
Instance details

Defined in Plots.Axis

Methods

majorGridLines :: LensLike' f (Axis b c n) (MajorGridLines (V (Axis b c n)) (N (Axis b c n))) #

majorGridLinesFunction :: LensLike' f (Axis b c n) (GridLineFunction (N (Axis b c n))) #

majorGridLinesStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

class HasMinorGridLines (f :: Type -> Type) a where #

Minimal complete definition

minorGridLines

Methods

minorGridLines :: LensLike' f a (MinorGridLines (V a) (N a)) #

minorGridLinesFunction :: LensLike' f a (GridLineFunction (N a)) #

minorGridLinesStyle :: LensLike' f a (Style (V a) (N a)) #

Instances
HasMinorGridLines f (MinorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

Functor f => HasMinorGridLines f (GridLines v n) 
Instance details

Defined in Plots.Axis.Grid

Functor f => HasMinorGridLines f (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

Methods

minorGridLines :: LensLike' f (SingleAxis b v n) (MinorGridLines (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

minorGridLinesFunction :: LensLike' f (SingleAxis b v n) (GridLineFunction (N (SingleAxis b v n))) #

minorGridLinesStyle :: LensLike' f (SingleAxis b v n) (Style (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

(Applicative f, Traversable c) => HasMinorGridLines f (Axis b c n) 
Instance details

Defined in Plots.Axis

Methods

minorGridLines :: LensLike' f (Axis b c n) (MinorGridLines (V (Axis b c n)) (N (Axis b c n))) #

minorGridLinesFunction :: LensLike' f (Axis b c n) (GridLineFunction (N (Axis b c n))) #

minorGridLinesStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

data MajorGridLines (v :: Type -> Type) n #

Instances
HasMajorGridLines f (MajorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

(Typeable n, Floating n) => Default (MajorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

Methods

def :: MajorGridLines v n #

Typeable n => HasStyle (MajorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

Methods

applyStyle :: Style (V (MajorGridLines v n)) (N (MajorGridLines v n)) -> MajorGridLines v n -> MajorGridLines v n

HasVisibility (MajorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

type N (MajorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

type N (MajorGridLines v n) = n
type V (MajorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

type V (MajorGridLines v n) = v

data MinorGridLines (v :: Type -> Type) n #

Instances
HasMinorGridLines f (MinorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

(Typeable n, Floating n) => Default (MinorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

Methods

def :: MinorGridLines v n #

Typeable n => HasStyle (MinorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

Methods

applyStyle :: Style (V (MinorGridLines v n)) (N (MinorGridLines v n)) -> MinorGridLines v n -> MinorGridLines v n

HasVisibility (MinorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

type N (MinorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

type N (MinorGridLines v n) = n
type V (MinorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

type V (MinorGridLines v n) = v

data AxisLabel b (v :: Type -> Type) n #

Instances
HasAxisLabel f (AxisLabel b v n) b 
Instance details

Defined in Plots.Axis.Labels

(TypeableFloat n, Renderable (Text n) b) => Default (AxisLabel b V2 n) 
Instance details

Defined in Plots.Axis.Labels

Methods

def :: AxisLabel b V2 n #

Typeable n => HasStyle (AxisLabel b v n) 
Instance details

Defined in Plots.Axis.Labels

Methods

applyStyle :: Style (V (AxisLabel b v n)) (N (AxisLabel b v n)) -> AxisLabel b v n -> AxisLabel b v n

HasGap (AxisLabel b v n) 
Instance details

Defined in Plots.Axis.Labels

Methods

gap :: Lens' (AxisLabel b v n) (N (AxisLabel b v n)) #

HasVisibility (AxisLabel b v n) 
Instance details

Defined in Plots.Axis.Labels

Methods

visible :: Lens' (AxisLabel b v n) Bool #

hidden :: Lens' (AxisLabel b v n) Bool #

type N (AxisLabel b v n) 
Instance details

Defined in Plots.Axis.Labels

type N (AxisLabel b v n) = n
type V (AxisLabel b v n) 
Instance details

Defined in Plots.Axis.Labels

type V (AxisLabel b v n) = v

class HasAxisLabel (f :: Type -> Type) a b | a -> b where #

Minimal complete definition

axisLabel

Instances
HasAxisLabel f (AxisLabel b v n) b 
Instance details

Defined in Plots.Axis.Labels

Functor f => HasAxisLabel f (SingleAxis b v n) b 
Instance details

Defined in Plots.Axis

(Applicative f, Traversable c) => HasAxisLabel f (Axis b c n) b 
Instance details

Defined in Plots.Axis

Methods

axisLabel :: LensLike' f (Axis b c n) (AxisLabel b (V (Axis b c n)) (N (Axis b c n))) #

axisLabelText :: LensLike' f (Axis b c n) String #

axisLabelTextFunction :: LensLike' f (Axis b c n) (TextFunction b (V (Axis b c n)) (N (Axis b c n))) #

axisLabelGap :: LensLike' f (Axis b c n) (N (Axis b c n)) #

axisLabelStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

axisLabelPosition :: LensLike' f (Axis b c n) AxisLabelPosition #

axisLabelPlacement :: LensLike' f (Axis b c n) AxisLabelPosition #

class HasTickLabels (f :: Type -> Type) a b | a -> b where #

Minimal complete definition

tickLabel

Methods

tickLabel :: LensLike' f a (TickLabels b (V a) (N a)) #

tickLabelTextFunction :: LensLike' f a (TextFunction b (V a) (N a)) #

tickLabelFunction :: LensLike' f a ([N a] -> (N a, N a) -> [(N a, String)]) #

tickLabelStyle :: LensLike' f a (Style (V a) (N a)) #

tickLabelGap :: LensLike' f a (N a) #

Instances
Functor f => HasTickLabels f (ColourBar b n) b 
Instance details

Defined in Plots.Axis.ColourBar

Methods

tickLabel :: LensLike' f (ColourBar b n) (TickLabels b (V (ColourBar b n)) (N (ColourBar b n))) #

tickLabelTextFunction :: LensLike' f (ColourBar b n) (TextFunction b (V (ColourBar b n)) (N (ColourBar b n))) #

tickLabelFunction :: LensLike' f (ColourBar b n) ([N (ColourBar b n)] -> (N (ColourBar b n), N (ColourBar b n)) -> [(N (ColourBar b n), String)]) #

tickLabelStyle :: LensLike' f (ColourBar b n) (Style (V (ColourBar b n)) (N (ColourBar b n))) #

tickLabelGap :: LensLike' f (ColourBar b n) (N (ColourBar b n)) #

HasTickLabels f (TickLabels b v n) b 
Instance details

Defined in Plots.Axis.Labels

Methods

tickLabel :: LensLike' f (TickLabels b v n) (TickLabels b (V (TickLabels b v n)) (N (TickLabels b v n))) #

tickLabelTextFunction :: LensLike' f (TickLabels b v n) (TextFunction b (V (TickLabels b v n)) (N (TickLabels b v n))) #

tickLabelFunction :: LensLike' f (TickLabels b v n) ([N (TickLabels b v n)] -> (N (TickLabels b v n), N (TickLabels b v n)) -> [(N (TickLabels b v n), String)]) #

tickLabelStyle :: LensLike' f (TickLabels b v n) (Style (V (TickLabels b v n)) (N (TickLabels b v n))) #

tickLabelGap :: LensLike' f (TickLabels b v n) (N (TickLabels b v n)) #

Functor f => HasTickLabels f (SingleAxis b v n) b 
Instance details

Defined in Plots.Axis

Methods

tickLabel :: LensLike' f (SingleAxis b v n) (TickLabels b (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

tickLabelTextFunction :: LensLike' f (SingleAxis b v n) (TextFunction b (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

tickLabelFunction :: LensLike' f (SingleAxis b v n) ([N (SingleAxis b v n)] -> (N (SingleAxis b v n), N (SingleAxis b v n)) -> [(N (SingleAxis b v n), String)]) #

tickLabelStyle :: LensLike' f (SingleAxis b v n) (Style (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

tickLabelGap :: LensLike' f (SingleAxis b v n) (N (SingleAxis b v n)) #

(Applicative f, Traversable c) => HasTickLabels f (Axis b c n) b 
Instance details

Defined in Plots.Axis

Methods

tickLabel :: LensLike' f (Axis b c n) (TickLabels b (V (Axis b c n)) (N (Axis b c n))) #

tickLabelTextFunction :: LensLike' f (Axis b c n) (TextFunction b (V (Axis b c n)) (N (Axis b c n))) #

tickLabelFunction :: LensLike' f (Axis b c n) ([N (Axis b c n)] -> (N (Axis b c n), N (Axis b c n)) -> [(N (Axis b c n), String)]) #

tickLabelStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

tickLabelGap :: LensLike' f (Axis b c n) (N (Axis b c n)) #

type TextFunction b (v :: Type -> Type) n = TextAlignment n -> String -> QDiagram b v n Any #

data TickLabels b (v :: Type -> Type) n #

Instances
HasTickLabels f (TickLabels b v n) b 
Instance details

Defined in Plots.Axis.Labels

Methods

tickLabel :: LensLike' f (TickLabels b v n) (TickLabels b (V (TickLabels b v n)) (N (TickLabels b v n))) #

tickLabelTextFunction :: LensLike' f (TickLabels b v n) (TextFunction b (V (TickLabels b v n)) (N (TickLabels b v n))) #

tickLabelFunction :: LensLike' f (TickLabels b v n) ([N (TickLabels b v n)] -> (N (TickLabels b v n), N (TickLabels b v n)) -> [(N (TickLabels b v n), String)]) #

tickLabelStyle :: LensLike' f (TickLabels b v n) (Style (V (TickLabels b v n)) (N (TickLabels b v n))) #

tickLabelGap :: LensLike' f (TickLabels b v n) (N (TickLabels b v n)) #

(TypeableFloat n, Renderable (Text n) b) => Default (TickLabels b V2 n) 
Instance details

Defined in Plots.Axis.Labels

Methods

def :: TickLabels b V2 n #

HasGap (TickLabels b v n) 
Instance details

Defined in Plots.Axis.Labels

Methods

gap :: Lens' (TickLabels b v n) (N (TickLabels b v n)) #

HasVisibility (TickLabels b v n) 
Instance details

Defined in Plots.Axis.Labels

Methods

visible :: Lens' (TickLabels b v n) Bool #

hidden :: Lens' (TickLabels b v n) Bool #

type N (TickLabels b v n) 
Instance details

Defined in Plots.Axis.Labels

type N (TickLabels b v n) = n
type V (TickLabels b v n) 
Instance details

Defined in Plots.Axis.Labels

type V (TickLabels b v n) = v

class RenderAxis b (v :: Type -> Type) n where #

Methods

renderAxis :: Axis b v n -> QDiagram b (BaseSpace v) n Any #

Instances
(TypeableFloat n, Renderable (Path V2 n) b) => RenderAxis b V2 n 
Instance details

Defined in Plots.Axis.Render

Methods

renderAxis :: Axis b V2 n -> QDiagram b (BaseSpace V2) n Any #

(TypeableFloat n, Renderable (Path V2 n) b) => RenderAxis b Polar n 
Instance details

Defined in Plots.Axis.Render

Methods

renderAxis :: Axis b Polar n -> QDiagram b (BaseSpace Polar) n Any #

data Extending n #

Constructors

AbsoluteExtend n 
RelativeExtend n 
Instances
Functor Extending 
Instance details

Defined in Plots.Axis.Scale

Methods

fmap :: (a -> b) -> Extending a -> Extending b #

(<$) :: a -> Extending b -> Extending a #

Eq n => Eq (Extending n) 
Instance details

Defined in Plots.Axis.Scale

Methods

(==) :: Extending n -> Extending n -> Bool #

(/=) :: Extending n -> Extending n -> Bool #

Ord n => Ord (Extending n) 
Instance details

Defined in Plots.Axis.Scale

Show n => Show (Extending n) 
Instance details

Defined in Plots.Axis.Scale

class HasAxisScaling (f :: Type -> Type) a where #

Minimal complete definition

axisScaling

Instances
HasAxisScaling f (AxisScaling n) 
Instance details

Defined in Plots.Axis.Scale

Functor f => HasAxisScaling f (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

(Applicative f, Traversable c) => HasAxisScaling f (Axis b c n) 
Instance details

Defined in Plots.Axis

Methods

axisScaling :: LensLike' f (Axis b c n) (AxisScaling (N (Axis b c n))) #

scaleAspectRatio :: LensLike' f (Axis b c n) (Maybe (N (Axis b c n))) #

scaleMode :: LensLike' f (Axis b c n) ScaleMode #

logScale :: LensLike' f (Axis b c n) LogScale #

axisExtend :: LensLike' f (Axis b c n) (Extending (N (Axis b c n))) #

boundMin :: LensLike' f (Axis b c n) (Maybe (N (Axis b c n))) #

boundMax :: LensLike' f (Axis b c n) (Maybe (N (Axis b c n))) #

renderSize :: LensLike' f (Axis b c n) (Maybe (N (Axis b c n))) #

data LogScale #

Constructors

LinearAxis 
LogAxis 
Instances
Eq LogScale 
Instance details

Defined in Plots.Axis.Scale

Show LogScale 
Instance details

Defined in Plots.Axis.Scale

Default LogScale 
Instance details

Defined in Plots.Axis.Scale

Methods

def :: LogScale #

class HasMajorTicks (f :: Type -> Type) a where #

Minimal complete definition

majorTicks

Methods

majorTicks :: LensLike' f a (MajorTicks (V a) (N a)) #

majorTicksFunction :: LensLike' f a ((N a, N a) -> [N a]) #

majorTicksAlignment :: LensLike' f a TicksAlignment #

majorTicksLength :: LensLike' f a (N a) #

majorTicksStyle :: LensLike' f a (Style (V a) (N a)) #

Instances
Functor f => HasMajorTicks f (Ticks v n) 
Instance details

Defined in Plots.Axis.Ticks

Methods

majorTicks :: LensLike' f (Ticks v n) (MajorTicks (V (Ticks v n)) (N (Ticks v n))) #

majorTicksFunction :: LensLike' f (Ticks v n) ((N (Ticks v n), N (Ticks v n)) -> [N (Ticks v n)]) #

majorTicksAlignment :: LensLike' f (Ticks v n) TicksAlignment #

majorTicksLength :: LensLike' f (Ticks v n) (N (Ticks v n)) #

majorTicksStyle :: LensLike' f (Ticks v n) (Style (V (Ticks v n)) (N (Ticks v n))) #

HasMajorTicks f (MajorTicks v n) 
Instance details

Defined in Plots.Axis.Ticks

Functor f => HasMajorTicks f (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

Methods

majorTicks :: LensLike' f (ColourBar b n) (MajorTicks (V (ColourBar b n)) (N (ColourBar b n))) #

majorTicksFunction :: LensLike' f (ColourBar b n) ((N (ColourBar b n), N (ColourBar b n)) -> [N (ColourBar b n)]) #

majorTicksAlignment :: LensLike' f (ColourBar b n) TicksAlignment #

majorTicksLength :: LensLike' f (ColourBar b n) (N (ColourBar b n)) #

majorTicksStyle :: LensLike' f (ColourBar b n) (Style (V (ColourBar b n)) (N (ColourBar b n))) #

Functor f => HasMajorTicks f (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

Methods

majorTicks :: LensLike' f (SingleAxis b v n) (MajorTicks (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

majorTicksFunction :: LensLike' f (SingleAxis b v n) ((N (SingleAxis b v n), N (SingleAxis b v n)) -> [N (SingleAxis b v n)]) #

majorTicksAlignment :: LensLike' f (SingleAxis b v n) TicksAlignment #

majorTicksLength :: LensLike' f (SingleAxis b v n) (N (SingleAxis b v n)) #

majorTicksStyle :: LensLike' f (SingleAxis b v n) (Style (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

(Applicative f, Traversable c) => HasMajorTicks f (Axis b c n) 
Instance details

Defined in Plots.Axis

Methods

majorTicks :: LensLike' f (Axis b c n) (MajorTicks (V (Axis b c n)) (N (Axis b c n))) #

majorTicksFunction :: LensLike' f (Axis b c n) ((N (Axis b c n), N (Axis b c n)) -> [N (Axis b c n)]) #

majorTicksAlignment :: LensLike' f (Axis b c n) TicksAlignment #

majorTicksLength :: LensLike' f (Axis b c n) (N (Axis b c n)) #

majorTicksStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

class HasMinorTicks (f :: Type -> Type) a where #

Minimal complete definition

minorTicks

Methods

minorTicks :: LensLike' f a (MinorTicks (V a) (N a)) #

minorTicksFunction :: LensLike' f a ([N a] -> (N a, N a) -> [N a]) #

minorTicksAlignment :: LensLike' f a TicksAlignment #

minorTicksLength :: LensLike' f a (N a) #

minorTicksStyle :: LensLike' f a (Style (V a) (N a)) #

Instances
Functor f => HasMinorTicks f (Ticks v n) 
Instance details

Defined in Plots.Axis.Ticks

Methods

minorTicks :: LensLike' f (Ticks v n) (MinorTicks (V (Ticks v n)) (N (Ticks v n))) #

minorTicksFunction :: LensLike' f (Ticks v n) ([N (Ticks v n)] -> (N (Ticks v n), N (Ticks v n)) -> [N (Ticks v n)]) #

minorTicksAlignment :: LensLike' f (Ticks v n) TicksAlignment #

minorTicksLength :: LensLike' f (Ticks v n) (N (Ticks v n)) #

minorTicksStyle :: LensLike' f (Ticks v n) (Style (V (Ticks v n)) (N (Ticks v n))) #

HasMinorTicks f (MinorTicks v n) 
Instance details

Defined in Plots.Axis.Ticks

Methods

minorTicks :: LensLike' f (MinorTicks v n) (MinorTicks (V (MinorTicks v n)) (N (MinorTicks v n))) #

minorTicksFunction :: LensLike' f (MinorTicks v n) ([N (MinorTicks v n)] -> (N (MinorTicks v n), N (MinorTicks v n)) -> [N (MinorTicks v n)]) #

minorTicksAlignment :: LensLike' f (MinorTicks v n) TicksAlignment #

minorTicksLength :: LensLike' f (MinorTicks v n) (N (MinorTicks v n)) #

minorTicksStyle :: LensLike' f (MinorTicks v n) (Style (V (MinorTicks v n)) (N (MinorTicks v n))) #

Functor f => HasMinorTicks f (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

Methods

minorTicks :: LensLike' f (ColourBar b n) (MinorTicks (V (ColourBar b n)) (N (ColourBar b n))) #

minorTicksFunction :: LensLike' f (ColourBar b n) ([N (ColourBar b n)] -> (N (ColourBar b n), N (ColourBar b n)) -> [N (ColourBar b n)]) #

minorTicksAlignment :: LensLike' f (ColourBar b n) TicksAlignment #

minorTicksLength :: LensLike' f (ColourBar b n) (N (ColourBar b n)) #

minorTicksStyle :: LensLike' f (ColourBar b n) (Style (V (ColourBar b n)) (N (ColourBar b n))) #

Functor f => HasMinorTicks f (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

Methods

minorTicks :: LensLike' f (SingleAxis b v n) (MinorTicks (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

minorTicksFunction :: LensLike' f (SingleAxis b v n) ([N (SingleAxis b v n)] -> (N (SingleAxis b v n), N (SingleAxis b v n)) -> [N (SingleAxis b v n)]) #

minorTicksAlignment :: LensLike' f (SingleAxis b v n) TicksAlignment #

minorTicksLength :: LensLike' f (SingleAxis b v n) (N (SingleAxis b v n)) #

minorTicksStyle :: LensLike' f (SingleAxis b v n) (Style (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

(Applicative f, Traversable c) => HasMinorTicks f (Axis b c n) 
Instance details

Defined in Plots.Axis

Methods

minorTicks :: LensLike' f (Axis b c n) (MinorTicks (V (Axis b c n)) (N (Axis b c n))) #

minorTicksFunction :: LensLike' f (Axis b c n) ([N (Axis b c n)] -> (N (Axis b c n), N (Axis b c n)) -> [N (Axis b c n)]) #

minorTicksAlignment :: LensLike' f (Axis b c n) TicksAlignment #

minorTicksLength :: LensLike' f (Axis b c n) (N (Axis b c n)) #

minorTicksStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

class (HasMinorTicks f a, HasMajorTicks f a) => HasTicks (f :: Type -> Type) a where #

Methods

bothTicks :: LensLike' f a (Ticks (V a) (N a)) #

Instances
Functor f => HasTicks f (Ticks v n) 
Instance details

Defined in Plots.Axis.Ticks

Methods

bothTicks :: LensLike' f (Ticks v n) (Ticks (V (Ticks v n)) (N (Ticks v n))) #

Functor f => HasTicks f (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

Methods

bothTicks :: LensLike' f (SingleAxis b v n) (Ticks (V (SingleAxis b v n)) (N (SingleAxis b v n))) #

(Applicative f, Traversable c) => HasTicks f (Axis b c n) 
Instance details

Defined in Plots.Axis

Methods

bothTicks :: LensLike' f (Axis b c n) (Ticks (V (Axis b c n)) (N (Axis b c n))) #

data MajorTicks (v :: Type -> Type) n #

Instances
HasMajorTicks f (MajorTicks v n) 
Instance details

Defined in Plots.Axis.Ticks

TypeableFloat n => Default (MajorTicks v n) 
Instance details

Defined in Plots.Axis.Ticks

Methods

def :: MajorTicks v n #

HasVisibility (MajorTicks v n) 
Instance details

Defined in Plots.Axis.Ticks

type N (MajorTicks v n) 
Instance details

Defined in Plots.Axis.Ticks

type N (MajorTicks v n) = n
type V (MajorTicks v n) 
Instance details

Defined in Plots.Axis.Ticks

type V (MajorTicks v n) = v

data MinorTicks (v :: Type -> Type) n #

Instances
HasMinorTicks f (MinorTicks v n) 
Instance details

Defined in Plots.Axis.Ticks

Methods

minorTicks :: LensLike' f (MinorTicks v n) (MinorTicks (V (MinorTicks v n)) (N (MinorTicks v n))) #

minorTicksFunction :: LensLike' f (MinorTicks v n) ([N (MinorTicks v n)] -> (N (MinorTicks v n), N (MinorTicks v n)) -> [N (MinorTicks v n)]) #

minorTicksAlignment :: LensLike' f (MinorTicks v n) TicksAlignment #

minorTicksLength :: LensLike' f (MinorTicks v n) (N (MinorTicks v n)) #

minorTicksStyle :: LensLike' f (MinorTicks v n) (Style (V (MinorTicks v n)) (N (MinorTicks v n))) #

TypeableFloat n => Default (MinorTicks v n) 
Instance details

Defined in Plots.Axis.Ticks

Methods

def :: MinorTicks v n #

HasVisibility (MinorTicks v n) 
Instance details

Defined in Plots.Axis.Ticks

type N (MinorTicks v n) 
Instance details

Defined in Plots.Axis.Ticks

type N (MinorTicks v n) = n
type V (MinorTicks v n) 
Instance details

Defined in Plots.Axis.Ticks

type V (MinorTicks v n) = v

data Ticks (v :: Type -> Type) n #

Instances
Functor f => HasMajorTicks f (Ticks v n) 
Instance details

Defined in Plots.Axis.Ticks

Methods

majorTicks :: LensLike' f (Ticks v n) (MajorTicks (V (Ticks v n)) (N (Ticks v n))) #

majorTicksFunction :: LensLike' f (Ticks v n) ((N (Ticks v n), N (Ticks v n)) -> [N (Ticks v n)]) #

majorTicksAlignment :: LensLike' f (Ticks v n) TicksAlignment #

majorTicksLength :: LensLike' f (Ticks v n) (N (Ticks v n)) #

majorTicksStyle :: LensLike' f (Ticks v n) (Style (V (Ticks v n)) (N (Ticks v n))) #

Functor f => HasMinorTicks f (Ticks v n) 
Instance details

Defined in Plots.Axis.Ticks

Methods

minorTicks :: LensLike' f (Ticks v n) (MinorTicks (V (Ticks v n)) (N (Ticks v n))) #

minorTicksFunction :: LensLike' f (Ticks v n) ([N (Ticks v n)] -> (N (Ticks v n), N (Ticks v n)) -> [N (Ticks v n)]) #

minorTicksAlignment :: LensLike' f (Ticks v n) TicksAlignment #

minorTicksLength :: LensLike' f (Ticks v n) (N (Ticks v n)) #

minorTicksStyle :: LensLike' f (Ticks v n) (Style (V (Ticks v n)) (N (Ticks v n))) #

Functor f => HasTicks f (Ticks v n) 
Instance details

Defined in Plots.Axis.Ticks

Methods

bothTicks :: LensLike' f (Ticks v n) (Ticks (V (Ticks v n)) (N (Ticks v n))) #

TypeableFloat n => Default (Ticks v n) 
Instance details

Defined in Plots.Axis.Ticks

Methods

def :: Ticks v n #

Typeable n => HasStyle (Ticks v n) 
Instance details

Defined in Plots.Axis.Ticks

Methods

applyStyle :: Style (V (Ticks v n)) (N (Ticks v n)) -> Ticks v n -> Ticks v n

type N (Ticks v n) 
Instance details

Defined in Plots.Axis.Ticks

type N (Ticks v n) = n
type V (Ticks v n) 
Instance details

Defined in Plots.Axis.Ticks

type V (Ticks v n) = v

class HasTitle a b | a -> b where #

Minimal complete definition

title

Methods

title :: Lens' a (Title b (V a) (N a)) #

titleText :: Lens' a String #

titleStyle :: Lens' a (Style (V a) (N a)) #

titlePlacement :: Lens' a Placement #

titleTextFunction :: Lens' a (TextAlignment (N a) -> String -> QDiagram b (V a) (N a) Any) #

titleAlignment :: Lens' a (TextAlignment (N a)) #

titleGap :: Lens' a (N a) #

Instances
HasTitle (Axis b c n) b 
Instance details

Defined in Plots.Axis

Methods

title :: Lens' (Axis b c n) (Title b (V (Axis b c n)) (N (Axis b c n))) #

titleText :: Lens' (Axis b c n) String #

titleStyle :: Lens' (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

titlePlacement :: Lens' (Axis b c n) Placement #

titleTextFunction :: Lens' (Axis b c n) (TextAlignment (N (Axis b c n)) -> String -> QDiagram b (V (Axis b c n)) (N (Axis b c n)) Any) #

titleAlignment :: Lens' (Axis b c n) (TextAlignment (N (Axis b c n))) #

titleGap :: Lens' (Axis b c n) (N (Axis b c n)) #

HasTitle (Title b v n) b 
Instance details

Defined in Plots.Axis.Title

Methods

title :: Lens' (Title b v n) (Title b (V (Title b v n)) (N (Title b v n))) #

titleText :: Lens' (Title b v n) String #

titleStyle :: Lens' (Title b v n) (Style (V (Title b v n)) (N (Title b v n))) #

titlePlacement :: Lens' (Title b v n) Placement #

titleTextFunction :: Lens' (Title b v n) (TextAlignment (N (Title b v n)) -> String -> QDiagram b (V (Title b v n)) (N (Title b v n)) Any) #

titleAlignment :: Lens' (Title b v n) (TextAlignment (N (Title b v n))) #

titleGap :: Lens' (Title b v n) (N (Title b v n)) #

data Title b (v :: Type -> Type) n #

Instances
(Renderable (Text n) b, TypeableFloat n) => Default (Title b V2 n) 
Instance details

Defined in Plots.Axis.Title

Methods

def :: Title b V2 n #

HasGap (Title b v n) 
Instance details

Defined in Plots.Axis.Title

Methods

gap :: Lens' (Title b v n) (N (Title b v n)) #

HasPlacement (Title b v n) 
Instance details

Defined in Plots.Axis.Title

Methods

placement :: Lens' (Title b v n) Placement #

placementAt :: Lens' (Title b v n) (V2 Rational) #

placementAnchor :: Lens' (Title b v n) (V2 Rational) #

gapDirection :: Lens' (Title b v n) (Direction V2 Rational) #

HasVisibility (Title b v n) 
Instance details

Defined in Plots.Axis.Title

Methods

visible :: Lens' (Title b v n) Bool #

hidden :: Lens' (Title b v n) Bool #

HasTitle (Title b v n) b 
Instance details

Defined in Plots.Axis.Title

Methods

title :: Lens' (Title b v n) (Title b (V (Title b v n)) (N (Title b v n))) #

titleText :: Lens' (Title b v n) String #

titleStyle :: Lens' (Title b v n) (Style (V (Title b v n)) (N (Title b v n))) #

titlePlacement :: Lens' (Title b v n) Placement #

titleTextFunction :: Lens' (Title b v n) (TextAlignment (N (Title b v n)) -> String -> QDiagram b (V (Title b v n)) (N (Title b v n)) Any) #

titleAlignment :: Lens' (Title b v n) (TextAlignment (N (Title b v n))) #

titleGap :: Lens' (Title b v n) (N (Title b v n)) #

type N (Title b v n) 
Instance details

Defined in Plots.Axis.Title

type N (Title b v n) = n
type V (Title b v n) 
Instance details

Defined in Plots.Axis.Title

type V (Title b v n) = v

class HasLegend a b | a -> b where #

Minimal complete definition

legend

Methods

legend :: Lens' a (Legend b (N a)) #

legendPlacement :: Lens' a Placement #

legendGap :: Lens' a (N a) #

legendStyle :: Lens' a (Style V2 (N a)) #

legendSpacing :: Lens' a (N a) #

legendTextWidth :: Lens' a (N a) #

legendTextFunction :: Lens' a (String -> QDiagram b V2 (N a) Any) #

legendTextStyle :: Lens' a (Style V2 (N a)) #

legendOrientation :: Lens' a Orientation #

Instances
HasLegend (Legend b n) b 
Instance details

Defined in Plots.Legend

Methods

legend :: Lens' (Legend b n) (Legend b (N (Legend b n))) #

legendPlacement :: Lens' (Legend b n) Placement #

legendGap :: Lens' (Legend b n) (N (Legend b n)) #

legendStyle :: Lens' (Legend b n) (Style V2 (N (Legend b n))) #

legendSpacing :: Lens' (Legend b n) (N (Legend b n)) #

legendTextWidth :: Lens' (Legend b n) (N (Legend b n)) #

legendTextFunction :: Lens' (Legend b n) (String -> QDiagram b V2 (N (Legend b n)) Any) #

legendTextStyle :: Lens' (Legend b n) (Style V2 (N (Legend b n))) #

legendOrientation :: Lens' (Legend b n) Orientation #

HasLegend (Axis b c n) b 
Instance details

Defined in Plots.Axis

Methods

legend :: Lens' (Axis b c n) (Legend b (N (Axis b c n))) #

legendPlacement :: Lens' (Axis b c n) Placement #

legendGap :: Lens' (Axis b c n) (N (Axis b c n)) #

legendStyle :: Lens' (Axis b c n) (Style V2 (N (Axis b c n))) #

legendSpacing :: Lens' (Axis b c n) (N (Axis b c n)) #

legendTextWidth :: Lens' (Axis b c n) (N (Axis b c n)) #

legendTextFunction :: Lens' (Axis b c n) (String -> QDiagram b V2 (N (Axis b c n)) Any) #

legendTextStyle :: Lens' (Axis b c n) (Style V2 (N (Axis b c n))) #

legendOrientation :: Lens' (Axis b c n) Orientation #

data ColourMap #

Instances
Show ColourMap 
Instance details

Defined in Plots.Style

Transformable ColourMap 
Instance details

Defined in Plots.Style

Methods

transform :: Transformation (V ColourMap) (N ColourMap) -> ColourMap -> ColourMap

At ColourMap 
Instance details

Defined in Plots.Style

Ixed ColourMap 
Instance details

Defined in Plots.Style

HasNanColours ColourMap 
Instance details

Defined in Plots.Style

Each ColourMap ColourMap (Colour Double) (Colour Double) 
Instance details

Defined in Plots.Style

type N ColourMap 
Instance details

Defined in Plots.Style

type V ColourMap 
Instance details

Defined in Plots.Style

type V ColourMap = V1
type Index ColourMap 
Instance details

Defined in Plots.Style

type IxValue ColourMap 
Instance details

Defined in Plots.Style

class HasAxisStyle a b | a -> b where #

Minimal complete definition

axisStyle

Methods

axisStyle :: Lens' a (AxisStyle b (V a) (N a)) #

axisColourMap :: Lens' a ColourMap #

axisStyles :: IndexedTraversal' Int a (PlotStyle b (V a) (N a)) #

Instances
HasAxisStyle (Axis b v n) b 
Instance details

Defined in Plots.Axis

Methods

axisStyle :: Lens' (Axis b v n) (AxisStyle b (V (Axis b v n)) (N (Axis b v n))) #

axisColourMap :: Lens' (Axis b v n) ColourMap #

axisStyles :: IndexedTraversal' Int (Axis b v n) (PlotStyle b (V (Axis b v n)) (N (Axis b v n))) #

HasAxisStyle (AxisStyle b v n) b 
Instance details

Defined in Plots.Style

Methods

axisStyle :: Lens' (AxisStyle b v n) (AxisStyle b (V (AxisStyle b v n)) (N (AxisStyle b v n))) #

axisColourMap :: Lens' (AxisStyle b v n) ColourMap #

axisStyles :: IndexedTraversal' Int (AxisStyle b v n) (PlotStyle b (V (AxisStyle b v n)) (N (AxisStyle b v n))) #

class HasPlotStyle (f :: Type -> Type) a b | a -> b where #

Minimal complete definition

plotStyle

Methods

plotStyle :: LensLike' f a (PlotStyle b (V a) (N a)) #

plotColour :: LensLike' f a (Colour Double) #

plotColor :: LensLike' f a (Colour Double) #

lineStyle :: LensLike' f a (Style (V a) (N a)) #

lineStyleFunction :: LensLike' f a (Colour Double -> Style (V a) (N a)) #

markerStyle :: LensLike' f a (Style (V a) (N a)) #

markerStyleFunction :: LensLike' f a (Colour Double -> Style (V a) (N a)) #

areaStyle :: LensLike' f a (Style (V a) (N a)) #

areaStyleFunction :: LensLike' f a (Colour Double -> Style (V a) (N a)) #

textStyle :: LensLike' f a (Style (V a) (N a)) #

textStyleFunction :: LensLike' f a (Colour Double -> Style (V a) (N a)) #

plotMarker :: LensLike' f a (QDiagram b (V a) (N a) Any) #

plotStyles :: LensLike' f a (Style (V a) (N a)) #

plotStyleFunctions :: LensLike' f a (Colour Double -> Style (V a) (N a)) #

Instances
Settable f => HasPlotStyle f (Plot p b) b 
Instance details

Defined in Plots.Types

Methods

plotStyle :: LensLike' f (Plot p b) (PlotStyle b (V (Plot p b)) (N (Plot p b))) #

plotColour :: LensLike' f (Plot p b) (Colour Double) #

plotColor :: LensLike' f (Plot p b) (Colour Double) #

lineStyle :: LensLike' f (Plot p b) (Style (V (Plot p b)) (N (Plot p b))) #

lineStyleFunction :: LensLike' f (Plot p b) (Colour Double -> Style (V (Plot p b)) (N (Plot p b))) #

markerStyle :: LensLike' f (Plot p b) (Style (V (Plot p b)) (N (Plot p b))) #

markerStyleFunction :: LensLike' f (Plot p b) (Colour Double -> Style (V (Plot p b)) (N (Plot p b))) #

areaStyle :: LensLike' f (Plot p b) (Style (V (Plot p b)) (N (Plot p b))) #

areaStyleFunction :: LensLike' f (Plot p b) (Colour Double -> Style (V (Plot p b)) (N (Plot p b))) #

textStyle :: LensLike' f (Plot p b) (Style (V (Plot p b)) (N (Plot p b))) #

textStyleFunction :: LensLike' f (Plot p b) (Colour Double -> Style (V (Plot p b)) (N (Plot p b))) #

plotMarker :: LensLike' f (Plot p b) (QDiagram b (V (Plot p b)) (N (Plot p b)) Any) #

plotStyles :: LensLike' f (Plot p b) (Style (V (Plot p b)) (N (Plot p b))) #

plotStyleFunctions :: LensLike' f (Plot p b) (Colour Double -> Style (V (Plot p b)) (N (Plot p b))) #

Functor f => HasPlotStyle f (StyledPlot b v n) b 
Instance details

Defined in Plots.Types

Methods

plotStyle :: LensLike' f (StyledPlot b v n) (PlotStyle b (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

plotColour :: LensLike' f (StyledPlot b v n) (Colour Double) #

plotColor :: LensLike' f (StyledPlot b v n) (Colour Double) #

lineStyle :: LensLike' f (StyledPlot b v n) (Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

lineStyleFunction :: LensLike' f (StyledPlot b v n) (Colour Double -> Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

markerStyle :: LensLike' f (StyledPlot b v n) (Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

markerStyleFunction :: LensLike' f (StyledPlot b v n) (Colour Double -> Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

areaStyle :: LensLike' f (StyledPlot b v n) (Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

areaStyleFunction :: LensLike' f (StyledPlot b v n) (Colour Double -> Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

textStyle :: LensLike' f (StyledPlot b v n) (Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

textStyleFunction :: LensLike' f (StyledPlot b v n) (Colour Double -> Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

plotMarker :: LensLike' f (StyledPlot b v n) (QDiagram b (V (StyledPlot b v n)) (N (StyledPlot b v n)) Any) #

plotStyles :: LensLike' f (StyledPlot b v n) (Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

plotStyleFunctions :: LensLike' f (StyledPlot b v n) (Colour Double -> Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

Settable f => HasPlotStyle f (PlotMods b v n) b 
Instance details

Defined in Plots.Types

Methods

plotStyle :: LensLike' f (PlotMods b v n) (PlotStyle b (V (PlotMods b v n)) (N (PlotMods b v n))) #

plotColour :: LensLike' f (PlotMods b v n) (Colour Double) #

plotColor :: LensLike' f (PlotMods b v n) (Colour Double) #

lineStyle :: LensLike' f (PlotMods b v n) (Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

lineStyleFunction :: LensLike' f (PlotMods b v n) (Colour Double -> Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

markerStyle :: LensLike' f (PlotMods b v n) (Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

markerStyleFunction :: LensLike' f (PlotMods b v n) (Colour Double -> Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

areaStyle :: LensLike' f (PlotMods b v n) (Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

areaStyleFunction :: LensLike' f (PlotMods b v n) (Colour Double -> Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

textStyle :: LensLike' f (PlotMods b v n) (Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

textStyleFunction :: LensLike' f (PlotMods b v n) (Colour Double -> Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

plotMarker :: LensLike' f (PlotMods b v n) (QDiagram b (V (PlotMods b v n)) (N (PlotMods b v n)) Any) #

plotStyles :: LensLike' f (PlotMods b v n) (Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

plotStyleFunctions :: LensLike' f (PlotMods b v n) (Colour Double -> Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

Settable f => HasPlotStyle f (DynamicPlot b v n) b 
Instance details

Defined in Plots.Types

Methods

plotStyle :: LensLike' f (DynamicPlot b v n) (PlotStyle b (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

plotColour :: LensLike' f (DynamicPlot b v n) (Colour Double) #

plotColor :: LensLike' f (DynamicPlot b v n) (Colour Double) #

lineStyle :: LensLike' f (DynamicPlot b v n) (Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

lineStyleFunction :: LensLike' f (DynamicPlot b v n) (Colour Double -> Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

markerStyle :: LensLike' f (DynamicPlot b v n) (Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

markerStyleFunction :: LensLike' f (DynamicPlot b v n) (Colour Double -> Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

areaStyle :: LensLike' f (DynamicPlot b v n) (Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

areaStyleFunction :: LensLike' f (DynamicPlot b v n) (Colour Double -> Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

textStyle :: LensLike' f (DynamicPlot b v n) (Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

textStyleFunction :: LensLike' f (DynamicPlot b v n) (Colour Double -> Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

plotMarker :: LensLike' f (DynamicPlot b v n) (QDiagram b (V (DynamicPlot b v n)) (N (DynamicPlot b v n)) Any) #

plotStyles :: LensLike' f (DynamicPlot b v n) (Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

plotStyleFunctions :: LensLike' f (DynamicPlot b v n) (Colour Double -> Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

HasPlotStyle f (PlotStyle b v n) b 
Instance details

Defined in Plots.Style

Methods

plotStyle :: LensLike' f (PlotStyle b v n) (PlotStyle b (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

plotColour :: LensLike' f (PlotStyle b v n) (Colour Double) #

plotColor :: LensLike' f (PlotStyle b v n) (Colour Double) #

lineStyle :: LensLike' f (PlotStyle b v n) (Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

lineStyleFunction :: LensLike' f (PlotStyle b v n) (Colour Double -> Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

markerStyle :: LensLike' f (PlotStyle b v n) (Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

markerStyleFunction :: LensLike' f (PlotStyle b v n) (Colour Double -> Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

areaStyle :: LensLike' f (PlotStyle b v n) (Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

areaStyleFunction :: LensLike' f (PlotStyle b v n) (Colour Double -> Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

textStyle :: LensLike' f (PlotStyle b v n) (Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

textStyleFunction :: LensLike' f (PlotStyle b v n) (Colour Double -> Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

plotMarker :: LensLike' f (PlotStyle b v n) (QDiagram b (V (PlotStyle b v n)) (N (PlotStyle b v n)) Any) #

plotStyles :: LensLike' f (PlotStyle b v n) (Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

plotStyleFunctions :: LensLike' f (PlotStyle b v n) (Colour Double -> Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

Applicative f => HasPlotStyle f (AxisStyle b v n) b 
Instance details

Defined in Plots.Style

Methods

plotStyle :: LensLike' f (AxisStyle b v n) (PlotStyle b (V (AxisStyle b v n)) (N (AxisStyle b v n))) #

plotColour :: LensLike' f (AxisStyle b v n) (Colour Double) #

plotColor :: LensLike' f (AxisStyle b v n) (Colour Double) #

lineStyle :: LensLike' f (AxisStyle b v n) (Style (V (AxisStyle b v n)) (N (AxisStyle b v n))) #

lineStyleFunction :: LensLike' f (AxisStyle b v n) (Colour Double -> Style (V (AxisStyle b v n)) (N (AxisStyle b v n))) #

markerStyle :: LensLike' f (AxisStyle b v n) (Style (V (AxisStyle b v n)) (N (AxisStyle b v n))) #

markerStyleFunction :: LensLike' f (AxisStyle b v n) (Colour Double -> Style (V (AxisStyle b v n)) (N (AxisStyle b v n))) #

areaStyle :: LensLike' f (AxisStyle b v n) (Style (V (AxisStyle b v n)) (N (AxisStyle b v n))) #

areaStyleFunction :: LensLike' f (AxisStyle b v n) (Colour Double -> Style (V (AxisStyle b v n)) (N (AxisStyle b v n))) #

textStyle :: LensLike' f (AxisStyle b v n) (Style (V (AxisStyle b v n)) (N (AxisStyle b v n))) #

textStyleFunction :: LensLike' f (AxisStyle b v n) (Colour Double -> Style (V (AxisStyle b v n)) (N (AxisStyle b v n))) #

plotMarker :: LensLike' f (AxisStyle b v n) (QDiagram b (V (AxisStyle b v n)) (N (AxisStyle b v n)) Any) #

plotStyles :: LensLike' f (AxisStyle b v n) (Style (V (AxisStyle b v n)) (N (AxisStyle b v n))) #

plotStyleFunctions :: LensLike' f (AxisStyle b v n) (Colour Double -> Style (V (AxisStyle b v n)) (N (AxisStyle b v n))) #

Settable f => HasPlotStyle f (Axis b c n) b 
Instance details

Defined in Plots.Axis

Methods

plotStyle :: LensLike' f (Axis b c n) (PlotStyle b (V (Axis b c n)) (N (Axis b c n))) #

plotColour :: LensLike' f (Axis b c n) (Colour Double) #

plotColor :: LensLike' f (Axis b c n) (Colour Double) #

lineStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

lineStyleFunction :: LensLike' f (Axis b c n) (Colour Double -> Style (V (Axis b c n)) (N (Axis b c n))) #

markerStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

markerStyleFunction :: LensLike' f (Axis b c n) (Colour Double -> Style (V (Axis b c n)) (N (Axis b c n))) #

areaStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

areaStyleFunction :: LensLike' f (Axis b c n) (Colour Double -> Style (V (Axis b c n)) (N (Axis b c n))) #

textStyle :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

textStyleFunction :: LensLike' f (Axis b c n) (Colour Double -> Style (V (Axis b c n)) (N (Axis b c n))) #

plotMarker :: LensLike' f (Axis b c n) (QDiagram b (V (Axis b c n)) (N (Axis b c n)) Any) #

plotStyles :: LensLike' f (Axis b c n) (Style (V (Axis b c n)) (N (Axis b c n))) #

plotStyleFunctions :: LensLike' f (Axis b c n) (Colour Double -> Style (V (Axis b c n)) (N (Axis b c n))) #

data PlotStyle b (v :: Type -> Type) n #

Instances
HasPlotStyle f (PlotStyle b v n) b 
Instance details

Defined in Plots.Style

Methods

plotStyle :: LensLike' f (PlotStyle b v n) (PlotStyle b (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

plotColour :: LensLike' f (PlotStyle b v n) (Colour Double) #

plotColor :: LensLike' f (PlotStyle b v n) (Colour Double) #

lineStyle :: LensLike' f (PlotStyle b v n) (Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

lineStyleFunction :: LensLike' f (PlotStyle b v n) (Colour Double -> Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

markerStyle :: LensLike' f (PlotStyle b v n) (Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

markerStyleFunction :: LensLike' f (PlotStyle b v n) (Colour Double -> Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

areaStyle :: LensLike' f (PlotStyle b v n) (Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

areaStyleFunction :: LensLike' f (PlotStyle b v n) (Colour Double -> Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

textStyle :: LensLike' f (PlotStyle b v n) (Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

textStyleFunction :: LensLike' f (PlotStyle b v n) (Colour Double -> Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

plotMarker :: LensLike' f (PlotStyle b v n) (QDiagram b (V (PlotStyle b v n)) (N (PlotStyle b v n)) Any) #

plotStyles :: LensLike' f (PlotStyle b v n) (Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

plotStyleFunctions :: LensLike' f (PlotStyle b v n) (Colour Double -> Style (V (PlotStyle b v n)) (N (PlotStyle b v n))) #

(Metric v, Traversable v, OrderedField n) => Transformable (PlotStyle b v n) 
Instance details

Defined in Plots.Style

Methods

transform :: Transformation (V (PlotStyle b v n)) (N (PlotStyle b v n)) -> PlotStyle b v n -> PlotStyle b v n

type N (PlotStyle b v n) 
Instance details

Defined in Plots.Style

type N (PlotStyle b v n) = n
type V (PlotStyle b v n) 
Instance details

Defined in Plots.Style

type V (PlotStyle b v n) = v

data AxisSpec (v :: Type -> Type) n #

Constructors

AxisSpec 

Fields

Instances
type N (AxisSpec v n) 
Instance details

Defined in Plots.Types

type N (AxisSpec v n) = n
type V (AxisSpec v n) 
Instance details

Defined in Plots.Types

type V (AxisSpec v n) = v

data DynamicPlot b (v :: Type -> Type) n where #

Constructors

DynamicPlot :: forall b (v :: Type -> Type) n p. (InSpace v n p, Plotable p b) => Plot p b -> DynamicPlot b v n 
Instances
(Applicative f, Typeable b, v ~ V2, Typeable n) => HasWedge f (DynamicPlot b v n) 
Instance details

Defined in Plots.Types.Pie

Methods

pieWedge :: LensLike' f (DynamicPlot b v n) (Wedge (N (DynamicPlot b v n))) #

wedgeOuterRadius :: LensLike' f (DynamicPlot b v n) (N (DynamicPlot b v n)) #

wedgeInnerRadius :: LensLike' f (DynamicPlot b v n) (N (DynamicPlot b v n)) #

wedgeOffset :: LensLike' f (DynamicPlot b v n) (N (DynamicPlot b v n)) #

wedgeWidth :: LensLike' f (DynamicPlot b v n) (Angle (N (DynamicPlot b v n))) #

wedgeDirection :: LensLike' f (DynamicPlot b v n) (Direction V2 (N (DynamicPlot b v n))) #

(Applicative f, Typeable b, Typeable v, Typeable n) => HasConnectingLine f (DynamicPlot b v n) 
Instance details

Defined in Plots.Types.Scatter

Settable f => HasPlotStyle f (DynamicPlot b v n) b 
Instance details

Defined in Plots.Types

Methods

plotStyle :: LensLike' f (DynamicPlot b v n) (PlotStyle b (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

plotColour :: LensLike' f (DynamicPlot b v n) (Colour Double) #

plotColor :: LensLike' f (DynamicPlot b v n) (Colour Double) #

lineStyle :: LensLike' f (DynamicPlot b v n) (Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

lineStyleFunction :: LensLike' f (DynamicPlot b v n) (Colour Double -> Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

markerStyle :: LensLike' f (DynamicPlot b v n) (Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

markerStyleFunction :: LensLike' f (DynamicPlot b v n) (Colour Double -> Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

areaStyle :: LensLike' f (DynamicPlot b v n) (Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

areaStyleFunction :: LensLike' f (DynamicPlot b v n) (Colour Double -> Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

textStyle :: LensLike' f (DynamicPlot b v n) (Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

textStyleFunction :: LensLike' f (DynamicPlot b v n) (Colour Double -> Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

plotMarker :: LensLike' f (DynamicPlot b v n) (QDiagram b (V (DynamicPlot b v n)) (N (DynamicPlot b v n)) Any) #

plotStyles :: LensLike' f (DynamicPlot b v n) (Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

plotStyleFunctions :: LensLike' f (DynamicPlot b v n) (Colour Double -> Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

Functor f => HasPlotOptions f (DynamicPlot b v n) b 
Instance details

Defined in Plots.Types

Methods

plotOptions :: LensLike' f (DynamicPlot b v n) (PlotOptions b (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

plotName :: LensLike' f (DynamicPlot b v n) Name #

clipPlot :: LensLike' f (DynamicPlot b v n) Bool #

legendEntries :: LensLike' f (DynamicPlot b v n) [LegendEntry b (V (DynamicPlot b v n)) (N (DynamicPlot b v n))] #

plotTransform :: LensLike' f (DynamicPlot b v n) (Transformation (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

plotVisible :: LensLike' f (DynamicPlot b v n) Bool #

(Applicative f, Typeable b, Typeable v, Typeable n, Typeable a) => HasScatterOptions f (DynamicPlot b v n) a 
Instance details

Defined in Plots.Types.Scatter

Methods

gscatterOptions :: LensLike' f (DynamicPlot b v n) (ScatterOptions (V (DynamicPlot b v n)) (N (DynamicPlot b v n)) a) #

scatterTransform :: LensLike' f (DynamicPlot b v n) (a -> Transformation (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

scatterStyle :: LensLike' f (DynamicPlot b v n) (a -> Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

scatterPosition :: LensLike' f (DynamicPlot b v n) (a -> Point (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

HasVisibility (DynamicPlot b v n) 
Instance details

Defined in Plots.Types

Methods

visible :: Lens' (DynamicPlot b v n) Bool #

hidden :: Lens' (DynamicPlot b v n) Bool #

type N (DynamicPlot b v n) 
Instance details

Defined in Plots.Types

type N (DynamicPlot b v n) = n
type V (DynamicPlot b v n) 
Instance details

Defined in Plots.Types

type V (DynamicPlot b v n) = v

class HasGap a where #

Methods

gap :: Lens' a (N a) #

Instances
HasGap (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

Methods

gap :: Lens' (ColourBar b n) (N (ColourBar b n)) #

HasGap (Legend b n) 
Instance details

Defined in Plots.Legend

Methods

gap :: Lens' (Legend b n) (N (Legend b n)) #

HasGap (AxisLabel b v n) 
Instance details

Defined in Plots.Axis.Labels

Methods

gap :: Lens' (AxisLabel b v n) (N (AxisLabel b v n)) #

HasGap (TickLabels b v n) 
Instance details

Defined in Plots.Axis.Labels

Methods

gap :: Lens' (TickLabels b v n) (N (TickLabels b v n)) #

HasGap (Title b v n) 
Instance details

Defined in Plots.Axis.Title

Methods

gap :: Lens' (Title b v n) (N (Title b v n)) #

class HasOrientation a where #

Instances
HasOrientation Orientation 
Instance details

Defined in Plots.Types

HasOrientation (BarLayout n) 
Instance details

Defined in Plots.Types.Bar

HasOrientation (BarPlot n) 
Instance details

Defined in Plots.Types.Bar

HasOrientation (HistogramOptions n) 
Instance details

Defined in Plots.Types.Histogram

HasOrientation (HistogramPlot n) 
Instance details

Defined in Plots.Types.Histogram

HasOrientation (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

HasOrientation (Legend b n) 
Instance details

Defined in Plots.Legend

Methods

orientation :: Lens' (Legend b n) Orientation #

HasOrientation p => HasOrientation (Plot p b) 
Instance details

Defined in Plots.Types

Methods

orientation :: Lens' (Plot p b) Orientation #

HasOrientation (MultiBarState b n a) 
Instance details

Defined in Plots.Types.Bar

class HasPlacement a where #

Minimal complete definition

placement

Instances
HasPlacement Placement 
Instance details

Defined in Plots.Types

HasPlacement (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

HasPlacement (Legend b n) 
Instance details

Defined in Plots.Legend

Methods

placement :: Lens' (Legend b n) Placement #

placementAt :: Lens' (Legend b n) (V2 Rational) #

placementAnchor :: Lens' (Legend b n) (V2 Rational) #

gapDirection :: Lens' (Legend b n) (Direction V2 Rational) #

HasPlacement (Title b v n) 
Instance details

Defined in Plots.Axis.Title

Methods

placement :: Lens' (Title b v n) Placement #

placementAt :: Lens' (Title b v n) (V2 Rational) #

placementAnchor :: Lens' (Title b v n) (V2 Rational) #

gapDirection :: Lens' (Title b v n) (Direction V2 Rational) #

class HasPlotOptions (f :: Type -> Type) a b | a -> b where #

Minimal complete definition

plotOptions

Methods

plotOptions :: LensLike' f a (PlotOptions b (V a) (N a)) #

plotName :: LensLike' f a Name #

clipPlot :: LensLike' f a Bool #

legendEntries :: LensLike' f a [LegendEntry b (V a) (N a)] #

plotTransform :: LensLike' f a (Transformation (V a) (N a)) #

plotVisible :: LensLike' f a Bool #

Instances
Functor f => HasPlotOptions f (Plot p b) b 
Instance details

Defined in Plots.Types

Methods

plotOptions :: LensLike' f (Plot p b) (PlotOptions b (V (Plot p b)) (N (Plot p b))) #

plotName :: LensLike' f (Plot p b) Name #

clipPlot :: LensLike' f (Plot p b) Bool #

legendEntries :: LensLike' f (Plot p b) [LegendEntry b (V (Plot p b)) (N (Plot p b))] #

plotTransform :: LensLike' f (Plot p b) (Transformation (V (Plot p b)) (N (Plot p b))) #

plotVisible :: LensLike' f (Plot p b) Bool #

Functor f => HasPlotOptions f (StyledPlot b v n) b 
Instance details

Defined in Plots.Types

Methods

plotOptions :: LensLike' f (StyledPlot b v n) (PlotOptions b (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

plotName :: LensLike' f (StyledPlot b v n) Name #

clipPlot :: LensLike' f (StyledPlot b v n) Bool #

legendEntries :: LensLike' f (StyledPlot b v n) [LegendEntry b (V (StyledPlot b v n)) (N (StyledPlot b v n))] #

plotTransform :: LensLike' f (StyledPlot b v n) (Transformation (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

plotVisible :: LensLike' f (StyledPlot b v n) Bool #

HasPlotOptions f (PlotOptions b v n) b 
Instance details

Defined in Plots.Types

Methods

plotOptions :: LensLike' f (PlotOptions b v n) (PlotOptions b (V (PlotOptions b v n)) (N (PlotOptions b v n))) #

plotName :: LensLike' f (PlotOptions b v n) Name #

clipPlot :: LensLike' f (PlotOptions b v n) Bool #

legendEntries :: LensLike' f (PlotOptions b v n) [LegendEntry b (V (PlotOptions b v n)) (N (PlotOptions b v n))] #

plotTransform :: LensLike' f (PlotOptions b v n) (Transformation (V (PlotOptions b v n)) (N (PlotOptions b v n))) #

plotVisible :: LensLike' f (PlotOptions b v n) Bool #

Functor f => HasPlotOptions f (PlotMods b v n) b 
Instance details

Defined in Plots.Types

Methods

plotOptions :: LensLike' f (PlotMods b v n) (PlotOptions b (V (PlotMods b v n)) (N (PlotMods b v n))) #

plotName :: LensLike' f (PlotMods b v n) Name #

clipPlot :: LensLike' f (PlotMods b v n) Bool #

legendEntries :: LensLike' f (PlotMods b v n) [LegendEntry b (V (PlotMods b v n)) (N (PlotMods b v n))] #

plotTransform :: LensLike' f (PlotMods b v n) (Transformation (V (PlotMods b v n)) (N (PlotMods b v n))) #

plotVisible :: LensLike' f (PlotMods b v n) Bool #

Functor f => HasPlotOptions f (DynamicPlot b v n) b 
Instance details

Defined in Plots.Types

Methods

plotOptions :: LensLike' f (DynamicPlot b v n) (PlotOptions b (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

plotName :: LensLike' f (DynamicPlot b v n) Name #

clipPlot :: LensLike' f (DynamicPlot b v n) Bool #

legendEntries :: LensLike' f (DynamicPlot b v n) [LegendEntry b (V (DynamicPlot b v n)) (N (DynamicPlot b v n))] #

plotTransform :: LensLike' f (DynamicPlot b v n) (Transformation (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

plotVisible :: LensLike' f (DynamicPlot b v n) Bool #

Settable f => HasPlotOptions f (Axis b c n) b 
Instance details

Defined in Plots.Axis

Methods

plotOptions :: LensLike' f (Axis b c n) (PlotOptions b (V (Axis b c n)) (N (Axis b c n))) #

plotName :: LensLike' f (Axis b c n) Name #

clipPlot :: LensLike' f (Axis b c n) Bool #

legendEntries :: LensLike' f (Axis b c n) [LegendEntry b (V (Axis b c n)) (N (Axis b c n))] #

plotTransform :: LensLike' f (Axis b c n) (Transformation (V (Axis b c n)) (N (Axis b c n))) #

plotVisible :: LensLike' f (Axis b c n) Bool #

class HasVisibility a where #

Minimal complete definition

visible

Methods

visible :: Lens' a Bool #

hidden :: Lens' a Bool #

Instances
HasVisibility (ColourBar b n) 
Instance details

Defined in Plots.Axis.ColourBar

HasVisibility (MajorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

HasVisibility (MinorGridLines v n) 
Instance details

Defined in Plots.Axis.Grid

HasVisibility (MajorTicks v n) 
Instance details

Defined in Plots.Axis.Ticks

HasVisibility (MinorTicks v n) 
Instance details

Defined in Plots.Axis.Ticks

HasVisibility (Legend b n) 
Instance details

Defined in Plots.Legend

Methods

visible :: Lens' (Legend b n) Bool #

hidden :: Lens' (Legend b n) Bool #

HasVisibility (Plot p b) 
Instance details

Defined in Plots.Types

Methods

visible :: Lens' (Plot p b) Bool #

hidden :: Lens' (Plot p b) Bool #

HasVisibility (AxisLine v n) 
Instance details

Defined in Plots.Axis.Line

Methods

visible :: Lens' (AxisLine v n) Bool #

hidden :: Lens' (AxisLine v n) Bool #

HasVisibility (SingleAxis b v n) 
Instance details

Defined in Plots.Axis

Methods

visible :: Lens' (SingleAxis b v n) Bool #

hidden :: Lens' (SingleAxis b v n) Bool #

HasVisibility (AxisLabel b v n) 
Instance details

Defined in Plots.Axis.Labels

Methods

visible :: Lens' (AxisLabel b v n) Bool #

hidden :: Lens' (AxisLabel b v n) Bool #

HasVisibility (TickLabels b v n) 
Instance details

Defined in Plots.Axis.Labels

Methods

visible :: Lens' (TickLabels b v n) Bool #

hidden :: Lens' (TickLabels b v n) Bool #

HasVisibility (Title b v n) 
Instance details

Defined in Plots.Axis.Title

Methods

visible :: Lens' (Title b v n) Bool #

hidden :: Lens' (Title b v n) Bool #

HasVisibility (DynamicPlot b v n) 
Instance details

Defined in Plots.Types

Methods

visible :: Lens' (DynamicPlot b v n) Bool #

hidden :: Lens' (DynamicPlot b v n) Bool #

HasVisibility (PlotMods b v n) 
Instance details

Defined in Plots.Types

Methods

visible :: Lens' (PlotMods b v n) Bool #

hidden :: Lens' (PlotMods b v n) Bool #

HasVisibility (PlotOptions b v n) 
Instance details

Defined in Plots.Types

Methods

visible :: Lens' (PlotOptions b v n) Bool #

hidden :: Lens' (PlotOptions b v n) Bool #

HasVisibility (StyledPlot b v n) 
Instance details

Defined in Plots.Types

Methods

visible :: Lens' (StyledPlot b v n) Bool #

hidden :: Lens' (StyledPlot b v n) Bool #

data LegendEntry b (v :: Type -> Type) n #

Instances
type N (LegendEntry b v n) 
Instance details

Defined in Plots.Types

type N (LegendEntry b v n) = n
type V (LegendEntry b v n) 
Instance details

Defined in Plots.Types

type V (LegendEntry b v n) = v

data LegendPic b (v :: Type -> Type) n #

Constructors

DefaultLegendPic 
CustomLegendPic (PlotStyle b v n -> QDiagram b v n Any) 
Instances
Default (LegendPic b v n) 
Instance details

Defined in Plots.Types

Methods

def :: LegendPic b v n #

data PlotMods b (v :: Type -> Type) n #

Instances
Settable f => HasPlotStyle f (PlotMods b v n) b 
Instance details

Defined in Plots.Types

Methods

plotStyle :: LensLike' f (PlotMods b v n) (PlotStyle b (V (PlotMods b v n)) (N (PlotMods b v n))) #

plotColour :: LensLike' f (PlotMods b v n) (Colour Double) #

plotColor :: LensLike' f (PlotMods b v n) (Colour Double) #

lineStyle :: LensLike' f (PlotMods b v n) (Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

lineStyleFunction :: LensLike' f (PlotMods b v n) (Colour Double -> Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

markerStyle :: LensLike' f (PlotMods b v n) (Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

markerStyleFunction :: LensLike' f (PlotMods b v n) (Colour Double -> Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

areaStyle :: LensLike' f (PlotMods b v n) (Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

areaStyleFunction :: LensLike' f (PlotMods b v n) (Colour Double -> Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

textStyle :: LensLike' f (PlotMods b v n) (Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

textStyleFunction :: LensLike' f (PlotMods b v n) (Colour Double -> Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

plotMarker :: LensLike' f (PlotMods b v n) (QDiagram b (V (PlotMods b v n)) (N (PlotMods b v n)) Any) #

plotStyles :: LensLike' f (PlotMods b v n) (Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

plotStyleFunctions :: LensLike' f (PlotMods b v n) (Colour Double -> Style (V (PlotMods b v n)) (N (PlotMods b v n))) #

Functor f => HasPlotOptions f (PlotMods b v n) b 
Instance details

Defined in Plots.Types

Methods

plotOptions :: LensLike' f (PlotMods b v n) (PlotOptions b (V (PlotMods b v n)) (N (PlotMods b v n))) #

plotName :: LensLike' f (PlotMods b v n) Name #

clipPlot :: LensLike' f (PlotMods b v n) Bool #

legendEntries :: LensLike' f (PlotMods b v n) [LegendEntry b (V (PlotMods b v n)) (N (PlotMods b v n))] #

plotTransform :: LensLike' f (PlotMods b v n) (Transformation (V (PlotMods b v n)) (N (PlotMods b v n))) #

plotVisible :: LensLike' f (PlotMods b v n) Bool #

(Additive v, Num n) => Default (PlotMods b v n) 
Instance details

Defined in Plots.Types

Methods

def :: PlotMods b v n #

HasVisibility (PlotMods b v n) 
Instance details

Defined in Plots.Types

Methods

visible :: Lens' (PlotMods b v n) Bool #

hidden :: Lens' (PlotMods b v n) Bool #

type N (PlotMods b v n) 
Instance details

Defined in Plots.Types

type N (PlotMods b v n) = n
type V (PlotMods b v n) 
Instance details

Defined in Plots.Types

type V (PlotMods b v n) = v

data PlotOptions b (v :: Type -> Type) n #

Instances
HasPlotOptions f (PlotOptions b v n) b 
Instance details

Defined in Plots.Types

Methods

plotOptions :: LensLike' f (PlotOptions b v n) (PlotOptions b (V (PlotOptions b v n)) (N (PlotOptions b v n))) #

plotName :: LensLike' f (PlotOptions b v n) Name #

clipPlot :: LensLike' f (PlotOptions b v n) Bool #

legendEntries :: LensLike' f (PlotOptions b v n) [LegendEntry b (V (PlotOptions b v n)) (N (PlotOptions b v n))] #

plotTransform :: LensLike' f (PlotOptions b v n) (Transformation (V (PlotOptions b v n)) (N (PlotOptions b v n))) #

plotVisible :: LensLike' f (PlotOptions b v n) Bool #

(Additive v, Num n) => Default (PlotOptions b v n) 
Instance details

Defined in Plots.Types

Methods

def :: PlotOptions b v n #

(Additive v, Num n) => HasOrigin (PlotOptions b v n) 
Instance details

Defined in Plots.Types

Methods

moveOriginTo :: Point (V (PlotOptions b v n)) (N (PlotOptions b v n)) -> PlotOptions b v n -> PlotOptions b v n

Qualifiable (PlotOptions b v n) 
Instance details

Defined in Plots.Types

Methods

(.>>) :: IsName a => a -> PlotOptions b v n -> PlotOptions b v n

(HasLinearMap v, Num n) => Transformable (PlotOptions b v n) 
Instance details

Defined in Plots.Types

Methods

transform :: Transformation (V (PlotOptions b v n)) (N (PlotOptions b v n)) -> PlotOptions b v n -> PlotOptions b v n

HasVisibility (PlotOptions b v n) 
Instance details

Defined in Plots.Types

Methods

visible :: Lens' (PlotOptions b v n) Bool #

hidden :: Lens' (PlotOptions b v n) Bool #

type N (PlotOptions b v n) 
Instance details

Defined in Plots.Types

type N (PlotOptions b v n) = n
type V (PlotOptions b v n) 
Instance details

Defined in Plots.Types

type V (PlotOptions b v n) = v

class (Typeable p, Enveloped p) => Plotable p b where #

Minimal complete definition

renderPlotable

Methods

renderPlotable :: InSpace v n p => AxisSpec v n -> PlotStyle b v n -> p -> QDiagram b v n Any #

defLegendPic :: InSpace v n p => PlotStyle b v n -> p -> QDiagram b v n Any #

Instances
(TypeableFloat n, Renderable (Path V2 n) b) => Plotable (BarPlot n) b 
Instance details

Defined in Plots.Types.Bar

Methods

renderPlotable :: InSpace v n0 (BarPlot n) => AxisSpec v n0 -> PlotStyle b v n0 -> BarPlot n -> QDiagram b v n0 Any #

defLegendPic :: InSpace v n0 (BarPlot n) => PlotStyle b v n0 -> BarPlot n -> QDiagram b v n0 Any #

(TypeableFloat n, Renderable (Path V2 n) b) => Plotable (HistogramPlot n) b 
Instance details

Defined in Plots.Types.Histogram

Methods

renderPlotable :: InSpace v n0 (HistogramPlot n) => AxisSpec v n0 -> PlotStyle b v n0 -> HistogramPlot n -> QDiagram b v n0 Any #

defLegendPic :: InSpace v n0 (HistogramPlot n) => PlotStyle b v n0 -> HistogramPlot n -> QDiagram b v n0 Any #

(TypeableFloat n, Renderable (Path V2 n) b) => Plotable (Wedge n) b 
Instance details

Defined in Plots.Types.Pie

Methods

renderPlotable :: InSpace v n0 (Wedge n) => AxisSpec v n0 -> PlotStyle b v n0 -> Wedge n -> QDiagram b v n0 Any #

defLegendPic :: InSpace v n0 (Wedge n) => PlotStyle b v n0 -> Wedge n -> QDiagram b v n0 Any #

(TypeableFloat n, Renderable (Path V2 n) b) => Plotable (Path V2 n) b 
Instance details

Defined in Plots.Types

Methods

renderPlotable :: InSpace v n0 (Path V2 n) => AxisSpec v n0 -> PlotStyle b v n0 -> Path V2 n -> QDiagram b v n0 Any #

defLegendPic :: InSpace v n0 (Path V2 n) => PlotStyle b v n0 -> Path V2 n -> QDiagram b v n0 Any #

(Typeable b, TypeableFloat n, Renderable (Path V2 n) b) => Plotable (HeatMap b n) b 
Instance details

Defined in Plots.Types.HeatMap

Methods

renderPlotable :: InSpace v n0 (HeatMap b n) => AxisSpec v n0 -> PlotStyle b v n0 -> HeatMap b n -> QDiagram b v n0 Any #

defLegendPic :: InSpace v n0 (HeatMap b n) => PlotStyle b v n0 -> HeatMap b n -> QDiagram b v n0 Any #

(TypeableFloat n, Renderable (Path V2 n) b) => Plotable (ScatterPlot V2 n) b 
Instance details

Defined in Plots.Types.Scatter

Methods

renderPlotable :: InSpace v n0 (ScatterPlot V2 n) => AxisSpec v n0 -> PlotStyle b v n0 -> ScatterPlot V2 n -> QDiagram b v n0 Any #

defLegendPic :: InSpace v n0 (ScatterPlot V2 n) => PlotStyle b v n0 -> ScatterPlot V2 n -> QDiagram b v n0 Any #

(Typeable b, Typeable v, Metric v, Typeable n, OrderedField n) => Plotable (QDiagram b v n Any) b 
Instance details

Defined in Plots.Types

Methods

renderPlotable :: InSpace v0 n0 (QDiagram b v n Any) => AxisSpec v0 n0 -> PlotStyle b v0 n0 -> QDiagram b v n Any -> QDiagram b v0 n0 Any #

defLegendPic :: InSpace v0 n0 (QDiagram b v n Any) => PlotStyle b v0 n0 -> QDiagram b v n Any -> QDiagram b v0 n0 Any #

data StyledPlot b (v :: Type -> Type) n #

Instances
(v ~ V2, Applicative f, Typeable n) => HasWedge f (StyledPlot b v n) 
Instance details

Defined in Plots.Types.Pie

Methods

pieWedge :: LensLike' f (StyledPlot b v n) (Wedge (N (StyledPlot b v n))) #

wedgeOuterRadius :: LensLike' f (StyledPlot b v n) (N (StyledPlot b v n)) #

wedgeInnerRadius :: LensLike' f (StyledPlot b v n) (N (StyledPlot b v n)) #

wedgeOffset :: LensLike' f (StyledPlot b v n) (N (StyledPlot b v n)) #

wedgeWidth :: LensLike' f (StyledPlot b v n) (Angle (N (StyledPlot b v n))) #

wedgeDirection :: LensLike' f (StyledPlot b v n) (Direction V2 (N (StyledPlot b v n))) #

(Applicative f, Typeable v, Typeable n) => HasConnectingLine f (StyledPlot b v n) 
Instance details

Defined in Plots.Types.Scatter

Functor f => HasPlotStyle f (StyledPlot b v n) b 
Instance details

Defined in Plots.Types

Methods

plotStyle :: LensLike' f (StyledPlot b v n) (PlotStyle b (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

plotColour :: LensLike' f (StyledPlot b v n) (Colour Double) #

plotColor :: LensLike' f (StyledPlot b v n) (Colour Double) #

lineStyle :: LensLike' f (StyledPlot b v n) (Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

lineStyleFunction :: LensLike' f (StyledPlot b v n) (Colour Double -> Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

markerStyle :: LensLike' f (StyledPlot b v n) (Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

markerStyleFunction :: LensLike' f (StyledPlot b v n) (Colour Double -> Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

areaStyle :: LensLike' f (StyledPlot b v n) (Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

areaStyleFunction :: LensLike' f (StyledPlot b v n) (Colour Double -> Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

textStyle :: LensLike' f (StyledPlot b v n) (Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

textStyleFunction :: LensLike' f (StyledPlot b v n) (Colour Double -> Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

plotMarker :: LensLike' f (StyledPlot b v n) (QDiagram b (V (StyledPlot b v n)) (N (StyledPlot b v n)) Any) #

plotStyles :: LensLike' f (StyledPlot b v n) (Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

plotStyleFunctions :: LensLike' f (StyledPlot b v n) (Colour Double -> Style (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

Functor f => HasPlotOptions f (StyledPlot b v n) b 
Instance details

Defined in Plots.Types

Methods

plotOptions :: LensLike' f (StyledPlot b v n) (PlotOptions b (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

plotName :: LensLike' f (StyledPlot b v n) Name #

clipPlot :: LensLike' f (StyledPlot b v n) Bool #

legendEntries :: LensLike' f (StyledPlot b v n) [LegendEntry b (V (StyledPlot b v n)) (N (StyledPlot b v n))] #

plotTransform :: LensLike' f (StyledPlot b v n) (Transformation (V (StyledPlot b v n)) (N (StyledPlot b v n))) #

plotVisible :: LensLike' f (StyledPlot b v n) Bool #

(Metric v, OrderedField n) => Enveloped (StyledPlot b v n) 
Instance details

Defined in Plots.Types

Methods

getEnvelope :: StyledPlot b v n -> Envelope (V (StyledPlot b v n)) (N (StyledPlot b v n))

HasVisibility (StyledPlot b v n) 
Instance details

Defined in Plots.Types

Methods

visible :: Lens' (StyledPlot b v n) Bool #

hidden :: Lens' (StyledPlot b v n) Bool #

type N (StyledPlot b v n) 
Instance details

Defined in Plots.Types

type N (StyledPlot b v n) = n
type V (StyledPlot b v n) 
Instance details

Defined in Plots.Types

type V (StyledPlot b v n) = v

data BarLayout n #

Instances
Fractional n => Default (BarLayout n) 
Instance details

Defined in Plots.Types.Bar

Methods

def :: BarLayout n #

HasOrientation (BarLayout n) 
Instance details

Defined in Plots.Types.Bar

HasBarLayout (BarLayout n) 
Instance details

Defined in Plots.Types.Bar

type N (BarLayout n) 
Instance details

Defined in Plots.Types.Bar

type N (BarLayout n) = n

data BarPlot n #

Instances
OrderedField n => Enveloped (BarPlot n) 
Instance details

Defined in Plots.Types.Bar

Methods

getEnvelope :: BarPlot n -> Envelope (V (BarPlot n)) (N (BarPlot n))

HasOrientation (BarPlot n) 
Instance details

Defined in Plots.Types.Bar

HasBarLayout (BarPlot n) 
Instance details

Defined in Plots.Types.Bar

Methods

barLayout :: Lens' (BarPlot n) (BarLayout (N (BarPlot n))) #

barWidth :: Lens' (BarPlot n) (N (BarPlot n)) #

barSpacing :: Lens' (BarPlot n) (N (BarPlot n)) #

barStart :: Lens' (BarPlot n) (N (BarPlot n)) #

(TypeableFloat n, Renderable (Path V2 n) b) => Plotable (BarPlot n) b 
Instance details

Defined in Plots.Types.Bar

Methods

renderPlotable :: InSpace v n0 (BarPlot n) => AxisSpec v n0 -> PlotStyle b v n0 -> BarPlot n -> QDiagram b v n0 Any #

defLegendPic :: InSpace v n0 (BarPlot n) => PlotStyle b v n0 -> BarPlot n -> QDiagram b v n0 Any #

type N (BarPlot n) 
Instance details

Defined in Plots.Types.Bar

type N (BarPlot n) = n
type V (BarPlot n) 
Instance details

Defined in Plots.Types.Bar

type V (BarPlot n) = V2

class HasOrientation a => HasBarLayout a where #

Minimal complete definition

barLayout

Methods

barLayout :: Lens' a (BarLayout (N a)) #

barWidth :: Lens' a (N a) #

barSpacing :: Lens' a (N a) #

barStart :: Lens' a (N a) #

Instances
HasBarLayout (BarLayout n) 
Instance details

Defined in Plots.Types.Bar

HasBarLayout (BarPlot n) 
Instance details

Defined in Plots.Types.Bar

Methods

barLayout :: Lens' (BarPlot n) (BarLayout (N (BarPlot n))) #

barWidth :: Lens' (BarPlot n) (N (BarPlot n)) #

barSpacing :: Lens' (BarPlot n) (N (BarPlot n)) #

barStart :: Lens' (BarPlot n) (N (BarPlot n)) #

HasBarLayout a => HasBarLayout (Plot a b) 
Instance details

Defined in Plots.Types.Bar

Methods

barLayout :: Lens' (Plot a b) (BarLayout (N (Plot a b))) #

barWidth :: Lens' (Plot a b) (N (Plot a b)) #

barSpacing :: Lens' (Plot a b) (N (Plot a b)) #

barStart :: Lens' (Plot a b) (N (Plot a b)) #

HasBarLayout (MultiBarState b n a) 
Instance details

Defined in Plots.Types.Bar

Methods

barLayout :: Lens' (MultiBarState b n a) (BarLayout (N (MultiBarState b n a))) #

barWidth :: Lens' (MultiBarState b n a) (N (MultiBarState b n a)) #

barSpacing :: Lens' (MultiBarState b n a) (N (MultiBarState b n a)) #

barStart :: Lens' (MultiBarState b n a) (N (MultiBarState b n a)) #

data MultiBarState b n a #

Instances
HasOrientation (MultiBarState b n a) 
Instance details

Defined in Plots.Types.Bar

HasBarLayout (MultiBarState b n a) 
Instance details

Defined in Plots.Types.Bar

Methods

barLayout :: Lens' (MultiBarState b n a) (BarLayout (N (MultiBarState b n a))) #

barWidth :: Lens' (MultiBarState b n a) (N (MultiBarState b n a)) #

barSpacing :: Lens' (MultiBarState b n a) (N (MultiBarState b n a)) #

barStart :: Lens' (MultiBarState b n a) (N (MultiBarState b n a)) #

HasLabels (MultiBarState b n a) 
Instance details

Defined in Plots.Types.Bar

Methods

labels :: Lens' (MultiBarState b n a) [String]

type N (MultiBarState b n a) 
Instance details

Defined in Plots.Types.Bar

type N (MultiBarState b n a) = n

class HasHeatMap (f :: Type -> Type) a b | a -> b where #

Minimal complete definition

heatMapOptions

Methods

heatMapOptions :: LensLike' f a (HeatMap b (N a)) #

heatMapGridVisible :: LensLike' f a Bool #

heatMapGridStyle :: LensLike' f a (Style V2 (N a)) #

heatMapSize :: LensLike' f a (V2 (N a)) #

heatMapExtent :: LensLike' f a (V2 (N a)) #

heatMapStart :: LensLike' f a (P2 (N a)) #

heatMapCentre :: LensLike' f a (P2 (N a)) #

heatMapLimits :: LensLike' f a (Maybe (Double, Double)) #

heatMapRender :: LensLike' f a (HeatMatrix -> ColourMap -> QDiagram b V2 (N a) Any) #

Instances
(Functor f, HasHeatMap f a b) => HasHeatMap f (Plot a b) b 
Instance details

Defined in Plots.Types.HeatMap

Methods

heatMapOptions :: LensLike' f (Plot a b) (HeatMap b (N (Plot a b))) #

heatMapGridVisible :: LensLike' f (Plot a b) Bool #

heatMapGridStyle :: LensLike' f (Plot a b) (Style V2 (N (Plot a b))) #

heatMapSize :: LensLike' f (Plot a b) (V2 (N (Plot a b))) #

heatMapExtent :: LensLike' f (Plot a b) (V2 (N (Plot a b))) #

heatMapStart :: LensLike' f (Plot a b) (P2 (N (Plot a b))) #

heatMapCentre :: LensLike' f (Plot a b) (P2 (N (Plot a b))) #

heatMapLimits :: LensLike' f (Plot a b) (Maybe (Double, Double)) #

heatMapRender :: LensLike' f (Plot a b) (HeatMatrix -> ColourMap -> QDiagram b V2 (N (Plot a b)) Any) #

HasHeatMap f (HeatMap b n) b 
Instance details

Defined in Plots.Types.HeatMap

Methods

heatMapOptions :: LensLike' f (HeatMap b n) (HeatMap b (N (HeatMap b n))) #

heatMapGridVisible :: LensLike' f (HeatMap b n) Bool #

heatMapGridStyle :: LensLike' f (HeatMap b n) (Style V2 (N (HeatMap b n))) #

heatMapSize :: LensLike' f (HeatMap b n) (V2 (N (HeatMap b n))) #

heatMapExtent :: LensLike' f (HeatMap b n) (V2 (N (HeatMap b n))) #

heatMapStart :: LensLike' f (HeatMap b n) (P2 (N (HeatMap b n))) #

heatMapCentre :: LensLike' f (HeatMap b n) (P2 (N (HeatMap b n))) #

heatMapLimits :: LensLike' f (HeatMap b n) (Maybe (Double, Double)) #

heatMapRender :: LensLike' f (HeatMap b n) (HeatMatrix -> ColourMap -> QDiagram b V2 (N (HeatMap b n)) Any) #

data HeatMap b n #

Instances
HasHeatMap f (HeatMap b n) b 
Instance details

Defined in Plots.Types.HeatMap

Methods

heatMapOptions :: LensLike' f (HeatMap b n) (HeatMap b (N (HeatMap b n))) #

heatMapGridVisible :: LensLike' f (HeatMap b n) Bool #

heatMapGridStyle :: LensLike' f (HeatMap b n) (Style V2 (N (HeatMap b n))) #

heatMapSize :: LensLike' f (HeatMap b n) (V2 (N (HeatMap b n))) #

heatMapExtent :: LensLike' f (HeatMap b n) (V2 (N (HeatMap b n))) #

heatMapStart :: LensLike' f (HeatMap b n) (P2 (N (HeatMap b n))) #

heatMapCentre :: LensLike' f (HeatMap b n) (P2 (N (HeatMap b n))) #

heatMapLimits :: LensLike' f (HeatMap b n) (Maybe (Double, Double)) #

heatMapRender :: LensLike' f (HeatMap b n) (HeatMatrix -> ColourMap -> QDiagram b V2 (N (HeatMap b n)) Any) #

OrderedField n => Enveloped (HeatMap b n) 
Instance details

Defined in Plots.Types.HeatMap

Methods

getEnvelope :: HeatMap b n -> Envelope (V (HeatMap b n)) (N (HeatMap b n))

(Typeable b, TypeableFloat n, Renderable (Path V2 n) b) => Plotable (HeatMap b n) b 
Instance details

Defined in Plots.Types.HeatMap

Methods

renderPlotable :: InSpace v n0 (HeatMap b n) => AxisSpec v n0 -> PlotStyle b v n0 -> HeatMap b n -> QDiagram b v n0 Any #

defLegendPic :: InSpace v n0 (HeatMap b n) => PlotStyle b v n0 -> HeatMap b n -> QDiagram b v n0 Any #

type N (HeatMap b n) 
Instance details

Defined in Plots.Types.HeatMap

type N (HeatMap b n) = n
type V (HeatMap b n) 
Instance details

Defined in Plots.Types.HeatMap

type V (HeatMap b n) = V2

data HistogramPlot n #

Instances
OrderedField n => Enveloped (HistogramPlot n) 
Instance details

Defined in Plots.Types.Histogram

Methods

getEnvelope :: HistogramPlot n -> Envelope (V (HistogramPlot n)) (N (HistogramPlot n))

HasOrientation (HistogramPlot n) 
Instance details

Defined in Plots.Types.Histogram

(TypeableFloat n, Renderable (Path V2 n) b) => Plotable (HistogramPlot n) b 
Instance details

Defined in Plots.Types.Histogram

Methods

renderPlotable :: InSpace v n0 (HistogramPlot n) => AxisSpec v n0 -> PlotStyle b v n0 -> HistogramPlot n -> QDiagram b v n0 Any #

defLegendPic :: InSpace v n0 (HistogramPlot n) => PlotStyle b v n0 -> HistogramPlot n -> QDiagram b v n0 Any #

type N (HistogramPlot n) 
Instance details

Defined in Plots.Types.Histogram

type N (HistogramPlot n) = n
type V (HistogramPlot n) 
Instance details

Defined in Plots.Types.Histogram

type V (HistogramPlot n) = V2

class HasWedge (f :: Type -> Type) a where #

Minimal complete definition

pieWedge

Methods

pieWedge :: LensLike' f a (Wedge (N a)) #

wedgeOuterRadius :: LensLike' f a (N a) #

wedgeInnerRadius :: LensLike' f a (N a) #

wedgeOffset :: LensLike' f a (N a) #

wedgeWidth :: LensLike' f a (Angle (N a)) #

wedgeDirection :: LensLike' f a (Direction V2 (N a)) #

Instances
HasWedge f (Wedge n) 
Instance details

Defined in Plots.Types.Pie

Methods

pieWedge :: LensLike' f (Wedge n) (Wedge (N (Wedge n))) #

wedgeOuterRadius :: LensLike' f (Wedge n) (N (Wedge n)) #

wedgeInnerRadius :: LensLike' f (Wedge n) (N (Wedge n)) #

wedgeOffset :: LensLike' f (Wedge n) (N (Wedge n)) #

wedgeWidth :: LensLike' f (Wedge n) (Angle (N (Wedge n))) #

wedgeDirection :: LensLike' f (Wedge n) (Direction V2 (N (Wedge n))) #

(Functor f, HasWedge f a) => HasWedge f (Plot a b) 
Instance details

Defined in Plots.Types.Pie

Methods

pieWedge :: LensLike' f (Plot a b) (Wedge (N (Plot a b))) #

wedgeOuterRadius :: LensLike' f (Plot a b) (N (Plot a b)) #

wedgeInnerRadius :: LensLike' f (Plot a b) (N (Plot a b)) #

wedgeOffset :: LensLike' f (Plot a b) (N (Plot a b)) #

wedgeWidth :: LensLike' f (Plot a b) (Angle (N (Plot a b))) #

wedgeDirection :: LensLike' f (Plot a b) (Direction V2 (N (Plot a b))) #

(v ~ V2, Applicative f, Typeable n) => HasWedge f (StyledPlot b v n) 
Instance details

Defined in Plots.Types.Pie

Methods

pieWedge :: LensLike' f (StyledPlot b v n) (Wedge (N (StyledPlot b v n))) #

wedgeOuterRadius :: LensLike' f (StyledPlot b v n) (N (StyledPlot b v n)) #

wedgeInnerRadius :: LensLike' f (StyledPlot b v n) (N (StyledPlot b v n)) #

wedgeOffset :: LensLike' f (StyledPlot b v n) (N (StyledPlot b v n)) #

wedgeWidth :: LensLike' f (StyledPlot b v n) (Angle (N (StyledPlot b v n))) #

wedgeDirection :: LensLike' f (StyledPlot b v n) (Direction V2 (N (StyledPlot b v n))) #

Applicative f => HasWedge f (PieState b n a) 
Instance details

Defined in Plots.Types.Pie

Methods

pieWedge :: LensLike' f (PieState b n a) (Wedge (N (PieState b n a))) #

wedgeOuterRadius :: LensLike' f (PieState b n a) (N (PieState b n a)) #

wedgeInnerRadius :: LensLike' f (PieState b n a) (N (PieState b n a)) #

wedgeOffset :: LensLike' f (PieState b n a) (N (PieState b n a)) #

wedgeWidth :: LensLike' f (PieState b n a) (Angle (N (PieState b n a))) #

wedgeDirection :: LensLike' f (PieState b n a) (Direction V2 (N (PieState b n a))) #

(Applicative f, Typeable b, v ~ V2, Typeable n) => HasWedge f (DynamicPlot b v n) 
Instance details

Defined in Plots.Types.Pie

Methods

pieWedge :: LensLike' f (DynamicPlot b v n) (Wedge (N (DynamicPlot b v n))) #

wedgeOuterRadius :: LensLike' f (DynamicPlot b v n) (N (DynamicPlot b v n)) #

wedgeInnerRadius :: LensLike' f (DynamicPlot b v n) (N (DynamicPlot b v n)) #

wedgeOffset :: LensLike' f (DynamicPlot b v n) (N (DynamicPlot b v n)) #

wedgeWidth :: LensLike' f (DynamicPlot b v n) (Angle (N (DynamicPlot b v n))) #

wedgeDirection :: LensLike' f (DynamicPlot b v n) (Direction V2 (N (DynamicPlot b v n))) #

(BaseSpace c ~ V2, Settable f, Typeable n) => HasWedge f (Axis b c n) 
Instance details

Defined in Plots.Types.Pie

Methods

pieWedge :: LensLike' f (Axis b c n) (Wedge (N (Axis b c n))) #

wedgeOuterRadius :: LensLike' f (Axis b c n) (N (Axis b c n)) #

wedgeInnerRadius :: LensLike' f (Axis b c n) (N (Axis b c n)) #

wedgeOffset :: LensLike' f (Axis b c n) (N (Axis b c n)) #

wedgeWidth :: LensLike' f (Axis b c n) (Angle (N (Axis b c n))) #

wedgeDirection :: LensLike' f (Axis b c n) (Direction V2 (N (Axis b c n))) #

data PieState b n a #

Instances
Applicative f => HasWedge f (PieState b n a) 
Instance details

Defined in Plots.Types.Pie

Methods

pieWedge :: LensLike' f (PieState b n a) (Wedge (N (PieState b n a))) #

wedgeOuterRadius :: LensLike' f (PieState b n a) (N (PieState b n a)) #

wedgeInnerRadius :: LensLike' f (PieState b n a) (N (PieState b n a)) #

wedgeOffset :: LensLike' f (PieState b n a) (N (PieState b n a)) #

wedgeWidth :: LensLike' f (PieState b n a) (Angle (N (PieState b n a))) #

wedgeDirection :: LensLike' f (PieState b n a) (Direction V2 (N (PieState b n a))) #

type N (PieState b n a) 
Instance details

Defined in Plots.Types.Pie

type N (PieState b n a) = n
type V (PieState b n a) 
Instance details

Defined in Plots.Types.Pie

type V (PieState b n a) = V2

data Wedge n #

Instances
HasWedge f (Wedge n) 
Instance details

Defined in Plots.Types.Pie

Methods

pieWedge :: LensLike' f (Wedge n) (Wedge (N (Wedge n))) #

wedgeOuterRadius :: LensLike' f (Wedge n) (N (Wedge n)) #

wedgeInnerRadius :: LensLike' f (Wedge n) (N (Wedge n)) #

wedgeOffset :: LensLike' f (Wedge n) (N (Wedge n)) #

wedgeWidth :: LensLike' f (Wedge n) (Angle (N (Wedge n))) #

wedgeDirection :: LensLike' f (Wedge n) (Direction V2 (N (Wedge n))) #

RealFloat n => Enveloped (Wedge n) 
Instance details

Defined in Plots.Types.Pie

Methods

getEnvelope :: Wedge n -> Envelope (V (Wedge n)) (N (Wedge n))

(TypeableFloat n, Renderable (Path V2 n) b) => Plotable (Wedge n) b 
Instance details

Defined in Plots.Types.Pie

Methods

renderPlotable :: InSpace v n0 (Wedge n) => AxisSpec v n0 -> PlotStyle b v n0 -> Wedge n -> QDiagram b v n0 Any #

defLegendPic :: InSpace v n0 (Wedge n) => PlotStyle b v n0 -> Wedge n -> QDiagram b v n0 Any #

type N (Wedge n) 
Instance details

Defined in Plots.Types.Pie

type N (Wedge n) = n
type V (Wedge n) 
Instance details

Defined in Plots.Types.Pie

type V (Wedge n) = V2

type BubbleOptions (v :: Type -> Type) n = ScatterOptions v n (n, Point v n) #

class HasConnectingLine (f :: Type -> Type) a where #

Instances
HasConnectingLine f (ScatterPlot v n) 
Instance details

Defined in Plots.Types.Scatter

HasConnectingLine f p => HasConnectingLine f (Plot p b) 
Instance details

Defined in Plots.Types.Scatter

Methods

connectingLine :: LensLike' f (Plot p b) Bool #

(Applicative f, Typeable v, Typeable n) => HasConnectingLine f (StyledPlot b v n) 
Instance details

Defined in Plots.Types.Scatter

HasConnectingLine f (ScatterOptions v n a) 
Instance details

Defined in Plots.Types.Scatter

(Applicative f, Typeable b, Typeable v, Typeable n) => HasConnectingLine f (DynamicPlot b v n) 
Instance details

Defined in Plots.Types.Scatter

(Settable f, Typeable (BaseSpace c), Typeable n) => HasConnectingLine f (Axis b c n) 
Instance details

Defined in Plots.Types.Scatter

Methods

connectingLine :: LensLike' f (Axis b c n) Bool #

class HasScatterOptions (f :: Type -> Type) a d where #

Minimal complete definition

gscatterOptions

Methods

gscatterOptions :: LensLike' f a (ScatterOptions (V a) (N a) d) #

scatterTransform :: LensLike' f a (d -> Transformation (V a) (N a)) #

scatterStyle :: LensLike' f a (d -> Style (V a) (N a)) #

scatterPosition :: LensLike' f a (d -> Point (V a) (N a)) #

Instances
(Applicative f, Typeable v, Typeable n, Typeable d) => HasScatterOptions f (ScatterPlot v n) d 
Instance details

Defined in Plots.Types.Scatter

Methods

gscatterOptions :: LensLike' f (ScatterPlot v n) (ScatterOptions (V (ScatterPlot v n)) (N (ScatterPlot v n)) d) #

scatterTransform :: LensLike' f (ScatterPlot v n) (d -> Transformation (V (ScatterPlot v n)) (N (ScatterPlot v n))) #

scatterStyle :: LensLike' f (ScatterPlot v n) (d -> Style (V (ScatterPlot v n)) (N (ScatterPlot v n))) #

scatterPosition :: LensLike' f (ScatterPlot v n) (d -> Point (V (ScatterPlot v n)) (N (ScatterPlot v n))) #

(Functor f, HasScatterOptions f p a) => HasScatterOptions f (Plot p b) a 
Instance details

Defined in Plots.Types.Scatter

Methods

gscatterOptions :: LensLike' f (Plot p b) (ScatterOptions (V (Plot p b)) (N (Plot p b)) a) #

scatterTransform :: LensLike' f (Plot p b) (a -> Transformation (V (Plot p b)) (N (Plot p b))) #

scatterStyle :: LensLike' f (Plot p b) (a -> Style (V (Plot p b)) (N (Plot p b))) #

scatterPosition :: LensLike' f (Plot p b) (a -> Point (V (Plot p b)) (N (Plot p b))) #

d ~ d' => HasScatterOptions f (ScatterOptions v n d) d' 
Instance details

Defined in Plots.Types.Scatter

Methods

gscatterOptions :: LensLike' f (ScatterOptions v n d) (ScatterOptions (V (ScatterOptions v n d)) (N (ScatterOptions v n d)) d') #

scatterTransform :: LensLike' f (ScatterOptions v n d) (d' -> Transformation (V (ScatterOptions v n d)) (N (ScatterOptions v n d))) #

scatterStyle :: LensLike' f (ScatterOptions v n d) (d' -> Style (V (ScatterOptions v n d)) (N (ScatterOptions v n d))) #

scatterPosition :: LensLike' f (ScatterOptions v n d) (d' -> Point (V (ScatterOptions v n d)) (N (ScatterOptions v n d))) #

(Applicative f, Typeable b, Typeable v, Typeable n, Typeable a) => HasScatterOptions f (DynamicPlot b v n) a 
Instance details

Defined in Plots.Types.Scatter

Methods

gscatterOptions :: LensLike' f (DynamicPlot b v n) (ScatterOptions (V (DynamicPlot b v n)) (N (DynamicPlot b v n)) a) #

scatterTransform :: LensLike' f (DynamicPlot b v n) (a -> Transformation (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

scatterStyle :: LensLike' f (DynamicPlot b v n) (a -> Style (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

scatterPosition :: LensLike' f (DynamicPlot b v n) (a -> Point (V (DynamicPlot b v n)) (N (DynamicPlot b v n))) #

(Applicative f, Typeable b, Typeable (BaseSpace c), Typeable n, Typeable a) => HasScatterOptions f (Axis b c n) a 
Instance details

Defined in Plots.Types.Scatter

Methods

gscatterOptions :: LensLike' f (Axis b c n) (ScatterOptions (V (Axis b c n)) (N (Axis b c n)) a) #

scatterTransform :: LensLike' f (Axis b c n) (a -> Transformation (V (Axis b c n)) (N (Axis b c n))) #

scatterStyle :: LensLike' f (Axis b c n) (a -> Style (V (Axis b c n)) (N (Axis b c n))) #

scatterPosition :: LensLike' f (Axis b c n) (a -> Point (V (Axis b c n)) (N (Axis b c n))) #

data ScatterOptions (v :: Type -> Type) n a #

Instances
HasConnectingLine f (ScatterOptions v n a) 
Instance details

Defined in Plots.Types.Scatter

d ~ d' => HasScatterOptions f (ScatterOptions v n d) d' 
Instance details

Defined in Plots.Types.Scatter

Methods

gscatterOptions :: LensLike' f (ScatterOptions v n d) (ScatterOptions (V (ScatterOptions v n d)) (N (ScatterOptions v n d)) d') #

scatterTransform :: LensLike' f (ScatterOptions v n d) (d' -> Transformation (V (ScatterOptions v n d)) (N (ScatterOptions v n d))) #

scatterStyle :: LensLike' f (ScatterOptions v n d) (d' -> Style (V (ScatterOptions v n d)) (N (ScatterOptions v n d))) #

scatterPosition :: LensLike' f (ScatterOptions v n d) (d' -> Point (V (ScatterOptions v n d)) (N (ScatterOptions v n d))) #

type N (ScatterOptions v n a) 
Instance details

Defined in Plots.Types.Scatter

type N (ScatterOptions v n a) = n
type V (ScatterOptions v n a) 
Instance details

Defined in Plots.Types.Scatter

type V (ScatterOptions v n a) = v

data ScatterPlot (v :: Type -> Type) n #

Instances
HasConnectingLine f (ScatterPlot v n) 
Instance details

Defined in Plots.Types.Scatter

(Applicative f, Typeable v, Typeable n, Typeable d) => HasScatterOptions f (ScatterPlot v n) d 
Instance details

Defined in Plots.Types.Scatter

Methods

gscatterOptions :: LensLike' f (ScatterPlot v n) (ScatterOptions (V (ScatterPlot v n)) (N (ScatterPlot v n)) d) #

scatterTransform :: LensLike' f (ScatterPlot v n) (d -> Transformation (V (ScatterPlot v n)) (N (ScatterPlot v n))) #

scatterStyle :: LensLike' f (ScatterPlot v n) (d -> Style (V (ScatterPlot v n)) (N (ScatterPlot v n))) #

scatterPosition :: LensLike' f (ScatterPlot v n) (d -> Point (V (ScatterPlot v n)) (N (ScatterPlot v n))) #

(Metric v, OrderedField n) => Enveloped (ScatterPlot v n) 
Instance details

Defined in Plots.Types.Scatter

Methods

getEnvelope :: ScatterPlot v n -> Envelope (V (ScatterPlot v n)) (N (ScatterPlot v n))

(TypeableFloat n, Renderable (Path V2 n) b) => Plotable (ScatterPlot V2 n) b 
Instance details

Defined in Plots.Types.Scatter

Methods

renderPlotable :: InSpace v n0 (ScatterPlot V2 n) => AxisSpec v n0 -> PlotStyle b v n0 -> ScatterPlot V2 n -> QDiagram b v n0 Any #

defLegendPic :: InSpace v n0 (ScatterPlot V2 n) => PlotStyle b v n0 -> ScatterPlot V2 n -> QDiagram b v n0 Any #

type N (ScatterPlot v n) 
Instance details

Defined in Plots.Types.Scatter

type N (ScatterPlot v n) = n
type V (ScatterPlot v n) 
Instance details

Defined in Plots.Types.Scatter

type V (ScatterPlot v n) = v