Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
Instances
Instances
Bifunctor (Either4 a b) Source # | |
Bitraversable (Either4 a b) Source # | |
Defined in Data.Avro.EitherN bitraverse :: Applicative f => (a0 -> f c) -> (b0 -> f d) -> Either4 a b a0 b0 -> f (Either4 a b c d) # | |
Bifoldable (Either4 a b) Source # | |
Defined in Data.Avro.EitherN | |
Monad (Either4 a b c) Source # | |
Functor (Either4 a b c) Source # | |
Applicative (Either4 a b c) Source # | |
Defined in Data.Avro.EitherN pure :: a0 -> Either4 a b c a0 # (<*>) :: Either4 a b c (a0 -> b0) -> Either4 a b c a0 -> Either4 a b c b0 # liftA2 :: (a0 -> b0 -> c0) -> Either4 a b c a0 -> Either4 a b c b0 -> Either4 a b c c0 # (*>) :: Either4 a b c a0 -> Either4 a b c b0 -> Either4 a b c b0 # (<*) :: Either4 a b c a0 -> Either4 a b c b0 -> Either4 a b c a0 # | |
Foldable (Either4 a b c) Source # | |
Defined in Data.Avro.EitherN fold :: Monoid m => Either4 a b c m -> m # foldMap :: Monoid m => (a0 -> m) -> Either4 a b c a0 -> m # foldMap' :: Monoid m => (a0 -> m) -> Either4 a b c a0 -> m # foldr :: (a0 -> b0 -> b0) -> b0 -> Either4 a b c a0 -> b0 # foldr' :: (a0 -> b0 -> b0) -> b0 -> Either4 a b c a0 -> b0 # foldl :: (b0 -> a0 -> b0) -> b0 -> Either4 a b c a0 -> b0 # foldl' :: (b0 -> a0 -> b0) -> b0 -> Either4 a b c a0 -> b0 # foldr1 :: (a0 -> a0 -> a0) -> Either4 a b c a0 -> a0 # foldl1 :: (a0 -> a0 -> a0) -> Either4 a b c a0 -> a0 # toList :: Either4 a b c a0 -> [a0] # null :: Either4 a b c a0 -> Bool # length :: Either4 a b c a0 -> Int # elem :: Eq a0 => a0 -> Either4 a b c a0 -> Bool # maximum :: Ord a0 => Either4 a b c a0 -> a0 # minimum :: Ord a0 => Either4 a b c a0 -> a0 # | |
Traversable (Either4 a b c) Source # | |
Defined in Data.Avro.EitherN traverse :: Applicative f => (a0 -> f b0) -> Either4 a b c a0 -> f (Either4 a b c b0) # sequenceA :: Applicative f => Either4 a b c (f a0) -> f (Either4 a b c a0) # mapM :: Monad m => (a0 -> m b0) -> Either4 a b c a0 -> m (Either4 a b c b0) # sequence :: Monad m => Either4 a b c (m a0) -> m (Either4 a b c a0) # | |
(Eq a, Eq b, Eq c, Eq d) => Eq (Either4 a b c d) Source # | |
(Ord a, Ord b, Ord c, Ord d) => Ord (Either4 a b c d) Source # | |
Defined in Data.Avro.EitherN compare :: Either4 a b c d -> Either4 a b c d -> Ordering # (<) :: Either4 a b c d -> Either4 a b c d -> Bool # (<=) :: Either4 a b c d -> Either4 a b c d -> Bool # (>) :: Either4 a b c d -> Either4 a b c d -> Bool # (>=) :: Either4 a b c d -> Either4 a b c d -> Bool # max :: Either4 a b c d -> Either4 a b c d -> Either4 a b c d # min :: Either4 a b c d -> Either4 a b c d -> Either4 a b c d # | |
(Show a, Show b, Show c, Show d) => Show (Either4 a b c d) Source # | |
Generic (Either4 a b c d) Source # | |
(HasAvroSchema a, HasAvroSchema b, HasAvroSchema c, HasAvroSchema d) => HasAvroSchema (Either4 a b c d) Source # | |
(ToAvro a, ToAvro b, ToAvro c, ToAvro d) => ToAvro (Either4 a b c d) Source # | |
(FromAvro a, FromAvro b, FromAvro c, FromAvro d) => FromAvro (Either4 a b c d) Source # | |
type Rep (Either4 a b c d) Source # | |
Defined in Data.Avro.EitherN type Rep (Either4 a b c d) = D1 ('MetaData "Either4" "Data.Avro.EitherN" "avro-0.6.0.0-DoOm2DJah3nIktWo4nyiQe" 'False) ((C1 ('MetaCons "E4_1" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "E4_2" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b))) :+: (C1 ('MetaCons "E4_3" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c)) :+: C1 ('MetaCons "E4_4" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d)))) |
data Either5 a b c d e Source #
Instances
Bifunctor (Either5 a b c) Source # | |
Bitraversable (Either5 a b c) Source # | |
Defined in Data.Avro.EitherN bitraverse :: Applicative f => (a0 -> f c0) -> (b0 -> f d) -> Either5 a b c a0 b0 -> f (Either5 a b c c0 d) # | |
Bifoldable (Either5 a b c) Source # | |
Defined in Data.Avro.EitherN | |
Monad (Either5 a b c d) Source # | |
Functor (Either5 a b c d) Source # | |
Applicative (Either5 a b c d) Source # | |
Defined in Data.Avro.EitherN pure :: a0 -> Either5 a b c d a0 # (<*>) :: Either5 a b c d (a0 -> b0) -> Either5 a b c d a0 -> Either5 a b c d b0 # liftA2 :: (a0 -> b0 -> c0) -> Either5 a b c d a0 -> Either5 a b c d b0 -> Either5 a b c d c0 # (*>) :: Either5 a b c d a0 -> Either5 a b c d b0 -> Either5 a b c d b0 # (<*) :: Either5 a b c d a0 -> Either5 a b c d b0 -> Either5 a b c d a0 # | |
Foldable (Either5 a b c d) Source # | |
Defined in Data.Avro.EitherN fold :: Monoid m => Either5 a b c d m -> m # foldMap :: Monoid m => (a0 -> m) -> Either5 a b c d a0 -> m # foldMap' :: Monoid m => (a0 -> m) -> Either5 a b c d a0 -> m # foldr :: (a0 -> b0 -> b0) -> b0 -> Either5 a b c d a0 -> b0 # foldr' :: (a0 -> b0 -> b0) -> b0 -> Either5 a b c d a0 -> b0 # foldl :: (b0 -> a0 -> b0) -> b0 -> Either5 a b c d a0 -> b0 # foldl' :: (b0 -> a0 -> b0) -> b0 -> Either5 a b c d a0 -> b0 # foldr1 :: (a0 -> a0 -> a0) -> Either5 a b c d a0 -> a0 # foldl1 :: (a0 -> a0 -> a0) -> Either5 a b c d a0 -> a0 # toList :: Either5 a b c d a0 -> [a0] # null :: Either5 a b c d a0 -> Bool # length :: Either5 a b c d a0 -> Int # elem :: Eq a0 => a0 -> Either5 a b c d a0 -> Bool # maximum :: Ord a0 => Either5 a b c d a0 -> a0 # minimum :: Ord a0 => Either5 a b c d a0 -> a0 # | |
Traversable (Either5 a b c d) Source # | |
Defined in Data.Avro.EitherN traverse :: Applicative f => (a0 -> f b0) -> Either5 a b c d a0 -> f (Either5 a b c d b0) # sequenceA :: Applicative f => Either5 a b c d (f a0) -> f (Either5 a b c d a0) # mapM :: Monad m => (a0 -> m b0) -> Either5 a b c d a0 -> m (Either5 a b c d b0) # sequence :: Monad m => Either5 a b c d (m a0) -> m (Either5 a b c d a0) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e) => Eq (Either5 a b c d e) Source # | |
(Ord a, Ord b, Ord c, Ord d, Ord e) => Ord (Either5 a b c d e) Source # | |
Defined in Data.Avro.EitherN compare :: Either5 a b c d e -> Either5 a b c d e -> Ordering # (<) :: Either5 a b c d e -> Either5 a b c d e -> Bool # (<=) :: Either5 a b c d e -> Either5 a b c d e -> Bool # (>) :: Either5 a b c d e -> Either5 a b c d e -> Bool # (>=) :: Either5 a b c d e -> Either5 a b c d e -> Bool # max :: Either5 a b c d e -> Either5 a b c d e -> Either5 a b c d e # min :: Either5 a b c d e -> Either5 a b c d e -> Either5 a b c d e # | |
(Show a, Show b, Show c, Show d, Show e) => Show (Either5 a b c d e) Source # | |
Generic (Either5 a b c d e) Source # | |
(HasAvroSchema a, HasAvroSchema b, HasAvroSchema c, HasAvroSchema d, HasAvroSchema e) => HasAvroSchema (Either5 a b c d e) Source # | |
(ToAvro a, ToAvro b, ToAvro c, ToAvro d, ToAvro e) => ToAvro (Either5 a b c d e) Source # | |
(FromAvro a, FromAvro b, FromAvro c, FromAvro d, FromAvro e) => FromAvro (Either5 a b c d e) Source # | |
type Rep (Either5 a b c d e) Source # | |
Defined in Data.Avro.EitherN type Rep (Either5 a b c d e) = D1 ('MetaData "Either5" "Data.Avro.EitherN" "avro-0.6.0.0-DoOm2DJah3nIktWo4nyiQe" 'False) ((C1 ('MetaCons "E5_1" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "E5_2" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b))) :+: (C1 ('MetaCons "E5_3" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c)) :+: (C1 ('MetaCons "E5_4" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d)) :+: C1 ('MetaCons "E5_5" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e))))) |
data Either6 a b c d e f Source #
Instances
Bifunctor (Either6 a b c d) Source # | |
Bitraversable (Either6 a b c d) Source # | |
Defined in Data.Avro.EitherN bitraverse :: Applicative f => (a0 -> f c0) -> (b0 -> f d0) -> Either6 a b c d a0 b0 -> f (Either6 a b c d c0 d0) # | |
Bifoldable (Either6 a b c d) Source # | |
Defined in Data.Avro.EitherN | |
Monad (Either6 a b c d e) Source # | |
Functor (Either6 a b c d e) Source # | |
Applicative (Either6 a b c d e) Source # | |
Defined in Data.Avro.EitherN pure :: a0 -> Either6 a b c d e a0 # (<*>) :: Either6 a b c d e (a0 -> b0) -> Either6 a b c d e a0 -> Either6 a b c d e b0 # liftA2 :: (a0 -> b0 -> c0) -> Either6 a b c d e a0 -> Either6 a b c d e b0 -> Either6 a b c d e c0 # (*>) :: Either6 a b c d e a0 -> Either6 a b c d e b0 -> Either6 a b c d e b0 # (<*) :: Either6 a b c d e a0 -> Either6 a b c d e b0 -> Either6 a b c d e a0 # | |
Foldable (Either6 a b c d e) Source # | |
Defined in Data.Avro.EitherN fold :: Monoid m => Either6 a b c d e m -> m # foldMap :: Monoid m => (a0 -> m) -> Either6 a b c d e a0 -> m # foldMap' :: Monoid m => (a0 -> m) -> Either6 a b c d e a0 -> m # foldr :: (a0 -> b0 -> b0) -> b0 -> Either6 a b c d e a0 -> b0 # foldr' :: (a0 -> b0 -> b0) -> b0 -> Either6 a b c d e a0 -> b0 # foldl :: (b0 -> a0 -> b0) -> b0 -> Either6 a b c d e a0 -> b0 # foldl' :: (b0 -> a0 -> b0) -> b0 -> Either6 a b c d e a0 -> b0 # foldr1 :: (a0 -> a0 -> a0) -> Either6 a b c d e a0 -> a0 # foldl1 :: (a0 -> a0 -> a0) -> Either6 a b c d e a0 -> a0 # toList :: Either6 a b c d e a0 -> [a0] # null :: Either6 a b c d e a0 -> Bool # length :: Either6 a b c d e a0 -> Int # elem :: Eq a0 => a0 -> Either6 a b c d e a0 -> Bool # maximum :: Ord a0 => Either6 a b c d e a0 -> a0 # minimum :: Ord a0 => Either6 a b c d e a0 -> a0 # | |
Traversable (Either6 a b c d e) Source # | |
Defined in Data.Avro.EitherN traverse :: Applicative f => (a0 -> f b0) -> Either6 a b c d e a0 -> f (Either6 a b c d e b0) # sequenceA :: Applicative f => Either6 a b c d e (f a0) -> f (Either6 a b c d e a0) # mapM :: Monad m => (a0 -> m b0) -> Either6 a b c d e a0 -> m (Either6 a b c d e b0) # sequence :: Monad m => Either6 a b c d e (m a0) -> m (Either6 a b c d e a0) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f) => Eq (Either6 a b c d e f) Source # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f) => Ord (Either6 a b c d e f) Source # | |
Defined in Data.Avro.EitherN compare :: Either6 a b c d e f -> Either6 a b c d e f -> Ordering # (<) :: Either6 a b c d e f -> Either6 a b c d e f -> Bool # (<=) :: Either6 a b c d e f -> Either6 a b c d e f -> Bool # (>) :: Either6 a b c d e f -> Either6 a b c d e f -> Bool # (>=) :: Either6 a b c d e f -> Either6 a b c d e f -> Bool # max :: Either6 a b c d e f -> Either6 a b c d e f -> Either6 a b c d e f # min :: Either6 a b c d e f -> Either6 a b c d e f -> Either6 a b c d e f # | |
(Show a, Show b, Show c, Show d, Show e, Show f) => Show (Either6 a b c d e f) Source # | |
Generic (Either6 a b c d e f) Source # | |
(HasAvroSchema a, HasAvroSchema b, HasAvroSchema c, HasAvroSchema d, HasAvroSchema e, HasAvroSchema f) => HasAvroSchema (Either6 a b c d e f) Source # | |
(ToAvro a, ToAvro b, ToAvro c, ToAvro d, ToAvro e, ToAvro f) => ToAvro (Either6 a b c d e f) Source # | |
(FromAvro a, FromAvro b, FromAvro c, FromAvro d, FromAvro e, FromAvro f) => FromAvro (Either6 a b c d e f) Source # | |
type Rep (Either6 a b c d e f) Source # | |
Defined in Data.Avro.EitherN type Rep (Either6 a b c d e f) = D1 ('MetaData "Either6" "Data.Avro.EitherN" "avro-0.6.0.0-DoOm2DJah3nIktWo4nyiQe" 'False) ((C1 ('MetaCons "E6_1" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: (C1 ('MetaCons "E6_2" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)) :+: C1 ('MetaCons "E6_3" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c)))) :+: (C1 ('MetaCons "E6_4" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d)) :+: (C1 ('MetaCons "E6_5" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e)) :+: C1 ('MetaCons "E6_6" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 f))))) |
data Either7 a b c d e f g Source #
Instances
Bifunctor (Either7 a b c d e) Source # | |
Bitraversable (Either7 a b c d e) Source # | |
Defined in Data.Avro.EitherN bitraverse :: Applicative f => (a0 -> f c0) -> (b0 -> f d0) -> Either7 a b c d e a0 b0 -> f (Either7 a b c d e c0 d0) # | |
Bifoldable (Either7 a b c d e) Source # | |
Defined in Data.Avro.EitherN bifold :: Monoid m => Either7 a b c d e m m -> m # bifoldMap :: Monoid m => (a0 -> m) -> (b0 -> m) -> Either7 a b c d e a0 b0 -> m # bifoldr :: (a0 -> c0 -> c0) -> (b0 -> c0 -> c0) -> c0 -> Either7 a b c d e a0 b0 -> c0 # bifoldl :: (c0 -> a0 -> c0) -> (c0 -> b0 -> c0) -> c0 -> Either7 a b c d e a0 b0 -> c0 # | |
Monad (Either7 a b c d e f) Source # | |
Functor (Either7 a b c d e f) Source # | |
Applicative (Either7 a b c d e f) Source # | |
Defined in Data.Avro.EitherN pure :: a0 -> Either7 a b c d e f a0 # (<*>) :: Either7 a b c d e f (a0 -> b0) -> Either7 a b c d e f a0 -> Either7 a b c d e f b0 # liftA2 :: (a0 -> b0 -> c0) -> Either7 a b c d e f a0 -> Either7 a b c d e f b0 -> Either7 a b c d e f c0 # (*>) :: Either7 a b c d e f a0 -> Either7 a b c d e f b0 -> Either7 a b c d e f b0 # (<*) :: Either7 a b c d e f a0 -> Either7 a b c d e f b0 -> Either7 a b c d e f a0 # | |
Foldable (Either7 a b c d e f) Source # | |
Defined in Data.Avro.EitherN fold :: Monoid m => Either7 a b c d e f m -> m # foldMap :: Monoid m => (a0 -> m) -> Either7 a b c d e f a0 -> m # foldMap' :: Monoid m => (a0 -> m) -> Either7 a b c d e f a0 -> m # foldr :: (a0 -> b0 -> b0) -> b0 -> Either7 a b c d e f a0 -> b0 # foldr' :: (a0 -> b0 -> b0) -> b0 -> Either7 a b c d e f a0 -> b0 # foldl :: (b0 -> a0 -> b0) -> b0 -> Either7 a b c d e f a0 -> b0 # foldl' :: (b0 -> a0 -> b0) -> b0 -> Either7 a b c d e f a0 -> b0 # foldr1 :: (a0 -> a0 -> a0) -> Either7 a b c d e f a0 -> a0 # foldl1 :: (a0 -> a0 -> a0) -> Either7 a b c d e f a0 -> a0 # toList :: Either7 a b c d e f a0 -> [a0] # null :: Either7 a b c d e f a0 -> Bool # length :: Either7 a b c d e f a0 -> Int # elem :: Eq a0 => a0 -> Either7 a b c d e f a0 -> Bool # maximum :: Ord a0 => Either7 a b c d e f a0 -> a0 # minimum :: Ord a0 => Either7 a b c d e f a0 -> a0 # | |
Traversable (Either7 a b c d e f) Source # | |
Defined in Data.Avro.EitherN traverse :: Applicative f0 => (a0 -> f0 b0) -> Either7 a b c d e f a0 -> f0 (Either7 a b c d e f b0) # sequenceA :: Applicative f0 => Either7 a b c d e f (f0 a0) -> f0 (Either7 a b c d e f a0) # mapM :: Monad m => (a0 -> m b0) -> Either7 a b c d e f a0 -> m (Either7 a b c d e f b0) # sequence :: Monad m => Either7 a b c d e f (m a0) -> m (Either7 a b c d e f a0) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g) => Eq (Either7 a b c d e f g) Source # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g) => Ord (Either7 a b c d e f g) Source # | |
Defined in Data.Avro.EitherN compare :: Either7 a b c d e f g -> Either7 a b c d e f g -> Ordering # (<) :: Either7 a b c d e f g -> Either7 a b c d e f g -> Bool # (<=) :: Either7 a b c d e f g -> Either7 a b c d e f g -> Bool # (>) :: Either7 a b c d e f g -> Either7 a b c d e f g -> Bool # (>=) :: Either7 a b c d e f g -> Either7 a b c d e f g -> Bool # max :: Either7 a b c d e f g -> Either7 a b c d e f g -> Either7 a b c d e f g # min :: Either7 a b c d e f g -> Either7 a b c d e f g -> Either7 a b c d e f g # | |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g) => Show (Either7 a b c d e f g) Source # | |
Generic (Either7 a b c d e f g) Source # | |
(HasAvroSchema a, HasAvroSchema b, HasAvroSchema c, HasAvroSchema d, HasAvroSchema e, HasAvroSchema f, HasAvroSchema g) => HasAvroSchema (Either7 a b c d e f g) Source # | |
(ToAvro a, ToAvro b, ToAvro c, ToAvro d, ToAvro e, ToAvro f, ToAvro g) => ToAvro (Either7 a b c d e f g) Source # | |
(FromAvro a, FromAvro b, FromAvro c, FromAvro d, FromAvro e, FromAvro f, FromAvro g) => FromAvro (Either7 a b c d e f g) Source # | |
type Rep (Either7 a b c d e f g) Source # | |
Defined in Data.Avro.EitherN type Rep (Either7 a b c d e f g) = D1 ('MetaData "Either7" "Data.Avro.EitherN" "avro-0.6.0.0-DoOm2DJah3nIktWo4nyiQe" 'False) ((C1 ('MetaCons "E7_1" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: (C1 ('MetaCons "E7_2" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)) :+: C1 ('MetaCons "E7_3" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c)))) :+: ((C1 ('MetaCons "E7_4" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d)) :+: C1 ('MetaCons "E7_5" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e))) :+: (C1 ('MetaCons "E7_6" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 f)) :+: C1 ('MetaCons "E7_7" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 g))))) |
data Either8 a b c d e f g h Source #
Instances
Bifunctor (Either8 a b c d e f) Source # | |
Bitraversable (Either8 a b c d e f) Source # | |
Defined in Data.Avro.EitherN bitraverse :: Applicative f0 => (a0 -> f0 c0) -> (b0 -> f0 d0) -> Either8 a b c d e f a0 b0 -> f0 (Either8 a b c d e f c0 d0) # | |
Bifoldable (Either8 a b c d e f) Source # | |
Defined in Data.Avro.EitherN bifold :: Monoid m => Either8 a b c d e f m m -> m # bifoldMap :: Monoid m => (a0 -> m) -> (b0 -> m) -> Either8 a b c d e f a0 b0 -> m # bifoldr :: (a0 -> c0 -> c0) -> (b0 -> c0 -> c0) -> c0 -> Either8 a b c d e f a0 b0 -> c0 # bifoldl :: (c0 -> a0 -> c0) -> (c0 -> b0 -> c0) -> c0 -> Either8 a b c d e f a0 b0 -> c0 # | |
Monad (Either8 a b c d e f g) Source # | |
Functor (Either8 a b c d e f g) Source # | |
Applicative (Either8 a b c d e f g) Source # | |
Defined in Data.Avro.EitherN pure :: a0 -> Either8 a b c d e f g a0 # (<*>) :: Either8 a b c d e f g (a0 -> b0) -> Either8 a b c d e f g a0 -> Either8 a b c d e f g b0 # liftA2 :: (a0 -> b0 -> c0) -> Either8 a b c d e f g a0 -> Either8 a b c d e f g b0 -> Either8 a b c d e f g c0 # (*>) :: Either8 a b c d e f g a0 -> Either8 a b c d e f g b0 -> Either8 a b c d e f g b0 # (<*) :: Either8 a b c d e f g a0 -> Either8 a b c d e f g b0 -> Either8 a b c d e f g a0 # | |
Foldable (Either8 a b c d e f g) Source # | |
Defined in Data.Avro.EitherN fold :: Monoid m => Either8 a b c d e f g m -> m # foldMap :: Monoid m => (a0 -> m) -> Either8 a b c d e f g a0 -> m # foldMap' :: Monoid m => (a0 -> m) -> Either8 a b c d e f g a0 -> m # foldr :: (a0 -> b0 -> b0) -> b0 -> Either8 a b c d e f g a0 -> b0 # foldr' :: (a0 -> b0 -> b0) -> b0 -> Either8 a b c d e f g a0 -> b0 # foldl :: (b0 -> a0 -> b0) -> b0 -> Either8 a b c d e f g a0 -> b0 # foldl' :: (b0 -> a0 -> b0) -> b0 -> Either8 a b c d e f g a0 -> b0 # foldr1 :: (a0 -> a0 -> a0) -> Either8 a b c d e f g a0 -> a0 # foldl1 :: (a0 -> a0 -> a0) -> Either8 a b c d e f g a0 -> a0 # toList :: Either8 a b c d e f g a0 -> [a0] # null :: Either8 a b c d e f g a0 -> Bool # length :: Either8 a b c d e f g a0 -> Int # elem :: Eq a0 => a0 -> Either8 a b c d e f g a0 -> Bool # maximum :: Ord a0 => Either8 a b c d e f g a0 -> a0 # minimum :: Ord a0 => Either8 a b c d e f g a0 -> a0 # | |
Traversable (Either8 a b c d e f g) Source # | |
Defined in Data.Avro.EitherN traverse :: Applicative f0 => (a0 -> f0 b0) -> Either8 a b c d e f g a0 -> f0 (Either8 a b c d e f g b0) # sequenceA :: Applicative f0 => Either8 a b c d e f g (f0 a0) -> f0 (Either8 a b c d e f g a0) # mapM :: Monad m => (a0 -> m b0) -> Either8 a b c d e f g a0 -> m (Either8 a b c d e f g b0) # sequence :: Monad m => Either8 a b c d e f g (m a0) -> m (Either8 a b c d e f g a0) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h) => Eq (Either8 a b c d e f g h) Source # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h) => Ord (Either8 a b c d e f g h) Source # | |
Defined in Data.Avro.EitherN compare :: Either8 a b c d e f g h -> Either8 a b c d e f g h -> Ordering # (<) :: Either8 a b c d e f g h -> Either8 a b c d e f g h -> Bool # (<=) :: Either8 a b c d e f g h -> Either8 a b c d e f g h -> Bool # (>) :: Either8 a b c d e f g h -> Either8 a b c d e f g h -> Bool # (>=) :: Either8 a b c d e f g h -> Either8 a b c d e f g h -> Bool # max :: Either8 a b c d e f g h -> Either8 a b c d e f g h -> Either8 a b c d e f g h # min :: Either8 a b c d e f g h -> Either8 a b c d e f g h -> Either8 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 (Either8 a b c d e f g h) Source # | |
Generic (Either8 a b c d e f g h) Source # | |
(HasAvroSchema a, HasAvroSchema b, HasAvroSchema c, HasAvroSchema d, HasAvroSchema e, HasAvroSchema f, HasAvroSchema g, HasAvroSchema h) => HasAvroSchema (Either8 a b c d e f g h) Source # | |
(ToAvro a, ToAvro b, ToAvro c, ToAvro d, ToAvro e, ToAvro f, ToAvro g, ToAvro h) => ToAvro (Either8 a b c d e f g h) Source # | |
(FromAvro a, FromAvro b, FromAvro c, FromAvro d, FromAvro e, FromAvro f, FromAvro g, FromAvro h) => FromAvro (Either8 a b c d e f g h) Source # | |
type Rep (Either8 a b c d e f g h) Source # | |
Defined in Data.Avro.EitherN type Rep (Either8 a b c d e f g h) = D1 ('MetaData "Either8" "Data.Avro.EitherN" "avro-0.6.0.0-DoOm2DJah3nIktWo4nyiQe" 'False) (((C1 ('MetaCons "E8_1" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "E8_2" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b))) :+: (C1 ('MetaCons "E8_3" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c)) :+: C1 ('MetaCons "E8_4" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d)))) :+: ((C1 ('MetaCons "E8_5" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e)) :+: C1 ('MetaCons "E8_6" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 f))) :+: (C1 ('MetaCons "E8_7" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 g)) :+: C1 ('MetaCons "E8_8" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 h))))) |
data Either9 a b c d e f g h i Source #
Instances
Bifunctor (Either9 a b c d e f g) Source # | |
Bitraversable (Either9 a b c d e f g) Source # | |
Defined in Data.Avro.EitherN bitraverse :: Applicative f0 => (a0 -> f0 c0) -> (b0 -> f0 d0) -> Either9 a b c d e f g a0 b0 -> f0 (Either9 a b c d e f g c0 d0) # | |
Bifoldable (Either9 a b c d e f g) Source # | |
Defined in Data.Avro.EitherN bifold :: Monoid m => Either9 a b c d e f g m m -> m # bifoldMap :: Monoid m => (a0 -> m) -> (b0 -> m) -> Either9 a b c d e f g a0 b0 -> m # bifoldr :: (a0 -> c0 -> c0) -> (b0 -> c0 -> c0) -> c0 -> Either9 a b c d e f g a0 b0 -> c0 # bifoldl :: (c0 -> a0 -> c0) -> (c0 -> b0 -> c0) -> c0 -> Either9 a b c d e f g a0 b0 -> c0 # | |
Monad (Either9 a b c d e f g h) Source # | |
Functor (Either9 a b c d e f g h) Source # | |
Applicative (Either9 a b c d e f g h) Source # | |
Defined in Data.Avro.EitherN pure :: a0 -> Either9 a b c d e f g h a0 # (<*>) :: Either9 a b c d e f g h (a0 -> b0) -> Either9 a b c d e f g h a0 -> Either9 a b c d e f g h b0 # liftA2 :: (a0 -> b0 -> c0) -> Either9 a b c d e f g h a0 -> Either9 a b c d e f g h b0 -> Either9 a b c d e f g h c0 # (*>) :: Either9 a b c d e f g h a0 -> Either9 a b c d e f g h b0 -> Either9 a b c d e f g h b0 # (<*) :: Either9 a b c d e f g h a0 -> Either9 a b c d e f g h b0 -> Either9 a b c d e f g h a0 # | |
Foldable (Either9 a b c d e f g h) Source # | |
Defined in Data.Avro.EitherN fold :: Monoid m => Either9 a b c d e f g h m -> m # foldMap :: Monoid m => (a0 -> m) -> Either9 a b c d e f g h a0 -> m # foldMap' :: Monoid m => (a0 -> m) -> Either9 a b c d e f g h a0 -> m # foldr :: (a0 -> b0 -> b0) -> b0 -> Either9 a b c d e f g h a0 -> b0 # foldr' :: (a0 -> b0 -> b0) -> b0 -> Either9 a b c d e f g h a0 -> b0 # foldl :: (b0 -> a0 -> b0) -> b0 -> Either9 a b c d e f g h a0 -> b0 # foldl' :: (b0 -> a0 -> b0) -> b0 -> Either9 a b c d e f g h a0 -> b0 # foldr1 :: (a0 -> a0 -> a0) -> Either9 a b c d e f g h a0 -> a0 # foldl1 :: (a0 -> a0 -> a0) -> Either9 a b c d e f g h a0 -> a0 # toList :: Either9 a b c d e f g h a0 -> [a0] # null :: Either9 a b c d e f g h a0 -> Bool # length :: Either9 a b c d e f g h a0 -> Int # elem :: Eq a0 => a0 -> Either9 a b c d e f g h a0 -> Bool # maximum :: Ord a0 => Either9 a b c d e f g h a0 -> a0 # minimum :: Ord a0 => Either9 a b c d e f g h a0 -> a0 # | |
Traversable (Either9 a b c d e f g h) Source # | |
Defined in Data.Avro.EitherN traverse :: Applicative f0 => (a0 -> f0 b0) -> Either9 a b c d e f g h a0 -> f0 (Either9 a b c d e f g h b0) # sequenceA :: Applicative f0 => Either9 a b c d e f g h (f0 a0) -> f0 (Either9 a b c d e f g h a0) # mapM :: Monad m => (a0 -> m b0) -> Either9 a b c d e f g h a0 -> m (Either9 a b c d e f g h b0) # sequence :: Monad m => Either9 a b c d e f g h (m a0) -> m (Either9 a b c d e f g h a0) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i) => Eq (Either9 a b c d e f g h i) Source # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i) => Ord (Either9 a b c d e f g h i) Source # | |
Defined in Data.Avro.EitherN compare :: Either9 a b c d e f g h i -> Either9 a b c d e f g h i -> Ordering # (<) :: Either9 a b c d e f g h i -> Either9 a b c d e f g h i -> Bool # (<=) :: Either9 a b c d e f g h i -> Either9 a b c d e f g h i -> Bool # (>) :: Either9 a b c d e f g h i -> Either9 a b c d e f g h i -> Bool # (>=) :: Either9 a b c d e f g h i -> Either9 a b c d e f g h i -> Bool # max :: Either9 a b c d e f g h i -> Either9 a b c d e f g h i -> Either9 a b c d e f g h i # min :: Either9 a b c d e f g h i -> Either9 a b c d e f g h i -> Either9 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 (Either9 a b c d e f g h i) Source # | |
Generic (Either9 a b c d e f g h i) Source # | |
(HasAvroSchema a, HasAvroSchema b, HasAvroSchema c, HasAvroSchema d, HasAvroSchema e, HasAvroSchema f, HasAvroSchema g, HasAvroSchema h, HasAvroSchema i) => HasAvroSchema (Either9 a b c d e f g h i) Source # | |
(ToAvro a, ToAvro b, ToAvro c, ToAvro d, ToAvro e, ToAvro f, ToAvro g, ToAvro h, ToAvro i) => ToAvro (Either9 a b c d e f g h i) Source # | |
(FromAvro a, FromAvro b, FromAvro c, FromAvro d, FromAvro e, FromAvro f, FromAvro g, FromAvro h, FromAvro i) => FromAvro (Either9 a b c d e f g h i) Source # | |
type Rep (Either9 a b c d e f g h i) Source # | |
Defined in Data.Avro.EitherN type Rep (Either9 a b c d e f g h i) = D1 ('MetaData "Either9" "Data.Avro.EitherN" "avro-0.6.0.0-DoOm2DJah3nIktWo4nyiQe" 'False) (((C1 ('MetaCons "E9_1" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "E9_2" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b))) :+: (C1 ('MetaCons "E9_3" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c)) :+: C1 ('MetaCons "E9_4" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d)))) :+: ((C1 ('MetaCons "E9_5" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e)) :+: C1 ('MetaCons "E9_6" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 f))) :+: (C1 ('MetaCons "E9_7" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 g)) :+: (C1 ('MetaCons "E9_8" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 h)) :+: C1 ('MetaCons "E9_9" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 i)))))) |
data Either10 a b c d e f g h i j Source #
Instances
Bifunctor (Either10 a b c d e f g h) Source # | |
Defined in Data.Avro.EitherN | |
Bitraversable (Either10 a b c d e f g h) Source # | |
Defined in Data.Avro.EitherN bitraverse :: Applicative f0 => (a0 -> f0 c0) -> (b0 -> f0 d0) -> Either10 a b c d e f g h a0 b0 -> f0 (Either10 a b c d e f g h c0 d0) # | |
Bifoldable (Either10 a b c d e f g h) Source # | |
Defined in Data.Avro.EitherN bifold :: Monoid m => Either10 a b c d e f g h m m -> m # bifoldMap :: Monoid m => (a0 -> m) -> (b0 -> m) -> Either10 a b c d e f g h a0 b0 -> m # bifoldr :: (a0 -> c0 -> c0) -> (b0 -> c0 -> c0) -> c0 -> Either10 a b c d e f g h a0 b0 -> c0 # bifoldl :: (c0 -> a0 -> c0) -> (c0 -> b0 -> c0) -> c0 -> Either10 a b c d e f g h a0 b0 -> c0 # | |
Monad (Either10 a b c d e f g h i) Source # | |
Functor (Either10 a b c d e f g h i) Source # | |
Applicative (Either10 a b c d e f g h i) Source # | |
Defined in Data.Avro.EitherN pure :: a0 -> Either10 a b c d e f g h i a0 # (<*>) :: Either10 a b c d e f g h i (a0 -> b0) -> Either10 a b c d e f g h i a0 -> Either10 a b c d e f g h i b0 # liftA2 :: (a0 -> b0 -> c0) -> Either10 a b c d e f g h i a0 -> Either10 a b c d e f g h i b0 -> Either10 a b c d e f g h i c0 # (*>) :: Either10 a b c d e f g h i a0 -> Either10 a b c d e f g h i b0 -> Either10 a b c d e f g h i b0 # (<*) :: Either10 a b c d e f g h i a0 -> Either10 a b c d e f g h i b0 -> Either10 a b c d e f g h i a0 # | |
Foldable (Either10 a b c d e f g h i) Source # | |
Defined in Data.Avro.EitherN fold :: Monoid m => Either10 a b c d e f g h i m -> m # foldMap :: Monoid m => (a0 -> m) -> Either10 a b c d e f g h i a0 -> m # foldMap' :: Monoid m => (a0 -> m) -> Either10 a b c d e f g h i a0 -> m # foldr :: (a0 -> b0 -> b0) -> b0 -> Either10 a b c d e f g h i a0 -> b0 # foldr' :: (a0 -> b0 -> b0) -> b0 -> Either10 a b c d e f g h i a0 -> b0 # foldl :: (b0 -> a0 -> b0) -> b0 -> Either10 a b c d e f g h i a0 -> b0 # foldl' :: (b0 -> a0 -> b0) -> b0 -> Either10 a b c d e f g h i a0 -> b0 # foldr1 :: (a0 -> a0 -> a0) -> Either10 a b c d e f g h i a0 -> a0 # foldl1 :: (a0 -> a0 -> a0) -> Either10 a b c d e f g h i a0 -> a0 # toList :: Either10 a b c d e f g h i a0 -> [a0] # null :: Either10 a b c d e f g h i a0 -> Bool # length :: Either10 a b c d e f g h i a0 -> Int # elem :: Eq a0 => a0 -> Either10 a b c d e f g h i a0 -> Bool # maximum :: Ord a0 => Either10 a b c d e f g h i a0 -> a0 # minimum :: Ord a0 => Either10 a b c d e f g h i a0 -> a0 # | |
Traversable (Either10 a b c d e f g h i) Source # | |
Defined in Data.Avro.EitherN traverse :: Applicative f0 => (a0 -> f0 b0) -> Either10 a b c d e f g h i a0 -> f0 (Either10 a b c d e f g h i b0) # sequenceA :: Applicative f0 => Either10 a b c d e f g h i (f0 a0) -> f0 (Either10 a b c d e f g h i a0) # mapM :: Monad m => (a0 -> m b0) -> Either10 a b c d e f g h i a0 -> m (Either10 a b c d e f g h i b0) # sequence :: Monad m => Either10 a b c d e f g h i (m a0) -> m (Either10 a b c d e f g h i a0) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j) => Eq (Either10 a b c d e f g h i j) Source # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j) => Ord (Either10 a b c d e f g h i j) Source # | |
Defined in Data.Avro.EitherN compare :: Either10 a b c d e f g h i j -> Either10 a b c d e f g h i j -> Ordering # (<) :: Either10 a b c d e f g h i j -> Either10 a b c d e f g h i j -> Bool # (<=) :: Either10 a b c d e f g h i j -> Either10 a b c d e f g h i j -> Bool # (>) :: Either10 a b c d e f g h i j -> Either10 a b c d e f g h i j -> Bool # (>=) :: Either10 a b c d e f g h i j -> Either10 a b c d e f g h i j -> Bool # max :: Either10 a b c d e f g h i j -> Either10 a b c d e f g h i j -> Either10 a b c d e f g h i j # min :: Either10 a b c d e f g h i j -> Either10 a b c d e f g h i j -> Either10 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 (Either10 a b c d e f g h i j) Source # | |
Generic (Either10 a b c d e f g h i j) Source # | |
(HasAvroSchema a, HasAvroSchema b, HasAvroSchema c, HasAvroSchema d, HasAvroSchema e, HasAvroSchema f, HasAvroSchema g, HasAvroSchema h, HasAvroSchema i, HasAvroSchema j) => HasAvroSchema (Either10 a b c d e f g h i j) Source # | |
(ToAvro a, ToAvro b, ToAvro c, ToAvro d, ToAvro e, ToAvro f, ToAvro g, ToAvro h, ToAvro i, ToAvro j) => ToAvro (Either10 a b c d e f g h i j) Source # | |
(FromAvro a, FromAvro b, FromAvro c, FromAvro d, FromAvro e, FromAvro f, FromAvro g, FromAvro h, FromAvro i, FromAvro j) => FromAvro (Either10 a b c d e f g h i j) Source # | |
type Rep (Either10 a b c d e f g h i j) Source # | |
Defined in Data.Avro.EitherN type Rep (Either10 a b c d e f g h i j) = D1 ('MetaData "Either10" "Data.Avro.EitherN" "avro-0.6.0.0-DoOm2DJah3nIktWo4nyiQe" 'False) (((C1 ('MetaCons "E10_1" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "E10_2" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b))) :+: (C1 ('MetaCons "E10_3" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c)) :+: (C1 ('MetaCons "E10_4" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d)) :+: C1 ('MetaCons "E10_5" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e))))) :+: ((C1 ('MetaCons "E10_6" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 f)) :+: C1 ('MetaCons "E10_7" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 g))) :+: (C1 ('MetaCons "E10_8" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 h)) :+: (C1 ('MetaCons "E10_9" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 i)) :+: C1 ('MetaCons "E10_10" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 j)))))) |