{-# LANGUAGE BangPatterns, DeriveDataTypeable, DeriveGeneric, FlexibleInstances, MultiParamTypeClasses, OverloadedStrings #-}
{-# OPTIONS_GHC  -w #-}
module Text.DescriptorProtos.EnumValueDescriptorProto (EnumValueDescriptorProto(..)) where
import Prelude ((+), (/), (++), (.))
import qualified Prelude as Prelude'
import qualified Data.List as Prelude'
import qualified Data.Typeable as Prelude'
import qualified GHC.Generics as Prelude'
import qualified Data.Data as Prelude'
import qualified Text.ProtocolBuffers.Header as P'
import qualified Text.DescriptorProtos.EnumValueOptions as DescriptorProtos (EnumValueOptions)

data EnumValueDescriptorProto = EnumValueDescriptorProto{EnumValueDescriptorProto -> Maybe Utf8
name :: !(P'.Maybe P'.Utf8), EnumValueDescriptorProto -> Maybe Int32
number :: !(P'.Maybe P'.Int32),
                                                         EnumValueDescriptorProto -> Maybe EnumValueOptions
options :: !(P'.Maybe DescriptorProtos.EnumValueOptions),
                                                         EnumValueDescriptorProto -> UnknownField
unknown'field :: !(P'.UnknownField)}
                                deriving (Int -> EnumValueDescriptorProto -> ShowS
[EnumValueDescriptorProto] -> ShowS
EnumValueDescriptorProto -> String
(Int -> EnumValueDescriptorProto -> ShowS)
-> (EnumValueDescriptorProto -> String)
-> ([EnumValueDescriptorProto] -> ShowS)
-> Show EnumValueDescriptorProto
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [EnumValueDescriptorProto] -> ShowS
$cshowList :: [EnumValueDescriptorProto] -> ShowS
show :: EnumValueDescriptorProto -> String
$cshow :: EnumValueDescriptorProto -> String
showsPrec :: Int -> EnumValueDescriptorProto -> ShowS
$cshowsPrec :: Int -> EnumValueDescriptorProto -> ShowS
Prelude'.Show, EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool
(EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool)
-> (EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool)
-> Eq EnumValueDescriptorProto
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool
$c/= :: EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool
== :: EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool
$c== :: EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool
Prelude'.Eq, Eq EnumValueDescriptorProto
Eq EnumValueDescriptorProto
-> (EnumValueDescriptorProto
    -> EnumValueDescriptorProto -> Ordering)
-> (EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool)
-> (EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool)
-> (EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool)
-> (EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool)
-> (EnumValueDescriptorProto
    -> EnumValueDescriptorProto -> EnumValueDescriptorProto)
-> (EnumValueDescriptorProto
    -> EnumValueDescriptorProto -> EnumValueDescriptorProto)
-> Ord EnumValueDescriptorProto
EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool
EnumValueDescriptorProto -> EnumValueDescriptorProto -> Ordering
EnumValueDescriptorProto
-> EnumValueDescriptorProto -> EnumValueDescriptorProto
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: EnumValueDescriptorProto
-> EnumValueDescriptorProto -> EnumValueDescriptorProto
$cmin :: EnumValueDescriptorProto
-> EnumValueDescriptorProto -> EnumValueDescriptorProto
max :: EnumValueDescriptorProto
-> EnumValueDescriptorProto -> EnumValueDescriptorProto
$cmax :: EnumValueDescriptorProto
-> EnumValueDescriptorProto -> EnumValueDescriptorProto
>= :: EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool
$c>= :: EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool
> :: EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool
$c> :: EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool
<= :: EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool
$c<= :: EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool
< :: EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool
$c< :: EnumValueDescriptorProto -> EnumValueDescriptorProto -> Bool
compare :: EnumValueDescriptorProto -> EnumValueDescriptorProto -> Ordering
$ccompare :: EnumValueDescriptorProto -> EnumValueDescriptorProto -> Ordering
$cp1Ord :: Eq EnumValueDescriptorProto
Prelude'.Ord, Prelude'.Typeable, Typeable EnumValueDescriptorProto
DataType
Constr
Typeable EnumValueDescriptorProto
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> EnumValueDescriptorProto
    -> c EnumValueDescriptorProto)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c EnumValueDescriptorProto)
-> (EnumValueDescriptorProto -> Constr)
-> (EnumValueDescriptorProto -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d))
    -> Maybe (c EnumValueDescriptorProto))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c EnumValueDescriptorProto))
