strict-tuple-0.1.2: Strict tuples

Safe HaskellNone
LanguageHaskell2010

Data.Tuple.Strict

Description

Strict tuples.

Documentation

newtype T1 a Source #

Constructors

T1 a 
Instances
Bounded a => Bounded (T1 a) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T1 a #

maxBound :: T1 a #

Eq a => Eq (T1 a) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

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

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

Ord a => Ord (T1 a) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T1 a -> T1 a -> Ordering #

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

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

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

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

max :: T1 a -> T1 a -> T1 a #

min :: T1 a -> T1 a -> T1 a #

Read a => Read (T1 a) Source # 
Instance details

Defined in Data.Tuple.Strict

Show a => Show (T1 a) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

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

show :: T1 a -> String #

showList :: [T1 a] -> ShowS #

Generic (T1 a) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

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

Methods

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

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

Semigroup a => Semigroup (T1 a) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

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

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

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

Monoid a => Monoid (T1 a) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T1 a #

mappend :: T1 a -> T1 a -> T1 a #

mconcat :: [T1 a] -> T1 a #

NFData a => NFData (T1 a) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T1 a -> () #

Hashable a => Hashable (T1 a) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T1 a -> Int #

hash :: T1 a -> Int #

type Rep (T1 a) Source # 
Instance details

Defined in Data.Tuple.Strict

type Rep (T1 a) = D1 (MetaData "T1" "Data.Tuple.Strict" "strict-tuple-0.1.2-JAeTdTBPAA22ArrJi9nxMN" True) (C1 (MetaCons "T1" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))

data T2 a b Source #

Constructors

T2 a b 
Instances
Hashable2 T2 Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> T2 a b -> Int #

Hashable a => Hashable1 (T2 a) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T2 a a0 -> Int #

(Bounded a, Bounded b) => Bounded (T2 a b) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T2 a b #

maxBound :: T2 a b #

(Eq a, Eq b) => Eq (T2 a b) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T2 a b -> T2 a b -> Bool #

(/=) :: T2 a b -> T2 a b -> Bool #

(Ord a, Ord b) => Ord (T2 a b) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T2 a b -> T2 a b -> Ordering #

(<) :: T2 a b -> T2 a b -> Bool #

(<=) :: T2 a b -> T2 a b -> Bool #

(>) :: T2 a b -> T2 a b -> Bool #

(>=) :: T2 a b -> T2 a b -> Bool #

max :: T2 a b -> T2 a b -> T2 a b #

min :: T2 a b -> T2 a b -> T2 a b #

(Read a, Read b) => Read (T2 a b) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T2 a b) #

readList :: ReadS [T2 a b] #

readPrec :: ReadPrec (T2 a b) #

readListPrec :: ReadPrec [T2 a b] #

(Show a, Show b) => Show (T2 a b) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T2 a b -> ShowS #

show :: T2 a b -> String #

showList :: [T2 a b] -> ShowS #

Generic (T2 a b) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T2 a b) :: Type -> Type #

Methods

from :: T2 a b -> Rep (T2 a b) x #

to :: Rep (T2 a b) x -> T2 a b #

(Semigroup a, Semigroup b) => Semigroup (T2 a b) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T2 a b -> T2 a b -> T2 a b #

sconcat :: NonEmpty (T2 a b) -> T2 a b #

stimes :: Integral b0 => b0 -> T2 a b -> T2 a b #

(Monoid a, Monoid b) => Monoid (T2 a b) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T2 a b #

mappend :: T2 a b -> T2 a b -> T2 a b #

mconcat :: [T2 a b] -> T2 a b #

(NFData a, NFData b) => NFData (T2 a b) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T2 a b -> () #

(Hashable a, Hashable b) => Hashable (T2 a b) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T2 a b -> Int #

hash :: T2 a b -> Int #

type Rep (T2 a b) Source # 
Instance details

Defined in Data.Tuple.Strict

type Rep (T2 a b) = D1 (MetaData "T2" "Data.Tuple.Strict" "strict-tuple-0.1.2-JAeTdTBPAA22ArrJi9nxMN" False) (C1 (MetaCons "T2" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 a) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 b)))

data T3 a b c Source #

Constructors

T3 a b c 
Instances
Hashable a => Hashable2 (T3 a) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b -> Int) -> Int -> T3 a a0 b -> Int #

(Hashable a, Hashable b) => Hashable1 (T3 a b) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T3 a b a0 -> Int #

(Bounded a, Bounded b, Bounded c) => Bounded (T3 a b c) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T3 a b c #

maxBound :: T3 a b c #

(Eq a, Eq b, Eq c) => Eq (T3 a b c) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T3 a b c -> T3 a b c -> Bool #

(/=) :: T3 a b c -> T3 a b c -> Bool #

(Ord a, Ord b, Ord c) => Ord (T3 a b c) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T3 a b c -> T3 a b c -> Ordering #

(<) :: T3 a b c -> T3 a b c -> Bool #

(<=) :: T3 a b c -> T3 a b c -> Bool #

(>) :: T3 a b c -> T3 a b c -> Bool #

(>=) :: T3 a b c -> T3 a b c -> Bool #

max :: T3 a b c -> T3 a b c -> T3 a b c #

min :: T3 a b c -> T3 a b c -> T3 a b c #

(Read a, Read b, Read c) => Read (T3 a b c) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T3 a b c) #

readList :: ReadS [T3 a b c] #

readPrec :: ReadPrec (T3 a b c) #

readListPrec :: ReadPrec [T3 a b c] #

(Show a, Show b, Show c) => Show (T3 a b c) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T3 a b c -> ShowS #

show :: T3 a b c -> String #

showList :: [T3 a b c] -> ShowS #

Generic (T3 a b c) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T3 a b c) :: Type -> Type #

Methods

from :: T3 a b c -> Rep (T3 a b c) x #

to :: Rep (T3 a b c) x -> T3 a b c #

(Semigroup a, Semigroup b, Semigroup c) => Semigroup (T3 a b c) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T3 a b c -> T3 a b c -> T3 a b c #

sconcat :: NonEmpty (T3 a b c) -> T3 a b c #

stimes :: Integral b0 => b0 -> T3 a b c -> T3 a b c #

(Monoid a, Monoid b, Monoid c) => Monoid (T3 a b c) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T3 a b c #

mappend :: T3 a b c -> T3 a b c -> T3 a b c #

mconcat :: [T3 a b c] -> T3 a b c #

(NFData a, NFData b, NFData c) => NFData (T3 a b c) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T3 a b c -> () #

(Hashable a, Hashable b, Hashable c) => Hashable (T3 a b c) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T3 a b c -> Int #

hash :: T3 a b c -> Int #

type Rep (T3 a b c) Source # 
Instance details

Defined in Data.Tuple.Strict

data T4 a b c d Source #

Constructors

T4 a b c d 
Instances
(Hashable a, Hashable b) => Hashable2 (T4 a b) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b0 -> Int) -> Int -> T4 a b a0 b0 -> Int #

(Hashable a, Hashable b, Hashable c) => Hashable1 (T4 a b c) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T4 a b c a0 -> Int #

(Bounded a, Bounded b, Bounded c, Bounded d) => Bounded (T4 a b c d) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T4 a b c d #

maxBound :: T4 a b c d #

(Eq a, Eq b, Eq c, Eq d) => Eq (T4 a b c d) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T4 a b c d -> T4 a b c d -> Bool #

(/=) :: T4 a b c d -> T4 a b c d -> Bool #

(Ord a, Ord b, Ord c, Ord d) => Ord (T4 a b c d) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T4 a b c d -> T4 a b c d -> Ordering #

(<) :: T4 a b c d -> T4 a b c d -> Bool #

(<=) :: T4 a b c d -> T4 a b c d -> Bool #

(>) :: T4 a b c d -> T4 a b c d -> Bool #

(>=) :: T4 a b c d -> T4 a b c d -> Bool #

max :: T4 a b c d -> T4 a b c d -> T4 a b c d #

min :: T4 a b c d -> T4 a b c d -> T4 a b c d #

(Read a, Read b, Read c, Read d) => Read (T4 a b c d) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T4 a b c d) #

readList :: ReadS [T4 a b c d] #

readPrec :: ReadPrec (T4 a b c d) #

readListPrec :: ReadPrec [T4 a b c d] #

(Show a, Show b, Show c, Show d) => Show (T4 a b c d) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T4 a b c d -> ShowS #

show :: T4 a b c d -> String #

showList :: [T4 a b c d] -> ShowS #

Generic (T4 a b c d) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T4 a b c d) :: Type -> Type #

Methods

from :: T4 a b c d -> Rep (T4 a b c d) x #

to :: Rep (T4 a b c d) x -> T4 a b c d #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d) => Semigroup (T4 a b c d) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T4 a b c d -> T4 a b c d -> T4 a b c d #

sconcat :: NonEmpty (T4 a b c d) -> T4 a b c d #

stimes :: Integral b0 => b0 -> T4 a b c d -> T4 a b c d #

(Monoid a, Monoid b, Monoid c, Monoid d) => Monoid (T4 a b c d) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T4 a b c d #

mappend :: T4 a b c d -> T4 a b c d -> T4 a b c d #

mconcat :: [T4 a b c d] -> T4 a b c d #

(NFData a, NFData b, NFData c, NFData d) => NFData (T4 a b c d) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T4 a b c d -> () #

(Hashable a, Hashable b, Hashable c, Hashable d) => Hashable (T4 a b c d) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T4 a b c d -> Int #

hash :: T4 a b c d -> Int #

type Rep (T4 a b c d) Source # 
Instance details

Defined in Data.Tuple.Strict

data T5 a b c d e Source #

Constructors

