Safe Haskell | None |
---|---|
Language | Haskell2010 |
Adapted from Linear.V4
Documentation
Instances
Monad V4 Source # | |
Functor V4 Source # | |
Applicative V4 Source # | |
Foldable V4 Source # | |
Defined in Nonlinear.V4 fold :: Monoid m => V4 m -> m # foldMap :: Monoid m => (a -> m) -> V4 a -> m # foldMap' :: Monoid m => (a -> m) -> V4 a -> m # foldr :: (a -> b -> b) -> b -> V4 a -> b # foldr' :: (a -> b -> b) -> b -> V4 a -> b # foldl :: (b -> a -> b) -> b -> V4 a -> b # foldl' :: (b -> a -> b) -> b -> V4 a -> b # foldr1 :: (a -> a -> a) -> V4 a -> a # foldl1 :: (a -> a -> a) -> V4 a -> a # elem :: Eq a => a -> V4 a -> Bool # maximum :: Ord a => V4 a -> a # | |
Traversable V4 Source # | |
Eq1 V4 Source # | |
Ord1 V4 Source # | |
Defined in Nonlinear.V4 | |
Read1 V4 Source # | |
Show1 V4 Source # | |
Vec V4 Source # | |
R1 V4 Source # | |
Defined in Nonlinear.V4 | |
R2 V4 Source # | |
R3 V4 Source # | |
R4 V4 Source # | |
Bounded a => Bounded (V4 a) Source # | |
Eq a => Eq (V4 a) Source # | |
Floating a => Floating (V4 a) Source # | |
Fractional a => Fractional (V4 a) Source # | |
Data a => Data (V4 a) Source # | |
Defined in Nonlinear.V4 gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> V4 a -> c (V4 a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (V4 a) # dataTypeOf :: V4 a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (V4 a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (V4 a)) # gmapT :: (forall b. Data b => b -> b) -> V4 a -> V4 a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> V4 a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> V4 a -> r # gmapQ :: (forall d. Data d => d -> u) -> V4 a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> V4 a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> V4 a -> m (V4 a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> V4 a -> m (V4 a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> V4 a -> m (V4 a) # | |
Num a => Num (V4 a) Source # | |
Ord a => Ord (V4 a) Source # | |
Read a => Read (V4 a) Source # | |
Show a => Show (V4 a) Source # | |
Ix a => Ix (V4 a) Source # | |
Generic (V4 a) Source # | |
Semigroup x => Semigroup (V4 x) Source # | |
Monoid a => Monoid (V4 a) Source # | |
Storable a => Storable (V4 a) Source # | |
Generic1 V4 Source # | |
type Rep (V4 a) Source # | |
Defined in Nonlinear.V4 type Rep (V4 a) = D1 ('MetaData "V4" "Nonlinear.V4" "nonlinear-0.1.0-dd7wbAvLl3JZC37BHOks3" 'False) (C1 ('MetaCons "V4" 'PrefixI 'True) ((S1 ('MetaSel ('Just "v4x") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 a) :*: S1 ('MetaSel ('Just "v4y") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 a)) :*: (S1 ('MetaSel ('Just "v4z") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 a) :*: S1 ('MetaSel ('Just "v4w") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 a)))) | |
type Rep1 V4 Source # | |
Defined in Nonlinear.V4 type Rep1 V4 = D1 ('MetaData "V4" "Nonlinear.V4" "nonlinear-0.1.0-dd7wbAvLl3JZC37BHOks3" 'False) (C1 ('MetaCons "V4" 'PrefixI 'True) ((S1 ('MetaSel ('Just "v4x") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) Par1 :*: S1 ('MetaSel ('Just "v4y") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) Par1) :*: (S1 ('MetaSel ('Just "v4z") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) Par1 :*: S1 ('MetaSel ('Just "v4w") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) Par1))) |