-> ((forall b. Data b => b -> b)
    -> EnumValueDescriptorProto -> EnumValueDescriptorProto)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> EnumValueDescriptorProto
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> EnumValueDescriptorProto
    -> r)
-> (forall u.
    (forall d. Data d => d -> u) -> EnumValueDescriptorProto -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u) -> EnumValueDescriptorProto -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> EnumValueDescriptorProto -> m EnumValueDescriptorProto)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> EnumValueDescriptorProto -> m EnumValueDescriptorProto)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> EnumValueDescriptorProto -> m EnumValueDescriptorProto)
-> Data EnumValueDescriptorProto
EnumValueDescriptorProto -> DataType
EnumValueDescriptorProto -> Constr
(forall b. Data b => b -> b)
-> EnumValueDescriptorProto -> EnumValueDescriptorProto
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> EnumValueDescriptorProto
-> c EnumValueDescriptorProto
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c EnumValueDescriptorProto
forall a.
Typeable a
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
    (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
    (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int
-> (forall d. Data d => d -> u) -> EnumValueDescriptorProto -> u
forall u.
(forall d. Data d => d -> u) -> EnumValueDescriptorProto -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> EnumValueDescriptorProto
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> EnumValueDescriptorProto
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> EnumValueDescriptorProto -> m EnumValueDescriptorProto
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> EnumValueDescriptorProto -> m EnumValueDescriptorProto
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c EnumValueDescriptorProto
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> EnumValueDescriptorProto
-> c EnumValueDescriptorProto
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c EnumValueDescriptorProto)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c EnumValueDescriptorProto)
$cEnumValueDescriptorProto :: Constr
$tEnumValueDescriptorProto :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> EnumValueDescriptorProto -> m EnumValueDescriptorProto
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> EnumValueDescriptorProto -> m EnumValueDescriptorProto
gmapMp :: (forall d. Data d => d -> m d)
-> EnumValueDescriptorProto -> m EnumValueDescriptorProto
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> EnumValueDescriptorProto -> m EnumValueDescriptorProto
gmapM :: (forall d. Data d => d -> m d)
-> EnumValueDescriptorProto -> m EnumValueDescriptorProto
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> EnumValueDescriptorProto -> m EnumValueDescriptorProto
gmapQi :: Int
-> (forall d. Data d => d -> u) -> EnumValueDescriptorProto -> u
$cgmapQi :: forall u.
Int
-> (forall d. Data d => d -> u) -> EnumValueDescriptorProto -> u
gmapQ :: (forall d. Data d => d -> u) -> EnumValueDescriptorProto -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u) -> EnumValueDescriptorProto -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> EnumValueDescriptorProto
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> EnumValueDescriptorProto
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> EnumValueDescriptorProto
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> EnumValueDescriptorProto
-> r
gmapT :: (forall b. Data b => b -> b)
-> EnumValueDescriptorProto -> EnumValueDescriptorProto
$cgmapT :: (forall b. Data b => b -> b)
-> EnumValueDescriptorProto -> EnumValueDescriptorProto
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c EnumValueDescriptorProto)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c EnumValueDescriptorProto)
dataCast1 :: (forall d. Data d => c (t d)) -> Maybe (c EnumValueDescriptorProto)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c EnumValueDescriptorProto)
dataTypeOf :: EnumValueDescriptorProto -> DataType
$cdataTypeOf :: EnumValueDescriptorProto -> DataType
toConstr :: EnumValueDescriptorProto -> Constr
$ctoConstr :: EnumValueDescriptorProto -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c EnumValueDescriptorProto
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c EnumValueDescriptorProto
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> EnumValueDescriptorProto
-> c EnumValueDescriptorProto
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> EnumValueDescriptorProto
-> c EnumValueDescriptorProto
$cp1Data :: Typeable EnumValueDescriptorProto
Prelude'.Data,
                                          (forall x.
 EnumValueDescriptorProto -> Rep EnumValueDescriptorProto x)