T5 a b c d e 
Instances
(Hashable a, Hashable b, Hashable c) => Hashable2 (T5 a b c) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b0 -> Int) -> Int -> T5 a b c a0 b0 -> Int #

(Hashable a, Hashable b, Hashable c, Hashable d) => Hashable1 (T5 a b c d) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T5 a b c d a0 -> Int #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e) => Bounded (T5 a b c d e) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T5 a b c d e #

maxBound :: T5 a b c d e #

(Eq a, Eq b, Eq c, Eq d, Eq e) => Eq (T5 a b c d e) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T5 a b c d e -> T5 a b c d e -> Bool #

(/=) :: T5 a b c d e -> T5 a b c d e -> Bool #

(Ord a, Ord b, Ord c, Ord d, Ord e) => Ord (T5 a b c d e) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T5 a b c d e -> T5 a b c d e -> Ordering #

(<) :: T5 a b c d e -> T5 a b c d e -> Bool #

(<=) :: T5 a b c d e -> T5 a b c d e -> Bool #

(>) :: T5 a b c d e -> T5 a b c d e -> Bool #

(>=) :: T5 a b c d e -> T5 a b c d e -> Bool #

max :: T5 a b c d e -> T5 a b c d e -> T5 a b c d e #

min :: T5 a b c d e -> T5 a b c d e -> T5 a b c d e #

(Read a, Read b, Read c, Read d, Read e) => Read (T5 a b c d e) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T5 a b c d e) #

readList :: ReadS [T5 a b c d e] #

readPrec :: ReadPrec (T5 a b c d e) #

readListPrec :: ReadPrec [T5 a b c d e] #

(Show a, Show b, Show c, Show d, Show e) => Show (T5 a b c d e) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T5 a b c d e -> ShowS #

show :: T5 a b c d e -> String #

showList :: [T5 a b c d e] -> ShowS #

Generic (T5 a b c d e) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T5 a b c d e) :: Type -> Type #

Methods

from :: T5 a b c d e -> Rep (T5 a b c d e) x #

to :: Rep (T5 a b c d e) x -> T5 a b c d e #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e) => Semigroup (T5 a b c d e) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T5 a b c d e -> T5 a b c d e -> T5 a b c d e #

sconcat :: NonEmpty (T5 a b c d e) -> T5 a b c d e #

stimes :: Integral b0 => b0 -> T5 a b c d e -> T5 a b c d e #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e) => Monoid (T5 a b c d e) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T5 a b c d e #

mappend :: T5 a b c d e -> T5 a b c d e -> T5 a b c d e #

mconcat :: [T5 a b c d e] -> T5 a b c d e #

(NFData a, NFData b, NFData c, NFData d, NFData e) => NFData (T5 a b c d e) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T5 a b c d e -> () #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e) => Hashable (T5 a b c d e) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T5 a b c d e -> Int #

hash :: T5 a b c d e -> Int #

type Rep (T5 a b c d e) Source # 
Instance details

Defined in Data.Tuple.Strict

data T6 a b c d e f Source #

Constructors

T6 a b c d e f 
Instances
(Hashable a, Hashable b, Hashable c, Hashable d) => Hashable2 (T6 a b c d) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b0 -> Int) -> Int -> T6 a b c d a0 b0 -> Int #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e) => Hashable1 (T6 a b c d e) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T6 a b c d e a0 -> Int #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f) => Bounded (T6 a b c d e f) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T6 a b c d e f #

maxBound :: T6 a b c d e f #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f) => Eq (T6 a b c d e f) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T6 a b c d e f -> T6 a b c d e f -> Bool #

(/=) :: T6 a b c d e f -> T6 a b c d e f -> Bool #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f) => Ord (T6 a b c d e f) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T6 a b c d e f -> T6 a b c d e f -> Ordering #

(<) :: T6 a b c d e f -> T6 a b c d e f -> Bool #

(<=) :: T6 a b c d e f -> T6 a b c d e f -> Bool #

(>) :: T6 a b c d e f -> T6 a b c d e f -> Bool #

(>=) :: T6 a b c d e f -> T6 a b c d e f -> Bool #

max :: T6 a b c d e f -> T6 a b c d e f -> T6 a b c d e f #

min :: T6 a b c d e f -> T6 a b c d e f -> T6 a b c d e f #

(Read a, Read b, Read c, Read d, Read e, Read f) => Read (T6 a b c d e f) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T6 a b c d e f) #

readList :: ReadS [T6 a b c d e f] #

readPrec :: ReadPrec (T6 a b c d e f) #

readListPrec :: ReadPrec [T6 a b c d e f] #

(Show a, Show b, Show c, Show d, Show e, Show f) => Show (T6 a b c d e f) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T6 a b c d e f -> ShowS #

show :: T6 a b c d e f -> String #

showList :: [T6 a b c d e f] -> ShowS #

Generic (T6 a b c d e f) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T6 a b c d e f) :: Type -> Type #

Methods

from :: T6 a b c d e f -> Rep (T6 a b c d e f) x #

to :: Rep (T6 a b c d e f) x -> T6 a b c d e f #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e, Semigroup f) => Semigroup (T6 a b c d e f) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T6 a b c d e f -> T6 a b c d e f -> T6 a b c d e f #

sconcat :: NonEmpty (T6 a b c d e f) -> T6 a b c d e f #

stimes :: Integral b0 => b0 -> T6 a b c d e f -> T6 a b c d e f #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e, Monoid f) => Monoid (T6 a b c d e f) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T6 a b c d e f #

mappend :: T6 a b c d e f -> T6 a b c d e f -> T6 a b c d e f #

mconcat :: [T6 a b c d e f] -> T6 a b c d e f #

(NFData a, NFData b, NFData c, NFData d, NFData e, NFData f) => NFData (T6 a b c d e f) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T6 a b c d e f -> () #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f) => Hashable (T6 a b c d e f) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T6 a b c d e f -> Int #

hash :: T6 a b c d e f -> Int #

type Rep (T6 a b c d e f) Source # 
Instance details

Defined in Data.Tuple.Strict

data T7 a b c d e f g Source #

Constructors

T7 a b c d e f g 
Instances
(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e) => Hashable2 (T7 a b c d e) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b0 -> Int) -> Int -> T7 a b c d e a0 b0 -> Int #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f) => Hashable1 (T7 a b c d e f) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T7 a b c d e f a0 -> Int #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g) => Bounded (T7 a b c d e f g) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T7 a b c d e f g #

maxBound :: T7 a b c d e f g #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g) => Eq (T7 a b c d e f g) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T7 a b c d e f g -> T7 a b c d e f g -> Bool #

(/=) :: T7 a b c d e f g -> T7 a b c d e f g -> Bool #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g) => Ord (T7 a b c d e f g) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T7 a b c d e f g -> T7 a b c d e f g -> Ordering #

(<) :: T7 a b c d e f g -> T7 a b c d e f g -> Bool #

(<=) :: T7 a b c d e f g -> T7 a b c d e f g -> Bool #

(>) :: T7 a b c d e f g -> T7 a b c d e f g -> Bool #

(>=) :: T7 a b c d e f g -> T7 a b c d e f g -> Bool #

max :: T7 a b c d e f g -> T7 a b c d e f g -> T7 a b c d e f g #

min :: T7 a b c d e f g -> T7 a b c d e f g -> T7 a b c d e f g #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g) => Read (T7 a b c d e f g) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T7 a b c d e f g) #

readList :: ReadS [T7 a b c d e f g] #

readPrec :: ReadPrec (T7 a b c d e f g) #

readListPrec :: ReadPrec [T7 a b c d e f g] #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g) => Show (T7 a b c d e f g) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T7 a b c d e f g -> ShowS #

show :: T7 a b c d e f g -> String #

showList :: [T7 a b c d e f g] -> ShowS #

Generic (T7 a b c d e f g) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T7 a b c d e f g) :: Type -> Type #

Methods

from :: T7 a b c d e f g -> Rep (T7 a b c d e f g) x #

to :: Rep (T7 a b c d e f g) x -> T7 a b c d e f g #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e, Semigroup f, Semigroup g) => Semigroup (T7 a b c d e f g) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T7 a b c d e f g -> T7 a b c d e f g -> T7 a b c d e f g #

sconcat :: NonEmpty (T7 a b c d e f g) -> T7 a b c d e f g #

stimes :: Integral b0 => b0 -> T7 a b c d e f g -> T7 a b c d e f g #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e, Monoid f, Monoid g) => Monoid (T7 a b c d e f g) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T7 a b c d e f g #

mappend :: T7 a b c d e f g -> T7 a b c d e f g -> T7 a b c d e f g #

mconcat :: [T7 a b c d e f g] -> T7 a b c d e f g #

(NFData a, NFData b, NFData c, NFData d, NFData e, NFData f, NFData g) => NFData (T7 a b c d e f g) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T7 a b c d e f g -> () #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g) => Hashable (T7 a b c d e f g) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T7 a b c d e f g -> Int #

hash :: T7 a b c d e f g -> Int #

type Rep (T7 a b c d e f g) Source # 
Instance details

Defined in Data.Tuple.Strict

data T8 a b c d e f g h Source #

Constructors

T8 a b c d e f g h 
Instances
(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f) => Hashable2 (T8 a b c d e f) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b0 -> Int) -> Int -> T8 a b c d e f a0 b0 -> Int #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g) => Hashable1 (T8 a b c d e f g) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T8 a b c d e f g a0 -> Int #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h) => Bounded (T8 a b c d e f g h) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T8 a b c d e f g h #

maxBound :: T8 a b c d e f g h #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h) => Eq (T8 a b c d e f g h) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T8 a b c d e f g h -> T8 a b c d e f g h -> Bool #

