Safe Haskell | Safe |
---|---|
Language | Haskell2010 |
Documentation
A left-strict pair; the base functor for streams of individual elements.
!a :> b infixr 5 |
Instances
Bifunctor Of Source # | |
Eq2 Of Source # | |
Ord2 Of Source # | |
Defined in Data.Functor.Of | |
Show2 Of Source # | |
Monoid a => Monad (Of a) Source # | |
Functor (Of a) Source # | |
Monoid a => Applicative (Of a) Source # | |
Foldable (Of a) Source # | |
Defined in Data.Functor.Of fold :: Monoid m => Of a m -> m # foldMap :: Monoid m => (a0 -> m) -> Of a a0 -> m # foldr :: (a0 -> b -> b) -> b -> Of a a0 -> b # foldr' :: (a0 -> b -> b) -> b -> Of a a0 -> b # foldl :: (b -> a0 -> b) -> b -> Of a a0 -> b # foldl' :: (b -> a0 -> b) -> b -> Of a a0 -> b # foldr1 :: (a0 -> a0 -> a0) -> Of a a0 -> a0 # foldl1 :: (a0 -> a0 -> a0) -> Of a a0 -> a0 # elem :: Eq a0 => a0 -> Of a a0 -> Bool # maximum :: Ord a0 => Of a a0 -> a0 # minimum :: Ord a0 => Of a a0 -> a0 # | |
Traversable (Of a) Source # | |
Eq a => Eq1 (Of a) Source # | |
Ord a => Ord1 (Of a) Source # | |
Defined in Data.Functor.Of | |
Show a => Show1 (Of a) Source # | |
Generic1 (Of a :: * -> *) Source # | |
(Eq a, Eq b) => Eq (Of a b) Source # | |
(Data a, Data b) => Data (Of a b) Source # | |
Defined in Data.Functor.Of gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Of a b -> c (Of a b) # gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Of a b) # toConstr :: Of a b -> Constr # dataTypeOf :: Of a b -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Of a b)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Of a b)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> Of a b -> Of a b # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Of a b -> r # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Of a b -> r # gmapQ :: (forall d. Data d => d -> u) -> Of a b -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Of a b -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Of a b -> m (Of a b) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Of a b -> m (Of a b) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Of a b -> m (Of a b) # | |
(Ord a, Ord b) => Ord (Of a b) Source # | |
(Read a, Read b) => Read (Of a b) Source # | |
(Show a, Show b) => Show (Of a b) Source # | |
Generic (Of a b) Source # | |
(Semigroup a, Semigroup b) => Semigroup (Of a b) Source # | |
(Monoid a, Monoid b) => Monoid (Of a b) Source # | |
type Rep1 (Of a :: * -> *) Source # | |
Defined in Data.Functor.Of type Rep1 (Of a :: * -> *) = D1 (MetaData "Of" "Data.Functor.Of" "streaming-0.2.2.0-KusZaaLX4INHa0lJM6sdvx" False) (C1 (MetaCons ":>" (InfixI RightAssociative 5) False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 a) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1)) | |
type Rep (Of a b) Source # | |
Defined in Data.Functor.Of type Rep (Of a b) = D1 (MetaData "Of" "Data.Functor.Of" "streaming-0.2.2.0-KusZaaLX4INHa0lJM6sdvx" False) (C1 (MetaCons ":>" (InfixI RightAssociative 5) False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 a) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 b))) |