-> (forall x.
    Rep EnumValueDescriptorProto x -> EnumValueDescriptorProto)
-> Generic EnumValueDescriptorProto
forall x.
Rep EnumValueDescriptorProto x -> EnumValueDescriptorProto
forall x.
EnumValueDescriptorProto -> Rep EnumValueDescriptorProto x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep EnumValueDescriptorProto x -> EnumValueDescriptorProto
$cfrom :: forall x.
EnumValueDescriptorProto -> Rep EnumValueDescriptorProto x
Prelude'.Generic)

instance P'.UnknownMessage EnumValueDescriptorProto where
  getUnknownField :: EnumValueDescriptorProto -> UnknownField
getUnknownField = EnumValueDescriptorProto -> UnknownField
unknown'field
  putUnknownField :: UnknownField
-> EnumValueDescriptorProto -> EnumValueDescriptorProto
putUnknownField UnknownField
u'f EnumValueDescriptorProto
msg = EnumValueDescriptorProto
msg{unknown'field :: UnknownField
unknown'field = UnknownField
u'f}

instance P'.Mergeable EnumValueDescriptorProto where
  mergeAppend :: EnumValueDescriptorProto
-> EnumValueDescriptorProto -> EnumValueDescriptorProto
mergeAppend (EnumValueDescriptorProto Maybe Utf8
x'1 Maybe Int32
x'2 Maybe EnumValueOptions
x'3 UnknownField
x'4) (EnumValueDescriptorProto Maybe Utf8
y'1 Maybe Int32
y'2 Maybe EnumValueOptions
y'3 UnknownField
y'4)
   = let !z'1 :: Maybe Utf8
z'1 = Maybe Utf8 -> Maybe Utf8 -> Maybe Utf8
forall a. Mergeable a => a -> a -> a
P'.mergeAppend Maybe Utf8
x'1 Maybe Utf8
y'1
         !z'2 :: Maybe Int32
z'2 = Maybe Int32 -> Maybe Int32 -> Maybe Int32
forall a. Mergeable a => a -> a -> a
P'.mergeAppend Maybe Int32
x'2 Maybe Int32
y'2
         !z'3 :: Maybe EnumValueOptions
z'3 = Maybe EnumValueOptions
-> Maybe EnumValueOptions -> Maybe EnumValueOptions
forall a. Mergeable a => a -> a -> a
P'.mergeAppend Maybe EnumValueOptions
x'3 Maybe EnumValueOptions
y'3
         !z'4 :: UnknownField
z'4 = UnknownField -> UnknownField -> UnknownField
forall a. Mergeable a => a -> a -> a
P'.mergeAppend UnknownField
x'4 UnknownField
y'4
      in Maybe Utf8
-> Maybe Int32
-> Maybe EnumValueOptions
-> UnknownField
-> EnumValueDescriptorProto
EnumValueDescriptorProto Maybe Utf8
z'1 Maybe Int32
z'2 Maybe EnumValueOptions
z'3 UnknownField
z'4

instance P'.Default EnumValueDescriptorProto where
  defaultValue :: EnumValueDescriptorProto
defaultValue = Maybe Utf8
-> Maybe Int32
-> Maybe EnumValueOptions
-> UnknownField
-> EnumValueDescriptorProto
EnumValueDescriptorProto Maybe Utf8
forall a. Default a => a
P'.defaultValue Maybe Int32
forall a. Default a => a
P'.defaultValue Maybe EnumValueOptions
forall a. Default a => a
P'.defaultValue UnknownField
forall a. Default a => a
P'.defaultValue

instance P'.Wire EnumValueDescriptorProto where
  wireSize :: FieldType -> EnumValueDescriptorProto -> WireSize
wireSize FieldType
ft' self' :: EnumValueDescriptorProto
self'@(EnumValueDescriptorProto Maybe Utf8
x'1 Maybe Int32
x'2 Maybe EnumValueOptions
x'3 UnknownField
x'4)
   = case FieldType
ft' of
       FieldType
10 -> WireSize
calc'Size
       FieldType
11 -> WireSize -> WireSize
P'.prependMessageSize WireSize
calc'Size
       FieldType
_ -> FieldType -> EnumValueDescriptorProto -> WireSize
forall a. Typeable a => FieldType -> a -> WireSize
P'.wireSizeErr FieldType
ft' EnumValueDescriptorProto
self'
    where
        calc'Size :: WireSize
calc'Size = (WireSize -> FieldType -> Maybe Utf8 -> WireSize
forall v. Wire v => WireSize -> FieldType -> Maybe v -> WireSize
P'.wireSizeOpt WireSize
1 FieldType
9 Maybe Utf8
x'1 WireSize -> WireSize -> WireSize
forall a. Num a => a -> a -> a
+ WireSize -> FieldType -> Maybe Int32 -> WireSize
forall v. Wire v => WireSize -> FieldType -> Maybe v -> WireSize
P'.wireSizeOpt WireSize
1 FieldType
5 Maybe Int32
x'2 WireSize -> WireSize -> WireSize
forall a. Num a => a -> a -> a
+ WireSize -> FieldType -> Maybe EnumValueOptions -> WireSize
forall v. Wire v => WireSize -> FieldType -> Maybe v -> WireSize
P'.wireSizeOpt WireSize
1 FieldType
11 Maybe EnumValueOptions
x'3 WireSize -> WireSize -> WireSize
forall a. Num a => a -> a -> a
+ UnknownField -> WireSize
P'.wireSizeUnknownField UnknownField
x'4)
  wirePutWithSize :: FieldType -> EnumValueDescriptorProto -> PutM WireSize
wirePutWithSize FieldType
ft' self' :: EnumValueDescriptorProto
self'@(EnumValueDescriptorProto Maybe Utf8
x'1 Maybe Int32
x'2 Maybe EnumValueOptions
x'3 UnknownField
x'4)
   = case FieldType
ft' of
       FieldType
10 -> PutM WireSize
put'Fields
       FieldType
11 -> PutM WireSize
put'FieldsSized
       FieldType
_ -> FieldType -> EnumValueDescriptorProto -> PutM WireSize
forall a b. Typeable a => FieldType -> a -> PutM b
P'.wirePutErr FieldType
ft' EnumValueDescriptorProto
self'
    where
        put'Fields :: PutM WireSize
put'Fields
         = [PutM WireSize] -> PutM WireSize
forall (f :: * -> *).
Foldable f =>
f (PutM WireSize) -> PutM WireSize
P'.sequencePutWithSize
            [WireTag -> FieldType -> Maybe Utf8 -> PutM WireSize
forall v.
Wire v =>
WireTag -> FieldType -> Maybe v -> PutM WireSize
P'.wirePutOptWithSize WireTag
10 FieldType
9 Maybe Utf8
x'1, WireTag -> FieldType -> Maybe Int32 -> PutM WireSize
forall v.
Wire v =>
WireTag -> FieldType -> Maybe v -> PutM WireSize
P'.wirePutOptWithSize WireTag
16 FieldType
5 Maybe Int32
x'2, WireTag -> FieldType -> Maybe EnumValueOptions -> PutM WireSize
forall v.
Wire v =>
WireTag -> FieldType -> Maybe v -> PutM WireSize
P'.wirePutOptWithSize WireTag
26 FieldType
11 Maybe EnumValueOptions
x'3,
             UnknownField -> PutM WireSize
P'.wirePutUnknownFieldWithSize UnknownField
x'4]
        put'FieldsSized :: PutM WireSize
put'FieldsSized
         = let size' :: WireSize
size' = (WireSize, ByteString) -> WireSize
forall a b. (a, b) -> a
Prelude'.fst (PutM WireSize -> (WireSize, ByteString)
forall a. PutM a -> (a, ByteString)
P'.runPutM PutM WireSize
put'Fields)
               put'Size :: PutM WireSize
put'Size
                = do
                    WireSize -> Put
P'.putSize WireSize
size'
                    WireSize -> PutM WireSize
forall (m :: * -> *) a. Monad m => a -> m a
Prelude'.return (WireSize -> WireSize
P'.size'WireSize WireSize
size')
            in [PutM WireSize] -> PutM WireSize
forall (f :: * -> *).
Foldable f =>
f (PutM WireSize) -> PutM WireSize
P'.sequencePutWithSize [PutM WireSize
put'Size, PutM WireSize
put'Fields]
  wireGet :: FieldType -> Get EnumValueDescriptorProto
wireGet FieldType
ft'
   = case FieldType
ft' of
       FieldType
10 -> (WireTag
 -> EnumValueDescriptorProto -> Get EnumValueDescriptorProto)
-> Get EnumValueDescriptorProto
forall message.
(Default message, ReflectDescriptor message) =>
(WireTag -> message -> Get message) -> Get message
P'.getBareMessageWith ((WireTag
 -> EnumValueDescriptorProto -> Get EnumValueDescriptorProto)
-> (WireTag
    -> EnumValueDescriptorProto -> Get EnumValueDescriptorProto)
-> WireTag
-> EnumValueDescriptorProto
-> Get EnumValueDescriptorProto
forall a.
(WireTag -> a -> Get a)
-> (WireTag -> a -> Get a) -> WireTag -> a -> Get a
P'.catch'Unknown' WireTag -> EnumValueDescriptorProto -> Get EnumValueDescriptorProto
forall a. UnknownMessage a => WireTag -> a -> Get a
P'.loadUnknown WireTag -> EnumValueDescriptorProto -> Get EnumValueDescriptorProto
update'Self)
       FieldType
11 -> (WireTag
 -> EnumValueDescriptorProto -> Get EnumValueDescriptorProto)
-> Get EnumValueDescriptorProto
forall message.
(Default message, ReflectDescriptor message) =>
(WireTag -> message -> Get message) -> Get message
P'.getMessageWith ((WireTag
 -> EnumValueDescriptorProto -> Get EnumValueDescriptorProto)
-> (WireTag
    -> EnumValueDescriptorProto -> Get EnumValueDescriptorProto)
-> WireTag
-> EnumValueDescriptorProto
-> Get EnumValueDescriptorProto
forall a.
(WireTag -> a -> Get a)
-> (WireTag -> a -> Get a) -> WireTag -> a -> Get a
P'.catch'Unknown' WireTag -> EnumValueDescriptorProto -> Get EnumValueDescriptorProto
forall a. UnknownMessage a => WireTag -> a -> Get a
P'.loadUnknown WireTag -> EnumValueDescriptorProto -> Get EnumValueDescriptorProto
update'Self)
       FieldType
_ -> FieldType -> Get EnumValueDescriptorProto
forall a. Typeable a => FieldType -> Get a
P'.wireGetErr FieldType
ft'
    where
        update'Self :: WireTag -> EnumValueDescriptorProto -> Get EnumValueDescriptorProto
update'Self WireTag
wire'Tag EnumValueDescriptorProto
old'Self
         = case WireTag
wire'Tag of
             WireTag
10 -> (Utf8 -> EnumValueDescriptorProto)
-> Get Utf8 -> Get EnumValueDescriptorProto
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude'.fmap (\ !Utf8
new'Field -> EnumValueDescriptorProto
old'Self{name :: Maybe Utf8
name = Utf8 -> Maybe Utf8
forall a. a -> Maybe a
Prelude'.Just Utf8
new'Field}) (FieldType -> Get Utf8
forall b. Wire b => FieldType -> Get b
P'.wireGet FieldType
9)
             WireTag