(/=) :: T8 a b c d e f g h -> T8 a b c d e f g h -> Bool #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h) => Ord (T8 a b c d e f g h) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T8 a b c d e f g h -> T8 a b c d e f g h -> Ordering #

(<) :: T8 a b c d e f g h -> T8 a b c d e f g h -> Bool #

(<=) :: T8 a b c d e f g h -> T8 a b c d e f g h -> Bool #

(>) :: T8 a b c d e f g h -> T8 a b c d e f g h -> Bool #

(>=) :: T8 a b c d e f g h -> T8 a b c d e f g h -> Bool #

max :: T8 a b c d e f g h -> T8 a b c d e f g h -> T8 a b c d e f g h #

min :: T8 a b c d e f g h -> T8 a b c d e f g h -> T8 a b c d e f g h #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h) => Read (T8 a b c d e f g h) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T8 a b c d e f g h) #

readList :: ReadS [T8 a b c d e f g h] #

readPrec :: ReadPrec (T8 a b c d e f g h) #

readListPrec :: ReadPrec [T8 a b c d e f g h] #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h) => Show (T8 a b c d e f g h) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T8 a b c d e f g h -> ShowS #

show :: T8 a b c d e f g h -> String #

showList :: [T8 a b c d e f g h] -> ShowS #

Generic (T8 a b c d e f g h) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T8 a b c d e f g h) :: Type -> Type #

Methods

from :: T8 a b c d e f g h -> Rep (T8 a b c d e f g h) x #

to :: Rep (T8 a b c d e f g h) x -> T8 a b c d e f g h #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e, Semigroup f, Semigroup g, Semigroup h) => Semigroup (T8 a b c d e f g h) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T8 a b c d e f g h -> T8 a b c d e f g h -> T8 a b c d e f g h #

sconcat :: NonEmpty (T8 a b c d e f g h) -> T8 a b c d e f g h #

stimes :: Integral b0 => b0 -> T8 a b c d e f g h -> T8 a b c d e f g h #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e, Monoid f, Monoid g, Monoid h) => Monoid (T8 a b c d e f g h) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T8 a b c d e f g h #

mappend :: T8 a b c d e f g h -> T8 a b c d e f g h -> T8 a b c d e f g h #

mconcat :: [T8 a b c d e f g h] -> T8 a b c d e f g h #

(NFData a, NFData b, NFData c, NFData d, NFData e, NFData f, NFData g, NFData h) => NFData (T8 a b c d e f g h) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T8 a b c d e f g h -> () #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h) => Hashable (T8 a b c d e f g h) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T8 a b c d e f g h -> Int #

hash :: T8 a b c d e f g h -> Int #

type Rep (T8 a b c d e f g h) Source # 
Instance details

Defined in Data.Tuple.Strict

data T9 a b c d e f g h i Source #

Constructors

T9 a b c d e f g h i 
Instances
(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g) => Hashable2 (T9 a b c d e f g) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b0 -> Int) -> Int -> T9 a b c d e f g a0 b0 -> Int #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h) => Hashable1 (T9 a b c d e f g h) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T9 a b c d e f g h a0 -> Int #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i) => Bounded (T9 a b c d e f g h i) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T9 a b c d e f g h i #

maxBound :: T9 a b c d e f g h i #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i) => Eq (T9 a b c d e f g h i) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T9 a b c d e f g h i -> T9 a b c d e f g h i -> Bool #

(/=) :: T9 a b c d e f g h i -> T9 a b c d e f g h i -> Bool #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i) => Ord (T9 a b c d e f g h i) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T9 a b c d e f g h i -> T9 a b c d e f g h i -> Ordering #

(<) :: T9 a b c d e f g h i -> T9 a b c d e f g h i -> Bool #

(<=) :: T9 a b c d e f g h i -> T9 a b c d e f g h i -> Bool #

(>) :: T9 a b c d e f g h i -> T9 a b c d e f g h i -> Bool #

(>=) :: T9 a b c d e f g h i -> T9 a b c d e f g h i -> Bool #

max :: T9 a b c d e f g h i -> T9 a b c d e f g h i -> T9 a b c d e f g h i #

min :: T9 a b c d e f g h i -> T9 a b c d e f g h i -> T9 a b c d e f g h i #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i) => Read (T9 a b c d e f g h i) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T9 a b c d e f g h i) #

readList :: ReadS [T9 a b c d e f g h i] #

readPrec :: ReadPrec (T9 a b c d e f g h i) #

readListPrec :: ReadPrec [T9 a b c d e f g h i] #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i) => Show (T9 a b c d e f g h i) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T9 a b c d e f g h i -> ShowS #

show :: T9 a b c d e f g h i -> String #

showList :: [T9 a b c d e f g h i] -> ShowS #

Generic (T9 a b c d e f g h i) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T9 a b c d e f g h i) :: Type -> Type #

Methods

from :: T9 a b c d e f g h i -> Rep (T9 a b c d e f g h i) x #

to :: Rep (T9 a b c d e f g h i) x -> T9 a b c d e f g h i #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e, Semigroup f, Semigroup g, Semigroup h, Semigroup i) => Semigroup (T9 a b c d e f g h i) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T9 a b c d e f g h i -> T9 a b c d e f g h i -> T9 a b c d e f g h i #

sconcat :: NonEmpty (T9 a b c d e f g h i) -> T9 a b c d e f g h i #

stimes :: Integral b0 => b0 -> T9 a b c d e f g h i -> T9 a b c d e f g h i #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e, Monoid f, Monoid g, Monoid h, Monoid i) => Monoid (T9 a b c d e f g h i) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T9 a b c d e f g h i #

mappend :: T9 a b c d e f g h i -> T9 a b c d e f g h i -> T9 a b c d e f g h i #

mconcat :: [T9 a b c d e f g h i] -> T9 a b c d e f g h i #

(NFData a, NFData b, NFData c, NFData d, NFData e, NFData f, NFData g, NFData h, NFData i) => NFData (T9 a b c d e f g h i) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T9 a b c d e f g h i -> () #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i) => Hashable (T9 a b c d e f g h i) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T9 a b c d e f g h i -> Int #

hash :: T9 a b c d e f g h i -> Int #

type Rep (T9 a b c d e f g h i) Source # 
Instance details

Defined in Data.Tuple.Strict

data T10 a b c d e f g h i j Source #

Constructors

T10 a b c d e f g h i j 
Instances
(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h) => Hashable2 (T10 a b c d e f g h) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b0 -> Int) -> Int -> T10 a b c d e f g h a0 b0 -> Int #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i) => Hashable1 (T10 a b c d e f g h i) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T10 a b c d e f g h i a0 -> Int #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j) => Bounded (T10 a b c d e f g h i j) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T10 a b c d e f g h i j #

maxBound :: T10 a b c d e f g h i j #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j) => Eq (T10 a b c d e f g h i j) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T10 a b c d e f g h i j -> T10 a b c d e f g h i j -> Bool #

(/=) :: T10 a b c d e f g h i j -> T10 a b c d e f g h i j -> Bool #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j) => Ord (T10 a b c d e f g h i j) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T10 a b c d e f g h i j -> T10 a b c d e f g h i j -> Ordering #

(<) :: T10 a b c d e f g h i j -> T10 a b c d e f g h i j -> Bool #

(<=) :: T10 a b c d e f g h i j -> T10 a b c d e f g h i j -> Bool #

(>) :: T10 a b c d e f g h i j -> T10 a b c d e f g h i j -> Bool #

(>=) :: T10 a b c d e f g h i j -> T10 a b c d e f g h i j -> Bool #

max :: T10 a b c d e f g h i j -> T10 a b c d e f g h i j -> T10 a b c d e f g h i j #

min :: T10 a b c d e f g h i j -> T10 a b c d e f g h i j -> T10 a b c d e f g h i j #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j) => Read (T10 a b c d e f g h i j) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T10 a b c d e f g h i j) #

readList :: ReadS [T10 a b c d e f g h i j] #

readPrec :: ReadPrec (T10 a b c d e f g h i j) #

readListPrec :: ReadPrec [T10 a b c d e f g h i j] #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j) => Show (T10 a b c d e f g h i j) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T10 a b c d e f g h i j -> ShowS #

show :: T10 a b c d e f g h i j -> String #

showList :: [T10 a b c d e f g h i j] -> ShowS #

Generic (T10 a b c d e f g h i j) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T10 a b c d e f g h i j) :: Type -> Type #

Methods

from :: T10 a b c d e f g h i j -> Rep (T10 a b c d e f g h i j) x #

to :: Rep (T10 a b c d e f g h i j) x -> T10 a b c d e f g h i j #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e, Semigroup f, Semigroup g, Semigroup h, Semigroup i, Semigroup j) => Semigroup (T10 a b c d e f g h i j) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T10 a b c d e f g h i j -> T10 a b c d e f g h i j -> T10 a b c d e f g h i j #

sconcat :: NonEmpty (T10 a b c d e f g h i j) -> T10 a b c d e f g h i j #

stimes :: Integral b0 => b0 -> T10 a b c d e f g h i j -> T10 a b c d e f g h i j #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e, Monoid f, Monoid g, Monoid h, Monoid i, Monoid j) => Monoid (T10 a b c d e f g h i j) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T10 a b c d e f g h i j #

mappend :: T10 a b c d e f g h i j -> T10 a b c d e f g h i j -> T10 a b c d e f g h i j #

mconcat :: [T10 a b c d e f g h i j] -> T10 a b c d e f g h i j #

(NFData a, NFData b, NFData c, NFData d, NFData e, NFData f, NFData g, NFData h, NFData i, NFData j) => NFData (T10 a b c d e f g h i j) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T10 a b c d e f g h i j -> () #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j) => Hashable (T10 a b c d e f g h i j) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T10 a b c d e f g h i j -> Int #

hash :: T10 a b c d e f g h i j -> Int #

