avro-0.5.0.0: Avro serialization support for Haskell

Safe HaskellNone
LanguageHaskell2010

Data.Avro.EitherN

Documentation

data Either3 a b c Source #

Constructors

E3_1 a 
E3_2 b 
E3_3 c 
Instances
Bitraversable (Either3 a) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

bitraverse :: Applicative f => (a0 -> f c) -> (b -> f d) -> Either3 a a0 b -> f (Either3 a c d) #

Bifoldable (Either3 a) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

bifold :: Monoid m => Either3 a m m -> m #

bifoldMap :: Monoid m => (a0 -> m) -> (b -> m) -> Either3 a a0 b -> m #

bifoldr :: (a0 -> c -> c) -> (b -> c -> c) -> c -> Either3 a a0 b -> c #

bifoldl :: (c -> a0 -> c) -> (c -> b -> c) -> c -> Either3 a a0 b -> c #

Bifunctor (Either3 a) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

bimap :: (a0 -> b) -> (c -> d) -> Either3 a a0 c -> Either3 a b d #

first :: (a0 -> b) -> Either3 a a0 c -> Either3 a b c #

second :: (b -> c) -> Either3 a a0 b -> Either3 a a0 c #

Monad (Either3 a b) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

(>>=) :: Either3 a b a0 -> (a0 -> Either3 a b b0) -> Either3 a b b0 #

(>>) :: Either3 a b a0 -> Either3 a b b0 -> Either3 a b b0 #

return :: a0 -> Either3 a b a0 #

fail :: String -> Either3 a b a0 #

Functor (Either3 a b) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

fmap :: (a0 -> b0) -> Either3 a b a0 -> Either3 a b b0 #

(<$) :: a0 -> Either3 a b b0 -> Either3 a b a0 #

Applicative (Either3 a b) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

pure :: a0 -> Either3 a b a0 #

(<*>) :: Either3 a b (a0 -> b0) -> Either3 a b a0 -> Either3 a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Either3 a b a0 -> Either3 a b b0 -> Either3 a b c #

(*>) :: Either3 a b a0 -> Either3 a b b0 -> Either3 a b b0 #

(<*) :: Either3 a b a0 -> Either3 a b b0 -> Either3 a b a0 #

Foldable (Either3 a b) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

fold :: Monoid m => Either3 a b m -> m #

foldMap :: Monoid m => (a0 -> m) -> Either3 a b a0 -> m #

foldr :: (a0 -> b0 -> b0) -> b0 -> Either3 a b a0 -> b0 #

foldr' :: (a0 -> b0 -> b0) -> b0 -> Either3 a b a0 -> b0 #

foldl :: (b0 -> a0 -> b0) -> b0 -> Either3 a b a0 -> b0 #

foldl' :: (b0 -> a0 -> b0) -> b0 -> Either3 a b a0 -> b0 #

foldr1 :: (a0 -> a0 -> a0) -> Either3 a b a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Either3 a b a0 -> a0 #

toList :: Either3 a b a0 -> [a0] #

null :: Either3 a b a0 -> Bool #

length :: Either3 a b a0 -> Int #

elem :: Eq a0 => a0 -> Either3 a b a0 -> Bool #

maximum :: Ord a0 => Either3 a b a0 -> a0 #

minimum :: Ord a0 => Either3 a b a0 -> a0 #

sum :: Num a0 => Either3 a b a0 -> a0 #

product :: Num a0 => Either3 a b a0 -> a0 #

Traversable (Either3 a b) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

traverse :: Applicative f => (a0 -> f b0) -> Either3 a b a0 -> f (Either3 a b b0) #

sequenceA :: Applicative f => Either3 a b (f a0) -> f (Either3 a b a0) #

mapM :: Monad m => (a0 -> m b0) -> Either3 a b a0 -> m (Either3 a b b0) #

sequence :: Monad m => Either3 a b (m a0) -> m (Either3 a b a0) #

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

Defined in Data.Avro.EitherN

Methods

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

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

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

Defined in Data.Avro.EitherN

Methods

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

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

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

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

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

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

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

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

Defined in Data.Avro.EitherN

Methods

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

show :: Either3 a b c -> String #

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