16 -> (Int32 -> EnumValueDescriptorProto)
-> Get Int32 -> Get EnumValueDescriptorProto
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude'.fmap (\ !Int32
new'Field -> EnumValueDescriptorProto
old'Self{number :: Maybe Int32
number = Int32 -> Maybe Int32
forall a. a -> Maybe a
Prelude'.Just Int32
new'Field}) (FieldType -> Get Int32
forall b. Wire b => FieldType -> Get b
P'.wireGet FieldType
5)
             WireTag
26 -> (EnumValueOptions -> EnumValueDescriptorProto)
-> Get EnumValueOptions -> Get EnumValueDescriptorProto
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude'.fmap (\ !EnumValueOptions
new'Field -> EnumValueDescriptorProto
old'Self{options :: Maybe EnumValueOptions
options = Maybe EnumValueOptions
-> Maybe EnumValueOptions -> Maybe EnumValueOptions
forall a. Mergeable a => a -> a -> a
P'.mergeAppend (EnumValueDescriptorProto -> Maybe EnumValueOptions
options EnumValueDescriptorProto
old'Self) (EnumValueOptions -> Maybe EnumValueOptions
forall a. a -> Maybe a
Prelude'.Just EnumValueOptions
new'Field)})
                    (FieldType -> Get EnumValueOptions
forall b. Wire b => FieldType -> Get b
P'.wireGet FieldType
11)
             WireTag