type Rep (T10 a b c d e f g h i j) Source # 
Instance details

Defined in Data.Tuple.Strict

data T11 a b c d e f g h i j k Source #

Constructors

T11 a b c d e f g h i j k 
Instances
(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i) => Hashable2 (T11 a b c d e f g h i) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b0 -> Int) -> Int -> T11 a b c d e f g h i a0 b0 -> Int #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j) => Hashable1 (T11 a b c d e f g h i j) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T11 a b c d e f g h i j a0 -> Int #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k) => Bounded (T11 a b c d e f g h i j k) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T11 a b c d e f g h i j k #

maxBound :: T11 a b c d e f g h i j k #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k) => Eq (T11 a b c d e f g h i j k) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T11 a b c d e f g h i j k -> T11 a b c d e f g h i j k -> Bool #

(/=) :: T11 a b c d e f g h i j k -> T11 a b c d e f g h i j k -> Bool #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k) => Ord (T11 a b c d e f g h i j k) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T11 a b c d e f g h i j k -> T11 a b c d e f g h i j k -> Ordering #

(<) :: T11 a b c d e f g h i j k -> T11 a b c d e f g h i j k -> Bool #

(<=) :: T11 a b c d e f g h i j k -> T11 a b c d e f g h i j k -> Bool #

(>) :: T11 a b c d e f g h i j k -> T11 a b c d e f g h i j k -> Bool #

(>=) :: T11 a b c d e f g h i j k -> T11 a b c d e f g h i j k -> Bool #

max :: T11 a b c d e f g h i j k -> T11 a b c d e f g h i j k -> T11 a b c d e f g h i j k #

min :: T11 a b c d e f g h i j k -> T11 a b c d e f g h i j k -> T11 a b c d e f g h i j k #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k) => Read (T11 a b c d e f g h i j k) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T11 a b c d e f g h i j k) #

readList :: ReadS [T11 a b c d e f g h i j k] #

readPrec :: ReadPrec (T11 a b c d e f g h i j k) #

readListPrec :: ReadPrec [T11 a b c d e f g h i j k] #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k) => Show (T11 a b c d e f g h i j k) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T11 a b c d e f g h i j k -> ShowS #

show :: T11 a b c d e f g h i j k -> String #

showList :: [T11 a b c d e f g h i j k] -> ShowS #

Generic (T11 a b c d e f g h i j k) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T11 a b c d e f g h i j k) :: Type -> Type #

Methods

from :: T11 a b c d e f g h i j k -> Rep (T11 a b c d e f g h i j k) x #

to :: Rep (T11 a b c d e f g h i j k) x -> T11 a b c d e f g h i j k #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e, Semigroup f, Semigroup g, Semigroup h, Semigroup i, Semigroup j, Semigroup k) => Semigroup (T11 a b c d e f g h i j k) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T11 a b c d e f g h i j k -> T11 a b c d e f g h i j k -> T11 a b c d e f g h i j k #

sconcat :: NonEmpty (T11 a b c d e f g h i j k) -> T11 a b c d e f g h i j k #

stimes :: Integral b0 => b0 -> T11 a b c d e f g h i j k -> T11 a b c d e f g h i j k #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e, Monoid f, Monoid g, Monoid h, Monoid i, Monoid j, Monoid k) => Monoid (T11 a b c d e f g h i j k) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T11 a b c d e f g h i j k #

mappend :: T11 a b c d e f g h i j k -> T11 a b c d e f g h i j k -> T11 a b c d e f g h i j k #

mconcat :: [T11 a b c d e f g h i j k] -> T11 a b c d e f g h i j k #

(NFData a, NFData b, NFData c, NFData d, NFData e, NFData f, NFData g, NFData h, NFData i, NFData j, NFData k) => NFData (T11 a b c d e f g h i j k) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T11 a b c d e f g h i j k -> () #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k) => Hashable (T11 a b c d e f g h i j k) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T11 a b c d e f g h i j k -> Int #

hash :: T11 a b c d e f g h i j k -> Int #

type Rep (T11 a b c d e f g h i j k) Source # 
Instance details

Defined in Data.Tuple.Strict

data T12 a b c d e f g h i j k l Source #

Constructors

T12 a b c d e f g h i j k l 
Instances
(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j) => Hashable2 (T12 a b c d e f g h i j) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b0 -> Int) -> Int -> T12 a b c d e f g h i j a0 b0 -> Int #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k) => Hashable1 (T12 a b c d e f g h i j k) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T12 a b c d e f g h i j k a0 -> Int #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l) => Bounded (T12 a b c d e f g h i j k l) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T12 a b c d e f g h i j k l #

maxBound :: T12 a b c d e f g h i j k l #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l) => Eq (T12 a b c d e f g h i j k l) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T12 a b c d e f g h i j k l -> T12 a b c d e f g h i j k l -> Bool #

(/=) :: T12 a b c d e f g h i j k l -> T12 a b c d e f g h i j k l -> Bool #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l) => Ord (T12 a b c d e f g h i j k l) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T12 a b c d e f g h i j k l -> T12 a b c d e f g h i j k l -> Ordering #

(<) :: T12 a b c d e f g h i j k l -> T12 a b c d e f g h i j k l -> Bool #

(<=) :: T12 a b c d e f g h i j k l -> T12 a b c d e f g h i j k l -> Bool #

(>) :: T12 a b c d e f g h i j k l -> T12 a b c d e f g h i j k l -> Bool #

(>=) :: T12 a b c d e f g h i j k l -> T12 a b c d e f g h i j k l -> Bool #

max :: T12 a b c d e f g h i j k l -> T12 a b c d e f g h i j k l -> T12 a b c d e f g h i j k l #

min :: T12 a b c d e f g h i j k l -> T12 a b c d e f g h i j k l -> T12 a b c d e f g h i j k l #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l) => Read (T12 a b c d e f g h i j k l) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T12 a b c d e f g h i j k l) #

readList :: ReadS [T12 a b c d e f g h i j k l] #

readPrec :: ReadPrec (T12 a b c d e f g h i j k l) #

readListPrec :: ReadPrec [T12 a b c d e f g h i j k l] #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l) => Show (T12 a b c d e f g h i j k l) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T12 a b c d e f g h i j k l -> ShowS #

show :: T12 a b c d e f g h i j k l -> String #

showList :: [T12 a b c d e f g h i j k l] -> ShowS #

Generic (T12 a b c d e f g h i j k l) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T12 a b c d e f g h i j k l) :: Type -> Type #

Methods

from :: T12 a b c d e f g h i j k l -> Rep (T12 a b c d e f g h i j k l) x #

to :: Rep (T12 a b c d e f g h i j k l) x -> T12 a b c d e f g h i j k l #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e, Semigroup f, Semigroup g, Semigroup h, Semigroup i, Semigroup j, Semigroup k, Semigroup l) => Semigroup (T12 a b c d e f g h i j k l) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T12 a b c d e f g h i j k l -> T12 a b c d e f g h i j k l -> T12 a b c d e f g h i j k l #

sconcat :: NonEmpty (T12 a b c d e f g h i j k l) -> T12 a b c d e f g h i j k l #

stimes :: Integral b0 => b0 -> T12 a b c d e f g h i j k l -> T12 a b c d e f g h i j k l #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e, Monoid f, Monoid g, Monoid h, Monoid i, Monoid j, Monoid k, Monoid l) => Monoid (T12 a b c d e f g h i j k l) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T12 a b c d e f g h i j k l #

mappend :: T12 a b c d e f g h i j k l -> T12 a b c d e f g h i j k l -> T12 a b c d e f g h i j k l #

mconcat :: [T12 a b c d e f g h i j k l] -> T12 a b c d e f g h i j k l #

(NFData a, NFData b, NFData c, NFData d, NFData e, NFData f, NFData g, NFData h, NFData i, NFData j, NFData k, NFData l) => NFData (T12 a b c d e f g h i j k l) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T12 a b c d e f g h i j k l -> () #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l) => Hashable (T12 a b c d e f g h i j k l) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T12 a b c d e f g h i j k l -> Int #

hash :: T12 a b c d e f g h i j k l -> Int #

type Rep (T12 a b c d e f g h i j k l) Source # 
Instance details

Defined in Data.Tuple.Strict

data T13 a b c d e f g h i j k l m Source #

Constructors

T13 a b c d e f g h i j k l m 
Instances
(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k) => Hashable2 (T13 a b c d e f g h i j k) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b0 -> Int) -> Int -> T13 a b c d e f g h i j k a0 b0 -> Int #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l) => Hashable1 (T13 a b c d e f g h i j k l) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T13 a b c d e f g h i j k l a0 -> Int #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m) => Bounded (T13 a b c d e f g h i j k l m) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T13 a b c d e f g h i j k l m #

maxBound :: T13 a b c d e f g h i j k l m #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m) => Eq (T13 a b c d e f g h i j k l m) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T13 a b c d e f g h i j k l m -> T13 a b c d e f g h i j k l m -> Bool #

(/=) :: T13 a b c d e f g h i j k l m -> T13 a b c d e f g h i j k l m -> Bool #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m) => Ord (T13 a b c d e f g h i j k l m) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T13 a b c d e f g h i j k l m -> T13 a b c d e f g h i j k l m -> Ordering #

(<) :: T13 a b c d e f g h i j k l m -> T13 a b c d e f g h i j k l m -> Bool #

(<=) :: T13 a b c d e f g h i j k l m -> T13 a b c d e f g h i j k l m -> Bool #

(>) :: T13 a b c d e f g h i j k l m -> T13 a b c d e f g h i j k l m -> Bool #

(>=) :: T13 a b c d e f g h i j k l m -> T13 a b c d e f g h i j k l m -> Bool #