Generic (Either3 a b c) Source # 
Instance details

Defined in Data.Avro.EitherN

Associated Types

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

Methods

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

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

(HasAvroSchema a, HasAvroSchema b, HasAvroSchema c) => HasAvroSchema (Either3 a b c) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

schema :: Tagged (Either3 a b c) Schema Source #

(ToAvro a, ToAvro b, ToAvro c) => ToAvro (Either3 a b c) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

toAvro :: Schema -> Either3 a b c -> Builder Source #

(FromAvro a, FromAvro b, FromAvro c) => FromAvro (Either3 a b c) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

fromAvro :: Value -> Either String (Either3 a b c) Source #

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

Defined in Data.Avro.EitherN

data Either4 a b c d Source #

Constructors

E4_1 a 
E4_2 b 
E4_3 c 
E4_4 d 
Instances
Bitraversable (Either4 a b) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

bifold :: Monoid m => Either4 a b m m -> m #

bifoldMap :: Monoid m => (a0 -> m) -> (b0 -> m) -> Either4 a b a0 b0 -> m #

bifoldr :: (a0 -> c -> c) -> (b0 -> c -> c) -> c -> Either4 a b a0 b0 -> c #

bifoldl :: (c -> a0 -> c) -> (c -> b0 -> c) -> c -> Either4 a b a0 b0 -> c #

Bifunctor (Either4 a b) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

bimap :: (a0 -> b0) -> (c -> d) -> Either4 a b a0 c -> Either4 a b b0 d #

first :: (a0 -> b0) -> Either4 a b a0 c -> Either4 a b b0 c #

second :: (b0 -> c) -> Either4 a b a0 b0 -> Either4 a b a0 c #

Monad (Either4 a b c) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