_ -> let (FieldId
field'Number, WireType
wire'Type) = WireTag -> (FieldId, WireType)
P'.splitWireTag WireTag
wire'Tag in FieldId
-> WireType
-> EnumValueDescriptorProto
-> Get EnumValueDescriptorProto
forall a.
(Typeable a, ReflectDescriptor a) =>
FieldId -> WireType -> a -> Get a
P'.unknown FieldId
field'Number WireType
wire'Type EnumValueDescriptorProto
old'Self

instance P'.MessageAPI msg' (msg' -> EnumValueDescriptorProto) EnumValueDescriptorProto where
  getVal :: msg'
-> (msg' -> EnumValueDescriptorProto) -> EnumValueDescriptorProto
getVal msg'
m' msg' -> EnumValueDescriptorProto
f' = msg' -> EnumValueDescriptorProto
f' msg'
m'

instance P'.GPB EnumValueDescriptorProto

instance P'.ReflectDescriptor EnumValueDescriptorProto where
  getMessageInfo :: EnumValueDescriptorProto -> GetMessageInfo
getMessageInfo EnumValueDescriptorProto
_ = Set WireTag -> Set WireTag -> GetMessageInfo
P'.GetMessageInfo ([WireTag] -> Set WireTag
forall a. [a] -> Set a
P'.fromDistinctAscList []) ([WireTag] -> Set WireTag
forall a. [a] -> Set a
P'.fromDistinctAscList [WireTag
10, WireTag
16, WireTag
26])
  reflectDescriptorInfo :: EnumValueDescriptorProto -> DescriptorInfo
reflectDescriptorInfo EnumValueDescriptorProto
_
   = String -> DescriptorInfo
forall a. Read a => String -> a
Prelude'.read
      String
"DescriptorInfo {descName = ProtoName {protobufName = FIName \".google.protobuf.EnumValueDescriptorProto\", haskellPrefix = [MName \"Text\"], parentModule = [MName \"DescriptorProtos\"], baseName = MName \"EnumValueDescriptorProto\"}, descFilePath = [\"Text\",\"DescriptorProtos\",\"EnumValueDescriptorProto.hs\"], isGroup = False, fields = fromList [FieldInfo {fieldName = ProtoFName {protobufName' = FIName \".google.protobuf.EnumValueDescriptorProto.name\", haskellPrefix' = [MName \"Text\"], parentModule' = [MName \"DescriptorProtos\",MName \"EnumValueDescriptorProto\"], baseName' = FName \"name\", baseNamePrefix' = \"\"}, fieldNumber = FieldId {getFieldId = 1}, wireTag = WireTag {getWireTag = 10}, packedTag = Nothing, wireTagLength = 1, isPacked = False, isRequired = False, canRepeat = False, mightPack = False, typeCode = FieldType {getFieldType = 9}, typeName = Nothing, hsRawDefault = Nothing, hsDefault = Nothing},FieldInfo {fieldName = ProtoFName {protobufName' = FIName \".google.protobuf.EnumValueDescriptorProto.number\", haskellPrefix' = [MName \"Text\"], parentModule' = [MName \"DescriptorProtos\",MName \"EnumValueDescriptorProto\"], baseName' = FName \"number\", baseNamePrefix' = \"\"}, fieldNumber = FieldId {getFieldId = 2}, wireTag = WireTag {getWireTag = 16}, packedTag = Nothing, wireTagLength = 1, isPacked = False, isRequired = False, canRepeat = False, mightPack = False, typeCode = FieldType {getFieldType = 5}, typeName = Nothing, hsRawDefault = Nothing, hsDefault = Nothing},FieldInfo {fieldName = ProtoFName {protobufName' = FIName \".google.protobuf.EnumValueDescriptorProto.options\", haskellPrefix' = [MName \"Text\"], parentModule' = [MName \"DescriptorProtos\",MName \"EnumValueDescriptorProto\"], baseName' = FName \"options\", baseNamePrefix' = \"\"}, fieldNumber = FieldId {getFieldId = 3}, wireTag = WireTag {getWireTag = 26}, packedTag = Nothing, wireTagLength = 1, isPacked = False, isRequired = False, canRepeat = False, mightPack = False, typeCode = FieldType {getFieldType = 11}, typeName = Just (ProtoName {protobufName = FIName \".google.protobuf.EnumValueOptions\", haskellPrefix = [MName \"Text\"], parentModule = [MName \"DescriptorProtos\"], baseName = MName \"EnumValueOptions\"}), hsRawDefault = Nothing, hsDefault = Nothing}], descOneofs = fromList [], keys = fromList [], extRanges = [], knownKeys = fromList [], storeUnknown = True, lazyFields = False, makeLenses = False, jsonInstances = False}"

instance P'.TextType EnumValueDescriptorProto where
  tellT :: String -> EnumValueDescriptorProto -> Output
tellT = String -> EnumValueDescriptorProto -> Output
forall a. TextMsg a => String -> a -> Output
P'.tellSubMessage
  getT :: String -> Parsec s () EnumValueDescriptorProto
getT = String -> Parsec s () EnumValueDescriptorProto
forall s a.
(Stream s Identity Char, TextMsg a) =>
String -> Parsec s () a
P'.getSubMessage

instance P'.TextMsg EnumValueDescriptorProto where
  textPut :: EnumValueDescriptorProto -> Output
textPut EnumValueDescriptorProto
msg
   = do
       String -> Maybe Utf8 -> Output
forall a. TextType a => String -> a -> Output
P'.tellT String
"name" (EnumValueDescriptorProto -> Maybe Utf8
name EnumValueDescriptorProto
msg)
       String -> Maybe Int32 -> Output
forall a. TextType a => String -> a -> Output
P'.tellT String
"number" (EnumValueDescriptorProto -> Maybe Int32
number EnumValueDescriptorProto
msg)
       String -> Maybe EnumValueOptions -> Output
forall a. TextType a => String -> a -> Output
P'.tellT String
"options" (EnumValueDescriptorProto -> Maybe EnumValueOptions
options EnumValueDescriptorProto
msg)
  textGet :: Parsec s () EnumValueDescriptorProto
textGet
   = do
       [EnumValueDescriptorProto -> EnumValueDescriptorProto]
mods <- ParsecT
  s
  ()
  Identity
  (EnumValueDescriptorProto -> EnumValueDescriptorProto)
-> ParsecT s () Identity ()
-> ParsecT
     s
     ()
     Identity
     [EnumValueDescriptorProto -> EnumValueDescriptorProto]
forall s (m :: * -> *) t u a sep.
Stream s m t =>
ParsecT s u m a -> ParsecT s u m sep -> ParsecT s u m [a]
P'.sepEndBy ([ParsecT
   s
   ()
   Identity
   (EnumValueDescriptorProto -> EnumValueDescriptorProto)]