max :: T13 a b c d e f g h i j k l m -> T13 a b c d e f g h i j k l m -> T13 a b c d e f g h i j k l m #

min :: T13 a b c d e f g h i j k l m -> T13 a b c d e f g h i j k l m -> T13 a b c d e f g h i j k l m #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m) => Read (T13 a b c d e f g h i j k l m) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T13 a b c d e f g h i j k l m) #

readList :: ReadS [T13 a b c d e f g h i j k l m] #

readPrec :: ReadPrec (T13 a b c d e f g h i j k l m) #

readListPrec :: ReadPrec [T13 a b c d e f g h i j k l m] #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m) => Show (T13 a b c d e f g h i j k l m) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T13 a b c d e f g h i j k l m -> ShowS #

show :: T13 a b c d e f g h i j k l m -> String #

showList :: [T13 a b c d e f g h i j k l m] -> ShowS #

Generic (T13 a b c d e f g h i j k l m) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T13 a b c d e f g h i j k l m) :: Type -> Type #

Methods

from :: T13 a b c d e f g h i j k l m -> Rep (T13 a b c d e f g h i j k l m) x #

to :: Rep (T13 a b c d e f g h i j k l m) x -> T13 a b c d e f g h i j k l m #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e, Semigroup f, Semigroup g, Semigroup h, Semigroup i, Semigroup j, Semigroup k, Semigroup l, Semigroup m) => Semigroup (T13 a b c d e f g h i j k l m) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T13 a b c d e f g h i j k l m -> T13 a b c d e f g h i j k l m -> T13 a b c d e f g h i j k l m #

sconcat :: NonEmpty (T13 a b c d e f g h i j k l m) -> T13 a b c d e f g h i j k l m #

stimes :: Integral b0 => b0 -> T13 a b c d e f g h i j k l m -> T13 a b c d e f g h i j k l m #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e, Monoid f, Monoid g, Monoid h, Monoid i, Monoid j, Monoid k, Monoid l, Monoid m) => Monoid (T13 a b c d e f g h i j k l m) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T13 a b c d e f g h i j k l m #

mappend :: T13 a b c d e f g h i j k l m -> T13 a b c d e f g h i j k l m -> T13 a b c d e f g h i j k l m #

mconcat :: [T13 a b c d e f g h i j k l m] -> T13 a b c d e f g h i j k l m #

(NFData a, NFData b, NFData c, NFData d, NFData e, NFData f, NFData g, NFData h, NFData i, NFData j, NFData k, NFData l, NFData m) => NFData (T13 a b c d e f g h i j k l m) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T13 a b c d e f g h i j k l m -> () #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m) => Hashable (T13 a b c d e f g h i j k l m) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T13 a b c d e f g h i j k l m -> Int #

hash :: T13 a b c d e f g h i j k l m -> Int #

type Rep (T13 a b c d e f g h i j k l m) Source # 
Instance details

Defined in Data.Tuple.Strict

type Rep (T13 a b c d e f g h i j k l m) = D1 (MetaData "T13" "Data.Tuple.Strict" "strict-tuple-0.1.2-JAeTdTBPAA22ArrJi9nxMN" False) (C1 (MetaCons "T13" PrefixI False) (((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 a) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 b) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 c))) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 d) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 e) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 f)))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 g) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 h) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 i))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 j) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 k)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 l) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 m))))))

data T14 a b c d e f g h i j k l m n Source #

Constructors

T14 a b c d e f g h i j k l m n 
Instances
(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l) => Hashable2 (T14 a b c d e f g h i j k l) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b0 -> Int) -> Int -> T14 a b c d e f g h i j k l a0 b0 -> Int #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m) => Hashable1 (T14 a b c d e f g h i j k l m) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T14 a b c d e f g h i j k l m a0 -> Int #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m, Bounded n) => Bounded (T14 a b c d e f g h i j k l m n) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T14 a b c d e f g h i j k l m n #

maxBound :: T14 a b c d e f g h i j k l m n #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n) => Eq (T14 a b c d e f g h i j k l m n) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T14 a b c d e f g h i j k l m n -> T14 a b c d e f g h i j k l m n -> Bool #

(/=) :: T14 a b c d e f g h i j k l m n -> T14 a b c d e f g h i j k l m n -> Bool #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n) => Ord (T14 a b c d e f g h i j k l m n) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T14 a b c d e f g h i j k l m n -> T14 a b c d e f g h i j k l m n -> Ordering #

(<) :: T14 a b c d e f g h i j k l m n -> T14 a b c d e f g h i j k l m n -> Bool #

(<=) :: T14 a b c d e f g h i j k l m n -> T14 a b c d e f g h i j k l m n -> Bool #

(>) :: T14 a b c d e f g h i j k l m n -> T14 a b c d e f g h i j k l m n -> Bool #

(>=) :: T14 a b c d e f g h i j k l m n -> T14 a b c d e f g h i j k l m n -> Bool #

max :: T14 a b c d e f g h i j k l m n -> T14 a b c d e f g h i j k l m n -> T14 a b c d e f g h i j k l m n #

min :: T14 a b c d e f g h i j k l m n -> T14 a b c d e f g h i j k l m n -> T14 a b c d e f g h i j k l m n #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n) => Read (T14 a b c d e f g h i j k l m n) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T14 a b c d e f g h i j k l m n) #

readList :: ReadS [T14 a b c d e f g h i j k l m n] #

readPrec :: ReadPrec (T14 a b c d e f g h i j k l m n) #

readListPrec :: ReadPrec [T14 a b c d e f g h i j k l m n] #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n) => Show (T14 a b c d e f g h i j k l m n) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T14 a b c d e f g h i j k l m n -> ShowS #

show :: T14 a b c d e f g h i j k l m n -> String #

showList :: [T14 a b c d e f g h i j k l m n] -> ShowS #

Generic (T14 a b c d e f g h i j k l m n) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T14 a b c d e f g h i j k l m n) :: Type -> Type #

Methods

from :: T14 a b c d e f g h i j k l m n -> Rep (T14 a b c d e f g h i j k l m n) x #

to :: Rep (T14 a b c d e f g h i j k l m n) x -> T14 a b c d e f g h i j k l m n #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e, Semigroup f, Semigroup g, Semigroup h, Semigroup i, Semigroup j, Semigroup k, Semigroup l, Semigroup m, Semigroup n) => Semigroup (T14 a b c d e f g h i j k l m n) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T14 a b c d e f g h i j k l m n -> T14 a b c d e f g h i j k l m n -> T14 a b c d e f g h i j k l m n #

sconcat :: NonEmpty (T14 a b c d e f g h i j k l m n) -> T14 a b c d e f g h i j k l m n #

stimes :: Integral b0 => b0 -> T14 a b c d e f g h i j k l m n -> T14 a b c d e f g h i j k l m n #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e, Monoid f, Monoid g, Monoid h, Monoid i, Monoid j, Monoid k, Monoid l, Monoid m, Monoid n) => Monoid (T14 a b c d e f g h i j k l m n) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T14 a b c d e f g h i j k l m n #

mappend :: T14 a b c d e f g h i j k l m n -> T14 a b c d e f g h i j k l m n -> T14 a b c d e f g h i j k l m n #

mconcat :: [T14 a b c d e f g h i j k l m n] -> T14 a b c d e f g h i j k l m n #

(NFData a, NFData b, NFData c, NFData d, NFData e, NFData f, NFData g, NFData h, NFData i, NFData j, NFData k, NFData l, NFData m, NFData n) => NFData (T14 a b c d e f g h i j k l m n) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T14 a b c d e f g h i j k l m n -> () #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m, Hashable n) => Hashable (T14 a b c d e f g h i j k l m n) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T14 a b c d e f g h i j k l m n -> Int #

hash :: T14 a b c d e f g h i j k l m n -> Int #

type Rep (T14 a b c d e f g h i j k l m n) Source # 
Instance details

Defined in Data.Tuple.Strict

type Rep (T14 a b c d e f g h i j k l m n) = D1 (MetaData "T14" "Data.Tuple.Strict" "strict-tuple-0.1.2-JAeTdTBPAA22ArrJi9nxMN" False) (C1 (MetaCons "T14" PrefixI False) (((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 a) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 b) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 c))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 d) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 e)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 f) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 g)))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 h) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 i) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 j))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 k) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 l)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 m) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 n))))))

data T15 a b c d e f g h i j k l m n o Source #

Constructors

T15 a b c d e f g h i j k l m n o 
Instances
(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m) => Hashable2 (T15 a b c d e f g h i j k l m) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b0 -> Int) -> Int -> T15 a b c d e f g h i j k l m a0 b0 -> Int #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m, Hashable n) => Hashable1 (T15 a b c d e f g h i j k l m n) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T15 a b c d e f g h i j k l m n a0 -> Int #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m, Bounded n, Bounded o) => Bounded (T15 a b c d e f g h i j k l m n o) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T15 a b c d e f g h i j k l m n o #

maxBound :: T15 a b c d e f g h i j k l m n o #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n, Eq o) => Eq (T15 a b c d e f g h i j k l m n o) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T15 a b c d e f g h i j k l m n o -> T15 a b c d e f g h i j k l m n o -> Bool #

(/=) :: T15 a b c d e f g h i j k l m n o -> T15 a b c d e f g h i j k l m n o -> Bool #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n, Ord o) => Ord (T15 a b c d e f g h i j k l m n o) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T15 a b c d e f g h i j k l m n o -> T15 a b c d e f g h i j k l m n o -> Ordering #

(<) :: T15 a b c d e f g h i j k l m n o -> T15 a b c d e f g h i j k l m n o -> Bool #

(<=) :: T15 a b c d e f g h i j k l m n o -> T15 a b c d e f g h i j k l m n o -> Bool #