(>>=) :: Either4 a b c a0 -> (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 b0 #

return :: a0 -> Either4 a b c a0 #

fail :: String -> Either4 a b c a0 #

Functor (Either4 a b c) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

fmap :: (a0 -> b0) -> Either4 a b c a0 -> Either4 a b c b0 #

(<$) :: a0 -> Either4 a b c b0 -> Either4 a b c a0 #

Applicative (Either4 a b c) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

fold :: Monoid m => Either4 a b c m -> 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 #

sum :: Num a0 => Either4 a b c a0 -> a0 #

product :: Num a0 => Either4 a b c a0 -> a0 #

Traversable (Either4 a b c) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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

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

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

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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

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

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

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

Defined in Data.Avro.EitherN

Associated Types

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

Methods

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

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

(HasAvroSchema a, HasAvroSchema b, HasAvroSchema c, HasAvroSchema d) => HasAvroSchema (Either4 a b c d) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

schema :: Tagged (Either4 a b c d) Schema Source #

(ToAvro a, ToAvro b, ToAvro c, ToAvro d) => ToAvro (Either4 a b c d) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

toAvro :: Schema -> Either4 a b c d -> Builder Source #

(FromAvro a, FromAvro b, FromAvro c, FromAvro d) => FromAvro (Either4 a b c d) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

fromAvro :: Value -> Either String (Either4 a b c d) Source #

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

Defined in Data.Avro.EitherN

data Either5 a b c d e Source #

Constructors

E5_1 a 
E5_2 b 
E5_3 c 
E5_4 d 
E5_5 e 
Instances
Bitraversable (Either5 a b c) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

bifold :: Monoid m => Either5 a b c m m -> m #

bifoldMap :: Monoid m => (a0 -> m) -> (b0 -> m) -> Either5 a b c a0 b0 -> m #

bifoldr :: (a0 -> c0 -> c0) -> (b0 -> c0 -> c0) -> c0 -> Either5 a b c a0 b0 -> c0 #

bifoldl :: (c0 -> a0 -> c0) -> (c0 -> b0 -> c0) -> c0 -> Either5 a b c a0 b0 -> c0 #

Bifunctor (Either5 a b c) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

bimap :: (a0 -> b0) -> (c0 -> d) -> Either5 a b c a0 c0 -> Either5 a b c b0 d #

first :: (a0 -> b0) -> Either5 a b c a0 c0 -> Either5 a b c b0 c0 #

second :: (b0 -> c0) -> Either5 a b c a0 b0 -> Either5 a b c a0 c0 #

Monad (Either5 a b c d) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

(>>=) :: Either5 a b c d a0 -> (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 b0 #

return :: a0 -> Either5 a b c d a0 #

fail :: String -> Either5 a b c d a0 #

Functor (Either5 a b c d) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

fmap :: (a0 -> b0) -> Either5 a b c d a0 -> Either5 a b c d b0 #

(<$) :: a0 -> Either5 a b c d b0 -> Either5 a b c d a0 #

Applicative (Either5 a b c d) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

fold :: Monoid m => Either5 a b c d m -> 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 #

sum :: Num a0 => Either5 a b c d a0 -> a0 #

product :: Num a0 => Either5 a b c d a0 -> a0 #

Traversable (Either5 a b c d) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

(==) :: 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 #

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

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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

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

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

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

Defined in Data.Avro.EitherN

Associated Types

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

Methods

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

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

(HasAvroSchema a, HasAvroSchema b, HasAvroSchema c, HasAvroSchema d, HasAvroSchema e) => HasAvroSchema (Either5 a b c d e) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

schema :: Tagged (Either5 a b c d e) Schema Source #

(ToAvro a, ToAvro b, ToAvro c, ToAvro d, ToAvro e) => ToAvro (Either5 a b c d e) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

toAvro :: Schema -> Either5 a b c d e -> Builder Source #

(FromAvro a, FromAvro b, FromAvro c, FromAvro d, FromAvro e) => FromAvro (Either5 a b c d e) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

fromAvro :: Value -> Either String (Either5 a b c d e) Source #

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

Defined in Data.Avro.EitherN

data Either6 a b c d e f Source #

Constructors

E6_1 a 
E6_2 b 
E6_3 c 
E6_4 d 
E6_5 e 
E6_6 f 
Instances
Bitraversable (Either6 a b c d) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

bifold :: Monoid m => Either6 a b c d m m -> m #

bifoldMap :: Monoid m => (a0 -> m) -> (b0 -> m) -> Either6 a b c d a0 b0 -> m #

bifoldr :: (a0 -> c0 -> c0) -> (b0 -> c0 -> c0) -> c0 -> Either6 a b c d a0 b0 -> c0 #

bifoldl :: (c0 -> a0 -> c0) -> (c0 -> b0 -> c0) -> c0 -> Either6 a b c d a0 b0 -> c0 #

Bifunctor (Either6 a b c d) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

bimap :: (a0 -> b0) -> (c0 -> d0) -> Either6 a b c d a0 c0 -> Either6 a b c d b0 d0 #

first :: (a0 -> b0) -> Either6 a b c d a0 c0 -> Either6 a b c d b0 c0 #

second :: (b0 -> c0) -> Either6 a b c d a0 b0 -> Either6 a b c d a0 c0 #

Monad (Either6 a b c d e) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

(>>=) :: Either6 a b c d e a0 -> (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 b0 #

return :: a0 -> Either6 a b c d e a0 #

fail :: String -> Either6 a b c d e a0 #

Functor (Either6 a b c d e) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

fmap :: (a0 -> b0) -> Either6 a b c d e a0 -> Either6 a b c d e b0 #

(<$) :: a0 -> Either6 a b c d e b0 -> Either6 a b c d e a0 #

Applicative (Either6 a b c d e) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

fold :: Monoid m => Either6 a b c d e m -> 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 #

sum :: Num a0 => Either6 a b c d e a0 -> a0 #

product :: Num a0 => Either6 a b c d e a0 -> a0 #

Traversable (Either6 a b c d e) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

(==) :: 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 #

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

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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

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

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

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

Defined in Data.Avro.EitherN

Associated Types

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

Methods

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

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

(HasAvroSchema a, HasAvroSchema b, HasAvroSchema c, HasAvroSchema d, HasAvroSchema e, HasAvroSchema f) => HasAvroSchema (Either6 a b c d e f) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

schema :: Tagged (Either6 a b c d e f) Schema Source #

(ToAvro a, ToAvro b, ToAvro c, ToAvro d, ToAvro e, ToAvro f) => ToAvro (Either6 a b c d e f) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

toAvro :: Schema -> Either6 a b c d e f -> Builder Source #

(FromAvro a, FromAvro b, FromAvro c, FromAvro d, FromAvro e, FromAvro f) => FromAvro (Either6 a b c d e f) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

fromAvro :: Value -> Either String (Either6 a b c d e f) Source #

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

Defined in Data.Avro.EitherN

data Either7 a b c d e f g Source #

Constructors

E7_1 a 
E7_2 b 
E7_3 c 
E7_4 d 
E7_5 e 
E7_6 f 
E7_7 g 
Instances
Bitraversable (Either7 a b c d e) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 #

Bifunctor (Either7 a b c d e) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

bimap :: (a0 -> b0) -> (c0 -> d0) -> Either7 a b c d e a0 c0 -> Either7 a b c d e b0 d0 #

first :: (a0 -> b0) -> Either7 a b c d e a0 c0 -> Either7 a b c d e b0 c0 #

second :: (b0 -> c0) -> Either7 a b c d e a0 b0 -> Either7 a b c d e a0 c0 #

Monad (Either7 a b c d e f) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

(>>=) :: Either7 a b c d e f a0 -> (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 b0 #

return :: a0 -> Either7 a b c d e f a0 #

fail :: String -> Either7 a b c d e f a0 #

Functor (Either7 a b c d e f) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

fmap :: (a0 -> b0) -> Either7 a b c d e f a0 -> Either7 a b c d e f b0 #

(<$) :: a0 -> Either7 a b c d e f b0 -> Either7 a b c d e f a0 #

Applicative (Either7 a b c d e f) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 #

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 #

sum :: Num a0 => Either7 a b c d e f a0 -> a0 #

product :: Num a0 => Either7 a b c d e f a0 -> a0 #

Traversable (Either7 a b c d e f) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

(==) :: 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 #

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

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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

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

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

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

Defined in Data.Avro.EitherN

Associated Types

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

Methods

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

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

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

Defined in Data.Avro.EitherN

Methods

schema :: Tagged (Either7 a b c d e f g) Schema 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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

toAvro :: Schema -> Either7 a b c d e f g -> Builder 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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

fromAvro :: Value -> Either String (Either7 a b c d e f g) Source #

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

Defined in Data.Avro.EitherN

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

Constructors

E8_1 a 
E8_2 b 
E8_3 c 
E8_4 d 
E8_5 e 
E8_6 f 
E8_7 g 
E8_8 h 
Instances
Bitraversable (Either8 a b c d e f) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 #

Bifunctor (Either8 a b c d e f) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

bimap :: (a0 -> b0) -> (c0 -> d0) -> Either8 a b c d e f a0 c0 -> Either8 a b c d e f b0 d0 #

first :: (a0 -> b0) -> Either8 a b c d e f a0 c0 -> Either8 a b c d e f b0 c0 #

second :: (b0 -> c0) -> Either8 a b c d e f a0 b0 -> Either8 a b c d e f a0 c0 #

Monad (Either8 a b c d e f g) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

(>>=) :: Either8 a b c d e f g a0 -> (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 b0 #

return :: a0 -> Either8 a b c d e f g a0 #

fail :: String -> Either8 a b c d e f g a0 #

Functor (Either8 a b c d e f g) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

fmap :: (a0 -> b0) -> Either8 a b c d e f g a0 -> Either8 a b c d e f g b0 #

(<$) :: a0 -> Either8 a b c d e f g b0 -> Either8 a b c d e f g a0 #

Applicative (Either8 a b c d e f g) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 #

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 #

sum :: Num a0 => Either8 a b c d e f g a0 -> a0 #

product :: Num a0 => Either8 a b c d e f g a0 -> a0 #

Traversable (Either8 a b c d e f g) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

(==) :: 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 #

(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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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

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

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

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

Defined in Data.Avro.EitherN

Associated Types

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

Methods

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

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

(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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

schema :: Tagged (Either8 a b c d e f g h) Schema 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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

toAvro :: Schema -> Either8 a b c d e f g h -> Builder 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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

fromAvro :: Value -> Either String (Either8 a b c d e f g h) Source #

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

Defined in Data.Avro.EitherN

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

Constructors

E9_1 a 
E9_2 b 
E9_3 c 
E9_4 d 
E9_5 e 
E9_6 f 
E9_7 g 
E9_8 h 
E9_9 i 
Instances
Bitraversable (Either9 a b c d e f g) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 #

Bifunctor (Either9 a b c d e f g) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

bimap :: (a0 -> b0) -> (c0 -> d0) -> Either9 a b c d e f g a0 c0 -> Either9 a b c d e f g b0 d0 #

first :: (a0 -> b0) -> Either9 a b c d e f g a0 c0 -> Either9 a b c d e f g b0 c0 #

second :: (b0 -> c0) -> Either9 a b c d e f g a0 b0 -> Either9 a b c d e f g a0 c0 #

Monad (Either9 a b c d e f g h) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

(>>=) :: Either9 a b c d e f g h a0 -> (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 b0 #

return :: a0 -> Either9 a b c d e f g h a0 #

fail :: String -> Either9 a b c d e f g h a0 #

Functor (Either9 a b c d e f g h) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

fmap :: (a0 -> b0) -> Either9 a b c d e f g h a0 -> Either9 a b c d e f g h b0 #

(<$) :: a0 -> Either9 a b c d e f g h b0 -> Either9 a b c d e f g h a0 #

Applicative (Either9 a b c d e f g h) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 #

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 #

sum :: Num a0 => Either9 a b c d e f g h a0 -> a0 #

product :: Num a0 => Either9 a b c d e f g h a0 -> a0 #

Traversable (Either9 a b c d e f g h) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

(==) :: 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 #

(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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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

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

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

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

Defined in Data.Avro.EitherN

Associated Types

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

Methods

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

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

(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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

schema :: Tagged (Either9 a b c d e f g h i) Schema 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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

toAvro :: Schema -> Either9 a b c d e f g h i -> Builder 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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

fromAvro :: Value -> Either String (Either9 a b c d e f g h i) Source #

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

Defined in Data.Avro.EitherN

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

Constructors

E10_1 a 
E10_2 b 
E10_3 c 
E10_4 d 
E10_5 e 
E10_6 f 
E10_7 g 
E10_8 h 
E10_9 i 
E10_10 j 
Instances
Bitraversable (Either10 a b c d e f g h) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 #

Bifunctor (Either10 a b c d e f g h) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

bimap :: (a0 -> b0) -> (c0 -> d0) -> Either10 a b c d e f g h a0 c0 -> Either10 a b c d e f g h b0 d0 #

first :: (a0 -> b0) -> Either10 a b c d e f g h a0 c0 -> Either10 a b c d e f g h b0 c0 #

second :: (b0 -> c0) -> Either10 a b c d e f g h a0 b0 -> Either10 a b c d e f g h a0 c0 #

Monad (Either10 a b c d e f g h i) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

(>>=) :: Either10 a b c d e f g h i a0 -> (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 b0 #

return :: a0 -> Either10 a b c d e f g h i a0 #

fail :: String -> Either10 a b c d e f g h i a0 #

Functor (Either10 a b c d e f g h i) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

fmap :: (a0 -> b0) -> Either10 a b c d e f g h i a0 -> Either10 a b c d e f g h i b0 #

(<$) :: a0 -> Either10 a b c d e f g h i b0 -> Either10 a b c d e f g h i a0 #

Applicative (Either10 a b c d e f g h i) Source # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 #

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 #

sum :: Num a0 => Either10 a b c d e f g h i a0 -> a0 #

product :: Num 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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

(==) :: 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 #

(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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

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

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

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

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

Defined in Data.Avro.EitherN

Associated Types

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

Methods

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

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

(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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

schema :: Tagged (Either10 a b c d e f g h i j) Schema 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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

toAvro :: Schema -> Either10 a b c d e f g h i j -> Builder 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 # 
Instance details

Defined in Data.Avro.EitherN

Methods

fromAvro :: Value -> Either String (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 # 
Instance details

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.5.0.0-ABb84txpWbVKoJAyfnf0Rs" 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))))))