-> ParsecT
     s
     ()
     Identity
     (EnumValueDescriptorProto -> EnumValueDescriptorProto)
forall s (m :: * -> *) t u a.
Stream s m t =>
[ParsecT s u m a] -> ParsecT s u m a
P'.choice [ParsecT
  s
  ()
  Identity
  (EnumValueDescriptorProto -> EnumValueDescriptorProto)
parse'name, ParsecT
  s
  ()
  Identity
  (EnumValueDescriptorProto -> EnumValueDescriptorProto)
parse'number, ParsecT
  s
  ()
  Identity
  (EnumValueDescriptorProto -> EnumValueDescriptorProto)
parse'options]) ParsecT s () Identity ()
forall s (m :: * -> *) u. Stream s m Char => ParsecT s u m ()
P'.spaces
       EnumValueDescriptorProto -> Parsec s () EnumValueDescriptorProto
forall (m :: * -> *) a. Monad m => a -> m a
Prelude'.return ((EnumValueDescriptorProto
 -> (EnumValueDescriptorProto -> EnumValueDescriptorProto)
 -> EnumValueDescriptorProto)
-> EnumValueDescriptorProto
-> [EnumValueDescriptorProto -> EnumValueDescriptorProto]
-> EnumValueDescriptorProto
forall (t :: * -> *) b a.
Foldable t =>
(b -> a -> b) -> b -> t a -> b
Prelude'.foldl' (\ EnumValueDescriptorProto
v EnumValueDescriptorProto -> EnumValueDescriptorProto
f -> EnumValueDescriptorProto -> EnumValueDescriptorProto
f EnumValueDescriptorProto
v) EnumValueDescriptorProto
forall a. Default a => a
P'.defaultValue [EnumValueDescriptorProto -> EnumValueDescriptorProto]
mods)
    where
        parse'name :: ParsecT
  s
  ()
  Identity
  (EnumValueDescriptorProto -> EnumValueDescriptorProto)