(>) :: T15 a b c d e f g h i j k l m n o -> T15 a b c d e f g h i j k l m n o -> Bool #

(>=) :: T15 a b c d e f g h i j k l m n o -> T15 a b c d e f g h i j k l m n o -> Bool #

max :: T15 a b c d e f g h i j k l m n o -> T15 a b c d e f g h i j k l m n o -> T15 a b c d e f g h i j k l m n o #

min :: T15 a b c d e f g h i j k l m n o -> T15 a b c d e f g h i j k l m n o -> T15 a b c d e f g h i j k l m n o #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n, Read o) => Read (T15 a b c d e f g h i j k l m n o) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T15 a b c d e f g h i j k l m n o) #

readList :: ReadS [T15 a b c d e f g h i j k l m n o] #

readPrec :: ReadPrec (T15 a b c d e f g h i j k l m n o) #

readListPrec :: ReadPrec [T15 a b c d e f g h i j k l m n o] #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n, Show o) => Show (T15 a b c d e f g h i j k l m n o) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T15 a b c d e f g h i j k l m n o -> ShowS #

show :: T15 a b c d e f g h i j k l m n o -> String #

showList :: [T15 a b c d e f g h i j k l m n o] -> ShowS #

Generic (T15 a b c d e f g h i j k l m n o) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T15 a b c d e f g h i j k l m n o) :: Type -> Type #

Methods

from :: T15 a b c d e f g h i j k l m n o -> Rep (T15 a b c d e f g h i j k l m n o) x #

to :: Rep (T15 a b c d e f g h i j k l m n o) x -> T15 a b c d e f g h i j k l m n o #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e, Semigroup f, Semigroup g, Semigroup h, Semigroup i, Semigroup j, Semigroup k, Semigroup l, Semigroup m, Semigroup n, Semigroup o) => Semigroup (T15 a b c d e f g h i j k l m n o) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T15 a b c d e f g h i j k l m n o -> T15 a b c d e f g h i j k l m n o -> T15 a b c d e f g h i j k l m n o #

sconcat :: NonEmpty (T15 a b c d e f g h i j k l m n o) -> T15 a b c d e f g h i j k l m n o #

stimes :: Integral b0 => b0 -> T15 a b c d e f g h i j k l m n o -> T15 a b c d e f g h i j k l m n o #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e, Monoid f, Monoid g, Monoid h, Monoid i, Monoid j, Monoid k, Monoid l, Monoid m, Monoid n, Monoid o) => Monoid (T15 a b c d e f g h i j k l m n o) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T15 a b c d e f g h i j k l m n o #

mappend :: T15 a b c d e f g h i j k l m n o -> T15 a b c d e f g h i j k l m n o -> T15 a b c d e f g h i j k l m n o #

mconcat :: [T15 a b c d e f g h i j k l m n o] -> T15 a b c d e f g h i j k l m n o #

(NFData a, NFData b, NFData c, NFData d, NFData e, NFData f, NFData g, NFData h, NFData i, NFData j, NFData k, NFData l, NFData m, NFData n, NFData o) => NFData (T15 a b c d e f g h i j k l m n o) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T15 a b c d e f g h i j k l m n o -> () #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m, Hashable n, Hashable o) => Hashable (T15 a b c d e f g h i j k l m n o) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T15 a b c d e f g h i j k l m n o -> Int #

hash :: T15 a b c d e f g h i j k l m n o -> Int #

type Rep (T15 a b c d e f g h i j k l m n o) Source # 
Instance details

Defined in Data.Tuple.Strict

type Rep (T15 a b c d e f g h i j k l m n o) = D1 (MetaData "T15" "Data.Tuple.Strict" "strict-tuple-0.1.2-JAeTdTBPAA22ArrJi9nxMN" False) (C1 (MetaCons "T15" PrefixI False) (((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 a) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 b) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 c))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 d) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 e)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 f) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 g)))) :*: (((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 h) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 i)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 j) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 k))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 l) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 m)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 n) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 o))))))

data T16 a b c d e f g h i j k l m n o p Source #

Constructors

T16 a b c d e f g h i j k l m n o p 
Instances
(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m, Hashable n) => Hashable2 (T16 a b c d e f g h i j k l m n) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b0 -> Int) -> Int -> T16 a b c d e f g h i j k l m n a0 b0 -> Int #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m, Hashable n, Hashable o) => Hashable1 (T16 a b c d e f g h i j k l m n o) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T16 a b c d e f g h i j k l m n o a0 -> Int #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m, Bounded n, Bounded o, Bounded p) => Bounded (T16 a b c d e f g h i j k l m n o p) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T16 a b c d e f g h i j k l m n o p #

maxBound :: T16 a b c d e f g h i j k l m n o p #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n, Eq o, Eq p) => Eq (T16 a b c d e f g h i j k l m n o p) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T16 a b c d e f g h i j k l m n o p -> T16 a b c d e f g h i j k l m n o p -> Bool #

(/=) :: T16 a b c d e f g h i j k l m n o p -> T16 a b c d e f g h i j k l m n o p -> Bool #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n, Ord o, Ord p) => Ord (T16 a b c d e f g h i j k l m n o p) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T16 a b c d e f g h i j k l m n o p -> T16 a b c d e f g h i j k l m n o p -> Ordering #

(<) :: T16 a b c d e f g h i j k l m n o p -> T16 a b c d e f g h i j k l m n o p -> Bool #

(<=) :: T16 a b c d e f g h i j k l m n o p -> T16 a b c d e f g h i j k l m n o p -> Bool #

(>) :: T16 a b c d e f g h i j k l m n o p -> T16 a b c d e f g h i j k l m n o p -> Bool #

(>=) :: T16 a b c d e f g h i j k l m n o p -> T16 a b c d e f g h i j k l m n o p -> Bool #

max :: T16 a b c d e f g h i j k l m n o p -> T16 a b c d e f g h i j k l m n o p -> T16 a b c d e f g h i j k l m n o p #

min :: T16 a b c d e f g h i j k l m n o p -> T16 a b c d e f g h i j k l m n o p -> T16 a b c d e f g h i j k l m n o p #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n, Read o, Read p) => Read (T16 a b c d e f g h i j k l m n o p) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T16 a b c d e f g h i j k l m n o p) #

readList :: ReadS [T16 a b c d e f g h i j k l m n o p] #

readPrec :: ReadPrec (T16 a b c d e f g h i j k l m n o p) #

readListPrec :: ReadPrec [T16 a b c d e f g h i j k l m n o p] #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n, Show o, Show p) => Show (T16 a b c d e f g h i j k l m n o p) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T16 a b c d e f g h i j k l m n o p -> ShowS #

show :: T16 a b c d e f g h i j k l m n o p -> String #

showList :: [T16 a b c d e f g h i j k l m n o p] -> ShowS #

Generic (T16 a b c d e f g h i j k l m n o p) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T16 a b c d e f g h i j k l m n o p) :: Type -> Type #

Methods

from :: T16 a b c d e f g h i j k l m n o p -> Rep (T16 a b c d e f g h i j k l m n o p) x #

to :: Rep (T16 a b c d e f g h i j k l m n o p) x -> T16 a b c d e f g h i j k l m n o p #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e, Semigroup f, Semigroup g, Semigroup h, Semigroup i, Semigroup j, Semigroup k, Semigroup l, Semigroup m, Semigroup n, Semigroup o, Semigroup p) => Semigroup (T16 a b c d e f g h i j k l m n o p) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T16 a b c d e f g h i j k l m n o p -> T16 a b c d e f g h i j k l m n o p -> T16 a b c d e f g h i j k l m n o p #

sconcat :: NonEmpty (T16 a b c d e f g h i j k l m n o p) -> T16 a b c d e f g h i j k l m n o p #

stimes :: Integral b0 => b0 -> T16 a b c d e f g h i j k l m n o p -> T16 a b c d e f g h i j k l m n o p #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e, Monoid f, Monoid g, Monoid h, Monoid i, Monoid j, Monoid k, Monoid l, Monoid m, Monoid n, Monoid o, Monoid p) => Monoid (T16 a b c d e f g h i j k l m n o p) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T16 a b c d e f g h i j k l m n o p #

mappend :: T16 a b c d e f g h i j k l m n o p -> T16 a b c d e f g h i j k l m n o p -> T16 a b c d e f g h i j k l m n o p #

mconcat :: [T16 a b c d e f g h i j k l m n o p] -> T16 a b c d e f g h i j k l m n o p #

(NFData a, NFData b, NFData c, NFData d, NFData e, NFData f, NFData g, NFData h, NFData i, NFData j, NFData k, NFData l, NFData m, NFData n, NFData o, NFData p) => NFData (T16 a b c d e f g h i j k l m n o p) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T16 a b c d e f g h i j k l m n o p -> () #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m, Hashable n, Hashable o, Hashable p) => Hashable (T16 a b c d e f g h i j k l m n o p) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T16 a b c d e f g h i j k l m n o p -> Int #

hash :: T16 a b c d e f g h i j k l m n o p -> Int #

type Rep (T16 a b c d e f g h i j k l m n o p) Source # 
Instance details

Defined in Data.Tuple.Strict

type Rep (T16 a b c d e f g h i j k l m n o p) = D1 (MetaData "T16" "Data.Tuple.Strict" "strict-tuple-0.1.2-JAeTdTBPAA22ArrJi9nxMN" False) (C1 (MetaCons "T16" PrefixI False) ((((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 a) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 b)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 c) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 d))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 e) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 f)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 g) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 h)))) :*: (((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 i) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 j)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 k) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 l))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 m) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 n)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 o) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 p))))))

data T17 a b c d e f g h i j k l m n o p q Source #

Constructors

