Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
Instances
Monad Both Source # | |
Functor Both Source # | |
Applicative Both Source # | |
Foldable Both Source # | |
Defined in Data.Both fold :: Monoid m => Both m -> m # foldMap :: Monoid m => (a -> m) -> Both a -> m # foldMap' :: Monoid m => (a -> m) -> Both a -> m # foldr :: (a -> b -> b) -> b -> Both a -> b # foldr' :: (a -> b -> b) -> b -> Both a -> b # foldl :: (b -> a -> b) -> b -> Both a -> b # foldl' :: (b -> a -> b) -> b -> Both a -> b # foldr1 :: (a -> a -> a) -> Both a -> a # foldl1 :: (a -> a -> a) -> Both a -> a # elem :: Eq a => a -> Both a -> Bool # maximum :: Ord a => Both a -> a # | |
Traversable Both Source # | |
Alternative Both Source # | |
MonadPlus Both Source # | |
Eq a => Eq (Both a) Source # | |
Data a => Data (Both a) Source # | |
Defined in Data.Both gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Both a -> c (Both a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Both a) # toConstr :: Both a -> Constr # dataTypeOf :: Both a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Both a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Both a)) # gmapT :: (forall b. Data b => b -> b) -> Both a -> Both a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Both a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Both a -> r # gmapQ :: (forall d. Data d => d -> u) -> Both a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Both a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Both a -> m (Both a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Both a -> m (Both a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Both a -> m (Both a) # | |
Ord a => Ord (Both a) Source # | |
Read a => Read (Both a) Source # | |
Show a => Show (Both a) Source # | |
Generic (Both a) Source # | |
Semigroup a => Semigroup (Both a) Source # | The |
(Monoid a, Semigroup a) => Monoid (Both a) Source # | |
Semigroup a => Zero (Both a) Source # | |
Generic1 Both Source # | |
type Rep (Both a) Source # | |
type Rep1 Both Source # | |