parse'name = (Maybe Utf8
 -> EnumValueDescriptorProto -> EnumValueDescriptorProto)
-> ParsecT s () Identity (Maybe Utf8)
-> ParsecT
     s
     ()
     Identity
     (EnumValueDescriptorProto -> EnumValueDescriptorProto)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude'.fmap (\ Maybe Utf8
v EnumValueDescriptorProto
o -> EnumValueDescriptorProto
o{name :: Maybe Utf8
name = Maybe Utf8
v}) (ParsecT s () Identity (Maybe Utf8)
-> ParsecT s () Identity (Maybe Utf8)
forall s u (m :: * -> *) a. ParsecT s u m a -> ParsecT s u m a
P'.try (String -> ParsecT s () Identity (Maybe Utf8)
forall a s.
(TextType a, Stream s Identity Char) =>
String -> Parsec s () a
P'.getT String
"name"))
        parse'number :: ParsecT
  s
  ()
  Identity
  (EnumValueDescriptorProto -> EnumValueDescriptorProto)
parse'number = (Maybe Int32
 -> EnumValueDescriptorProto -> EnumValueDescriptorProto)
-> ParsecT s () Identity (Maybe Int32)
-> ParsecT
     s
     ()
     Identity
     (EnumValueDescriptorProto -> EnumValueDescriptorProto)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude'.fmap (\ Maybe Int32