T17 a b c d e f g h i j k l m n o p q 
Instances
(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m, Hashable n, Hashable o) => Hashable2 (T17 a b c d e f g h i j k l m n o) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b0 -> Int) -> Int -> T17 a b c d e f g h i j k l m n o a0 b0 -> Int #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m, Hashable n, Hashable o, Hashable p) => Hashable1 (T17 a b c d e f g h i j k l m n o p) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T17 a b c d e f g h i j k l m n o p a0 -> Int #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m, Bounded n, Bounded o, Bounded p, Bounded q) => Bounded (T17 a b c d e f g h i j k l m n o p q) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T17 a b c d e f g h i j k l m n o p q #

maxBound :: T17 a b c d e f g h i j k l m n o p q #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n, Eq o, Eq p, Eq q) => Eq (T17 a b c d e f g h i j k l m n o p q) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T17 a b c d e f g h i j k l m n o p q -> T17 a b c d e f g h i j k l m n o p q -> Bool #

(/=) :: T17 a b c d e f g h i j k l m n o p q -> T17 a b c d e f g h i j k l m n o p q -> Bool #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n, Ord o, Ord p, Ord q) => Ord (T17 a b c d e f g h i j k l m n o p q) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T17 a b c d e f g h i j k l m n o p q -> T17 a b c d e f g h i j k l m n o p q -> Ordering #

(<) :: T17 a b c d e f g h i j k l m n o p q -> T17 a b c d e f g h i j k l m n o p q -> Bool #

(<=) :: T17 a b c d e f g h i j k l m n o p q -> T17 a b c d e f g h i j k l m n o p q -> Bool #

(>) :: T17 a b c d e f g h i j k l m n o p q -> T17 a b c d e f g h i j k l m n o p q -> Bool #

(>=) :: T17 a b c d e f g h i j k l m n o p q -> T17 a b c d e f g h i j k l m n o p q -> Bool #

max :: T17 a b c d e f g h i j k l m n o p q -> T17 a b c d e f g h i j k l m n o p q -> T17 a b c d e f g h i j k l m n o p q #

min :: T17 a b c d e f g h i j k l m n o p q -> T17 a b c d e f g h i j k l m n o p q -> T17 a b c d e f g h i j k l m n o p q #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n, Read o, Read p, Read q) => Read (T17 a b c d e f g h i j k l m n o p q) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T17 a b c d e f g h i j k l m n o p q) #

readList :: ReadS [T17 a b c d e f g h i j k l m n o p q] #

readPrec :: ReadPrec (T17 a b c d e f g h i j k l m n o p q) #

readListPrec :: ReadPrec [T17 a b c d e f g h i j k l m n o p q] #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n, Show o, Show p, Show q) => Show (T17 a b c d e f g h i j k l m n o p q) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T17 a b c d e f g h i j k l m n o p q -> ShowS #

show :: T17 a b c d e f g h i j k l m n o p q -> String #

showList :: [T17 a b c d e f g h i j k l m n o p q] -> ShowS #

Generic (T17 a b c d e f g h i j k l m n o p q) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T17 a b c d e f g h i j k l m n o p q) :: Type -> Type #

Methods

from :: T17 a b c d e f g h i j k l m n o p q -> Rep (T17 a b c d e f g h i j k l m n o p q) x #

to :: Rep (T17 a b c d e f g h i j k l m n o p q) x -> T17 a b c d e f g h i j k l m n o p q #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e, Semigroup f, Semigroup g, Semigroup h, Semigroup i, Semigroup j, Semigroup k, Semigroup l, Semigroup m, Semigroup n, Semigroup o, Semigroup p, Semigroup q) => Semigroup (T17 a b c d e f g h i j k l m n o p q) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T17 a b c d e f g h i j k l m n o p q -> T17 a b c d e f g h i j k l m n o p q -> T17 a b c d e f g h i j k l m n o p q #

sconcat :: NonEmpty (T17 a b c d e f g h i j k l m n o p q) -> T17 a b c d e f g h i j k l m n o p q #

stimes :: Integral b0 => b0 -> T17 a b c d e f g h i j k l m n o p q -> T17 a b c d e f g h i j k l m n o p q #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e, Monoid f, Monoid g, Monoid h, Monoid i, Monoid j, Monoid k, Monoid l, Monoid m, Monoid n, Monoid o, Monoid p, Monoid q) => Monoid (T17 a b c d e f g h i j k l m n o p q) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T17 a b c d e f g h i j k l m n o p q #

mappend :: T17 a b c d e f g h i j k l m n o p q -> T17 a b c d e f g h i j k l m n o p q -> T17 a b c d e f g h i j k l m n o p q #

mconcat :: [T17 a b c d e f g h i j k l m n o p q] -> T17 a b c d e f g h i j k l m n o p q #

(NFData a, NFData b, NFData c, NFData d, NFData e, NFData f, NFData g, NFData h, NFData i, NFData j, NFData k, NFData l, NFData m, NFData n, NFData o, NFData p, NFData q) => NFData (T17 a b c d e f g h i j k l m n o p q) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T17 a b c d e f g h i j k l m n o p q -> () #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m, Hashable n, Hashable o, Hashable p, Hashable q) => Hashable (T17 a b c d e f g h i j k l m n o p q) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T17 a b c d e f g h i j k l m n o p q -> Int #

hash :: T17 a b c d e f g h i j k l m n o p q -> Int #

type Rep (T17 a b c d e f g h i j k l m n o p q) Source # 
Instance details

Defined in Data.Tuple.Strict

type Rep (T17 a b c d e f g h i j k l m n o p q) = D1 (MetaData "T17" "Data.Tuple.Strict" "strict-tuple-0.1.2-JAeTdTBPAA22ArrJi9nxMN" False) (C1 (MetaCons "T17" PrefixI False) ((((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 a) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 b)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 c) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 d))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 e) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 f)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 g) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 h)))) :*: (((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 i) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 j)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 k) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 l))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 m) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 n)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 o) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 p) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 q)))))))

data T18 a b c d e f g h i j k l m n o p q r Source #

Constructors

T18 a b c d e f g h i j k l m n o p q r 
Instances
(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m, Hashable n, Hashable o, Hashable p) => Hashable2 (T18 a b c d e f g h i j k l m n o p) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b0 -> Int) -> Int -> T18 a b c d e f g h i j k l m n o p a0 b0 -> Int #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m, Hashable n, Hashable o, Hashable p, Hashable q) => Hashable1 (T18 a b c d e f g h i j k l m n o p q) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T18 a b c d e f g h i j k l m n o p q a0 -> Int #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m, Bounded n, Bounded o, Bounded p, Bounded q, Bounded r) => Bounded (T18 a b c d e f g h i j k l m n o p q r) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T18 a b c d e f g h i j k l m n o p q r #

maxBound :: T18 a b c d e f g h i j k l m n o p q r #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n, Eq o, Eq p, Eq q, Eq r) => Eq (T18 a b c d e f g h i j k l m n o p q r) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T18 a b c d e f g h i j k l m n o p q r -> T18 a b c d e f g h i j k l m n o p q r -> Bool #

(/=) :: T18 a b c d e f g h i j k l m n o p q r -> T18 a b c d e f g h i j k l m n o p q r -> Bool #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n, Ord o, Ord p, Ord q, Ord r) => Ord (T18 a b c d e f g h i j k l m n o p q r) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T18 a b c d e f g h i j k l m n o p q r -> T18 a b c d e f g h i j k l m n o p q r -> Ordering #

(<) :: T18 a b c d e f g h i j k l m n o p q r -> T18 a b c d e f g h i j k l m n o p q r -> Bool #

(<=) :: T18 a b c d e f g h i j k l m n o p q r -> T18 a b c d e f g h i j k l m n o p q r -> Bool #

(>) :: T18 a b c d e f g h i j k l m n o p q r -> T18 a b c d e f g h i j k l m n o p q r -> Bool #

(>=) :: T18 a b c d e f g h i j k l m n o p q r -> T18 a b c d e f g h i j k l m n o p q r -> Bool #

max :: T18 a b c d e f g h i j k l m n o p q r -> T18 a b c d e f g h i j k l m n o p q r -> T18 a b c d e f g h i j k l m n o p q r #

min :: T18 a b c d e f g h i j k l m n o p q r -> T18 a b c d e f g h i j k l m n o p q r -> T18 a b c d e f g h i j k l m n o p q r #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n, Read o, Read p, Read q, Read r) => Read (T18 a b c d e f g h i j k l m n o p q r) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T18 a b c d e f g h i j k l m n o p q r) #

readList :: ReadS [T18 a b c d e f g h i j k l m n o p q r] #

readPrec :: ReadPrec (T18 a b c d e f g h i j k l m n o p q r) #

readListPrec :: ReadPrec [T18 a b c d e f g h i j k l m n o p q r] #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n, Show o, Show p, Show q, Show r) => Show (T18 a b c d e f g h i j k l m n o p q r) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T18 a b c d e f g h i j k l m n o p q r -> ShowS #

show :: T18 a b c d e f g h i j k l m n o p q r -> String #

showList :: [T18 a b c d e f g h i j k l m n o p q r] -> ShowS #

Generic (T18 a b c d e f g h i j k l m n o p q r) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T18 a b c d e f g h i j k l m n o p q r) :: Type -> Type #

Methods

from :: T18 a b c d e f g h i j k l m n o p q r -> Rep (T18 a b c d e f g h i j k l m n o p q r) x #

to :: Rep (T18 a b c d e f g h i j k l m n o p q r) x -> T18 a b c d e f g h i j k l m n o p q r #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e, Semigroup f, Semigroup g, Semigroup h, Semigroup i, Semigroup j, Semigroup k, Semigroup l, Semigroup m, Semigroup n, Semigroup o, Semigroup p, Semigroup q, Semigroup r) => Semigroup (T18 a b c d e f g h i j k l m n o p q r) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T18 a b c d e f g h i j k l m n o p q r -> T18 a b c d e f g h i j k l m n o p q r -> T18 a b c d e f g h i j k l m n o p q r #

sconcat :: NonEmpty (T18 a b c d e f g h i j k l m n o p q r) -> T18 a b c d e f g h i j k l m n o p q r #

stimes :: Integral b0 => b0 -> T18 a b c d e f g h i j k l m n o p q r -> T18 a b c d e f g h i j k l m n o p q r #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e, Monoid f, Monoid g, Monoid h, Monoid i, Monoid j, Monoid k, Monoid l, Monoid m, Monoid n, Monoid o, Monoid p, Monoid q, Monoid r) => Monoid (T18 a b c d e f g h i j k l m n o p q r) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T18 a b c d e f g h i j k l m n o p q r #

mappend :: T18 a b c d e f g h i j k l m n o p q r -> T18 a b c d e f g h i j k l m n o p q r -> T18 a b c d e f g h i j k l m n o p q r #

mconcat :: [T18 a b c d e f g h i j k l m n o p q r] -> T18 a b c d e f g h i j k l m n o p q r #

(NFData a, NFData b, NFData c, NFData d, NFData e, NFData f, NFData g, NFData h, NFData i, NFData j, NFData k, NFData l, NFData m, NFData n, NFData o, NFData p, NFData q, NFData r) => NFData (T18 a b c d e f g h i j k l m n o p q r) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T18 a b c d e f g h i j k l m n o p q r -> () #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m, Hashable n, Hashable o, Hashable p, Hashable q, Hashable r) => Hashable (T18 a b c d e f g h i j k l m n o p q r) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T18 a b c d e f g h i j k l m n o p q r -> Int #

hash :: T18 a b c d e f g h i j k l m n o p q r -> Int #

type Rep (T18 a b c d e f g h i j k l m n o p q r) Source # 
Instance details

Defined in Data.Tuple.Strict

type Rep (T18 a b c d e f g h i j k l m n o p q r) = D1 (MetaData "T18" "Data.Tuple.Strict" "strict-tuple-0.1.2-JAeTdTBPAA22ArrJi9nxMN" False) (C1 (MetaCons "T18" PrefixI False) ((((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 a) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 b)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 c) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 d))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 e) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 f)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 g) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 h) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 i))))) :*: (((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 j) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 k)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 l) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 m))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 n) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 o)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 p) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 q) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 r)))))))

data T19 a b c d e f g h i j k l m n o p q r s Source #

Constructors

T19 a b c d e f g h i j k l m n o p q r s 
Instances
(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m, Hashable n, Hashable o, Hashable p, Hashable q) => Hashable2 (T19 a b c d e f g h i j k l m n o p q) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt2 :: (Int -> a0 -> Int) -> (Int -> b0 -> Int) -> Int -> T19 a b c d e f g h i j k l m n o p q a0 b0 -> Int #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m, Hashable n, Hashable o, Hashable p, Hashable q, Hashable r) => Hashable1 (T19 a b c d e f g h i j k l m n o p q r) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> T19 a b c d e f g h i j k l m n o p q r a0 -> Int #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m, Bounded n, Bounded o, Bounded p, Bounded q, Bounded r, Bounded s) => Bounded (T19 a b c d e f g h i j k l m n o p q r s) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

minBound :: T19 a b c d e f g h i j k l m n o p q r s #

maxBound :: T19 a b c d e f g h i j k l m n o p q r s #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n, Eq o, Eq p, Eq q, Eq r, Eq s) => Eq (T19 a b c d e f g h i j k l m n o p q r s) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(==) :: T19 a b c d e f g h i j k l m n o p q r s -> T19 a b c d e f g h i j k l m n o p q r s -> Bool #

(/=) :: T19 a b c d e f g h i j k l m n o p q r s -> T19 a b c d e f g h i j k l m n o p q r s -> Bool #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n, Ord o, Ord p, Ord q, Ord r, Ord s) => Ord (T19 a b c d e f g h i j k l m n o p q r s) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

compare :: T19 a b c d e f g h i j k l m n o p q r s -> T19 a b c d e f g h i j k l m n o p q r s -> Ordering #

(<) :: T19 a b c d e f g h i j k l m n o p q r s -> T19 a b c d e f g h i j k l m n o p q r s -> Bool #

(<=) :: T19 a b c d e f g h i j k l m n o p q r s -> T19 a b c d e f g h i j k l m n o p q r s -> Bool #

(>) :: T19 a b c d e f g h i j k l m n o p q r s -> T19 a b c d e f g h i j k l m n o p q r s -> Bool #

(>=) :: T19 a b c d e f g h i j k l m n o p q r s -> T19 a b c d e f g h i j k l m n o p q r s -> Bool #

max :: T19 a b c d e f g h i j k l m n o p q r s -> T19 a b c d e f g h i j k l m n o p q r s -> T19 a b c d e f g h i j k l m n o p q r s #

min :: T19 a b c d e f g h i j k l m n o p q r s -> T19 a b c d e f g h i j k l m n o p q r s -> T19 a b c d e f g h i j k l m n o p q r s #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n, Read o, Read p, Read q, Read r, Read s) => Read (T19 a b c d e f g h i j k l m n o p q r s) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

readsPrec :: Int -> ReadS (T19 a b c d e f g h i j k l m n o p q r s) #

readList :: ReadS [T19 a b c d e f g h i j k l m n o p q r s] #

readPrec :: ReadPrec (T19 a b c d e f g h i j k l m n o p q r s) #

readListPrec :: ReadPrec [T19 a b c d e f g h i j k l m n o p q r s] #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n, Show o, Show p, Show q, Show r, Show s) => Show (T19 a b c d e f g h i j k l m n o p q r s) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

showsPrec :: Int -> T19 a b c d e f g h i j k l m n o p q r s -> ShowS #

show :: T19 a b c d e f g h i j k l m n o p q r s -> String #

showList :: [T19 a b c d e f g h i j k l m n o p q r s] -> ShowS #

Generic (T19 a b c d e f g h i j k l m n o p q r s) Source # 
Instance details

Defined in Data.Tuple.Strict

Associated Types

type Rep (T19 a b c d e f g h i j k l m n o p q r s) :: Type -> Type #

Methods

from :: T19 a b c d e f g h i j k l m n o p q r s -> Rep (T19 a b c d e f g h i j k l m n o p q r s) x #

to :: Rep (T19 a b c d e f g h i j k l m n o p q r s) x -> T19 a b c d e f g h i j k l m n o p q r s #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e, Semigroup f, Semigroup g, Semigroup h, Semigroup i, Semigroup j, Semigroup k, Semigroup l, Semigroup m, Semigroup n, Semigroup o, Semigroup p, Semigroup q, Semigroup r, Semigroup s) => Semigroup (T19 a b c d e f g h i j k l m n o p q r s) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

(<>) :: T19 a b c d e f g h i j k l m n o p q r s -> T19 a b c d e f g h i j k l m n o p q r s -> T19 a b c d e f g h i j k l m n o p q r s #

sconcat :: NonEmpty (T19 a b c d e f g h i j k l m n o p q r s) -> T19 a b c d e f g h i j k l m n o p q r s #

stimes :: Integral b0 => b0 -> T19 a b c d e f g h i j k l m n o p q r s -> T19 a b c d e f g h i j k l m n o p q r s #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e, Monoid f, Monoid g, Monoid h, Monoid i, Monoid j, Monoid k, Monoid l, Monoid m, Monoid n, Monoid o, Monoid p, Monoid q, Monoid r, Monoid s) => Monoid (T19 a b c d e f g h i j k l m n o p q r s) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

mempty :: T19 a b c d e f g h i j k l m n o p q r s #

mappend :: T19 a b c d e f g h i j k l m n o p q r s -> T19 a b c d e f g h i j k l m n o p q r s -> T19 a b c d e f g h i j k l m n o p q r s #

mconcat :: [T19 a b c d e f g h i j k l m n o p q r s] -> T19 a b c d e f g h i j k l m n o p q r s #

(NFData a, NFData b, NFData c, NFData d, NFData e, NFData f, NFData g, NFData h, NFData i, NFData j, NFData k, NFData l, NFData m, NFData n, NFData o, NFData p, NFData q, NFData r, NFData s) => NFData (T19 a b c d e f g h i j k l m n o p q r s) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

rnf :: T19 a b c d e f g h i j k l m n o p q r s -> () #

(Hashable a, Hashable b, Hashable c, Hashable d, Hashable e, Hashable f, Hashable g, Hashable h, Hashable i, Hashable j, Hashable k, Hashable l, Hashable m, Hashable n, Hashable o, Hashable p, Hashable q, Hashable r, Hashable s) => Hashable (T19 a b c d e f g h i j k l m n o p q r s) Source # 
Instance details

Defined in Data.Tuple.Strict

Methods

hashWithSalt :: Int -> T19 a b c d e f g h i j k l m n o p q r s -> Int #

hash :: T19 a b c d e f g h i j k l m n o p q r s -> Int #

type Rep (T19 a b c d e f g h i j k l m n o p q r s) Source # 
Instance details

Defined in Data.Tuple.Strict

type Rep (T19 a b c d e f g h i j k l m n o p q r s) = D1 (MetaData "T19" "Data.Tuple.Strict" "strict-tuple-0.1.2-JAeTdTBPAA22ArrJi9nxMN" False) (C1 (MetaCons "T19" PrefixI False) ((((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 a) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 b)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 c) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 d))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 e) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 f)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 g) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 h) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 i))))) :*: (((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 j) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 k)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 l) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 m) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 n)))) :*: ((S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 o) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 p)) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 q) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 r) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 s)))))))