v EnumValueDescriptorProto
o -> EnumValueDescriptorProto
o{number :: Maybe Int32
number = Maybe Int32
v}) (ParsecT s () Identity (Maybe Int32)
-> ParsecT s () Identity (Maybe Int32)
forall s u (m :: * -> *) a. ParsecT s u m a -> ParsecT s u m a
P'.try (String -> ParsecT s () Identity (Maybe Int32)
forall a s.
(TextType a, Stream s Identity Char) =>
String -> Parsec s () a
P'.getT String
"number"))
        parse'options :: ParsecT
  s
  ()
  Identity
  (EnumValueDescriptorProto -> EnumValueDescriptorProto)
parse'options = (Maybe EnumValueOptions
 -> EnumValueDescriptorProto -> EnumValueDescriptorProto)
-> ParsecT s () Identity (Maybe EnumValueOptions)
-> ParsecT
     s
     ()
     Identity
     (EnumValueDescriptorProto -> EnumValueDescriptorProto)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude'.fmap (\ Maybe EnumValueOptions
v EnumValueDescriptorProto
o -> EnumValueDescriptorProto
o{options :: Maybe EnumValueOptions
options = Maybe EnumValueOptions
v}) (ParsecT s () Identity (Maybe EnumValueOptions)
-> ParsecT s () Identity (Maybe EnumValueOptions)
forall s u (m :: * -> *) a. ParsecT s u m a -> ParsecT s u m a
P'.try (String -> ParsecT s () Identity (Maybe EnumValueOptions)
forall a s.
(TextType a, Stream s Identity Char) =>
String -> Parsec s () a
P'.getT String
"options"))