{-# OPTIONS_HADDOCK ignore-exports#-}
{-# LANGUAGE DataKinds                  #-}
{-# LANGUAGE DeriveDataTypeable         #-}
{-# LANGUAGE DeriveGeneric              #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE PatternSynonyms            #-}
{-# LANGUAGE Strict                     #-}
module Graphics.Vulkan.Types.Enum.SystemAllocationScope
       (VkSystemAllocationScope(VkSystemAllocationScope,
                                VK_SYSTEM_ALLOCATION_SCOPE_COMMAND,
                                VK_SYSTEM_ALLOCATION_SCOPE_OBJECT,
                                VK_SYSTEM_ALLOCATION_SCOPE_CACHE,
                                VK_SYSTEM_ALLOCATION_SCOPE_DEVICE,
                                VK_SYSTEM_ALLOCATION_SCOPE_INSTANCE))
       where
import           Data.Data                       (Data)
import           Foreign.Storable                (Storable)
import           GHC.Generics                    (Generic)
import           GHC.Read                        (choose, expectP)
import           Graphics.Vulkan.Marshal         (Int32)
import           Text.ParserCombinators.ReadPrec (prec, step, (+++))
import           Text.Read                       (Read (..), parens)
import           Text.Read.Lex                   (Lexeme (..))

-- | type = @enum@
--
--   <https://www.khronos.org/registry/vulkan/specs/1.1-extensions/html/vkspec.html#VkSystemAllocationScope VkSystemAllocationScope registry at www.khronos.org>
newtype VkSystemAllocationScope = VkSystemAllocationScope Int32
                                    deriving (VkSystemAllocationScope -> VkSystemAllocationScope -> Bool
(VkSystemAllocationScope -> VkSystemAllocationScope -> Bool)
-> (VkSystemAllocationScope -> VkSystemAllocationScope -> Bool)
-> Eq VkSystemAllocationScope
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: VkSystemAllocationScope -> VkSystemAllocationScope -> Bool
$c/= :: VkSystemAllocationScope -> VkSystemAllocationScope -> Bool
== :: VkSystemAllocationScope -> VkSystemAllocationScope -> Bool
$c== :: VkSystemAllocationScope -> VkSystemAllocationScope -> Bool
Eq, Eq VkSystemAllocationScope
Eq VkSystemAllocationScope
-> (VkSystemAllocationScope -> VkSystemAllocationScope -> Ordering)
-> (VkSystemAllocationScope -> VkSystemAllocationScope -> Bool)
-> (VkSystemAllocationScope -> VkSystemAllocationScope -> Bool)
-> (VkSystemAllocationScope -> VkSystemAllocationScope -> Bool)
-> (VkSystemAllocationScope -> VkSystemAllocationScope -> Bool)
-> (VkSystemAllocationScope
    -> VkSystemAllocationScope -> VkSystemAllocationScope)
-> (VkSystemAllocationScope
    -> VkSystemAllocationScope -> VkSystemAllocationScope)
-> Ord VkSystemAllocationScope
VkSystemAllocationScope -> VkSystemAllocationScope -> Bool
VkSystemAllocationScope -> VkSystemAllocationScope -> Ordering
VkSystemAllocationScope
-> VkSystemAllocationScope -> VkSystemAllocationScope
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 :: VkSystemAllocationScope
-> VkSystemAllocationScope -> VkSystemAllocationScope
$cmin :: VkSystemAllocationScope
-> VkSystemAllocationScope -> VkSystemAllocationScope
max :: VkSystemAllocationScope
-> VkSystemAllocationScope -> VkSystemAllocationScope
$cmax :: VkSystemAllocationScope
-> VkSystemAllocationScope -> VkSystemAllocationScope
>= :: VkSystemAllocationScope -> VkSystemAllocationScope -> Bool
$c>= :: VkSystemAllocationScope -> VkSystemAllocationScope -> Bool
> :: VkSystemAllocationScope -> VkSystemAllocationScope -> Bool
$c> :: VkSystemAllocationScope -> VkSystemAllocationScope -> Bool
<= :: VkSystemAllocationScope -> VkSystemAllocationScope -> Bool
$c<= :: VkSystemAllocationScope -> VkSystemAllocationScope -> Bool
< :: VkSystemAllocationScope -> VkSystemAllocationScope -> Bool
$c< :: VkSystemAllocationScope -> VkSystemAllocationScope -> Bool
compare :: VkSystemAllocationScope -> VkSystemAllocationScope -> Ordering
$ccompare :: VkSystemAllocationScope -> VkSystemAllocationScope -> Ordering
$cp1Ord :: Eq VkSystemAllocationScope
Ord, Integer -> VkSystemAllocationScope
VkSystemAllocationScope -> VkSystemAllocationScope
VkSystemAllocationScope
-> VkSystemAllocationScope -> VkSystemAllocationScope
(VkSystemAllocationScope
 -> VkSystemAllocationScope -> VkSystemAllocationScope)
-> (VkSystemAllocationScope
    -> VkSystemAllocationScope -> VkSystemAllocationScope)
-> (VkSystemAllocationScope
    -> VkSystemAllocationScope -> VkSystemAllocationScope)
-> (VkSystemAllocationScope -> VkSystemAllocationScope)
-> (VkSystemAllocationScope -> VkSystemAllocationScope)
-> (VkSystemAllocationScope -> VkSystemAllocationScope)
-> (Integer -> VkSystemAllocationScope)
-> Num VkSystemAllocationScope
forall a.
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a)
-> (a -> a)
-> (a -> a)
-> (Integer -> a)
-> Num a
fromInteger :: Integer -> VkSystemAllocationScope
$cfromInteger :: Integer -> VkSystemAllocationScope
signum :: VkSystemAllocationScope -> VkSystemAllocationScope
$csignum :: VkSystemAllocationScope -> VkSystemAllocationScope
abs :: VkSystemAllocationScope -> VkSystemAllocationScope
$cabs :: VkSystemAllocationScope -> VkSystemAllocationScope
negate :: VkSystemAllocationScope -> VkSystemAllocationScope
$cnegate :: VkSystemAllocationScope -> VkSystemAllocationScope
* :: VkSystemAllocationScope
-> VkSystemAllocationScope -> VkSystemAllocationScope
$c* :: VkSystemAllocationScope
-> VkSystemAllocationScope -> VkSystemAllocationScope
- :: VkSystemAllocationScope
-> VkSystemAllocationScope -> VkSystemAllocationScope
$c- :: VkSystemAllocationScope
-> VkSystemAllocationScope -> VkSystemAllocationScope
+ :: VkSystemAllocationScope
-> VkSystemAllocationScope -> VkSystemAllocationScope
$c+ :: VkSystemAllocationScope
-> VkSystemAllocationScope -> VkSystemAllocationScope
Num, VkSystemAllocationScope
VkSystemAllocationScope
-> VkSystemAllocationScope -> Bounded VkSystemAllocationScope
forall a. a -> a -> Bounded a
maxBound :: VkSystemAllocationScope
$cmaxBound :: VkSystemAllocationScope
minBound :: VkSystemAllocationScope
$cminBound :: VkSystemAllocationScope
Bounded, Ptr b -> Int -> IO VkSystemAllocationScope
Ptr b -> Int -> VkSystemAllocationScope -> IO ()
Ptr VkSystemAllocationScope -> IO VkSystemAllocationScope
Ptr VkSystemAllocationScope -> Int -> IO VkSystemAllocationScope
Ptr VkSystemAllocationScope
-> Int -> VkSystemAllocationScope -> IO ()
Ptr VkSystemAllocationScope -> VkSystemAllocationScope -> IO ()
VkSystemAllocationScope -> Int
(VkSystemAllocationScope -> Int)
-> (VkSystemAllocationScope -> Int)
-> (Ptr VkSystemAllocationScope
    -> Int -> IO VkSystemAllocationScope)
-> (Ptr VkSystemAllocationScope
    -> Int -> VkSystemAllocationScope -> IO ())
-> (forall b. Ptr b -> Int -> IO VkSystemAllocationScope)
-> (forall b. Ptr b -> Int -> VkSystemAllocationScope -> IO ())
-> (Ptr VkSystemAllocationScope -> IO VkSystemAllocationScope)
-> (Ptr VkSystemAllocationScope
    -> VkSystemAllocationScope -> IO ())
-> Storable VkSystemAllocationScope
forall b. Ptr b -> Int -> IO VkSystemAllocationScope
forall b. Ptr b -> Int -> VkSystemAllocationScope -> IO ()
forall a.
(a -> Int)
-> (a -> Int)
-> (Ptr a -> Int -> IO a)
-> (Ptr a -> Int -> a -> IO ())
-> (forall b. Ptr b -> Int -> IO a)
-> (forall b. Ptr b -> Int -> a -> IO ())
-> (Ptr a -> IO a)
-> (Ptr a -> a -> IO ())
-> Storable a
poke :: Ptr VkSystemAllocationScope -> VkSystemAllocationScope -> IO ()
$cpoke :: Ptr VkSystemAllocationScope -> VkSystemAllocationScope -> IO ()
peek :: Ptr VkSystemAllocationScope -> IO VkSystemAllocationScope
$cpeek :: Ptr VkSystemAllocationScope -> IO VkSystemAllocationScope
pokeByteOff :: Ptr b -> Int -> VkSystemAllocationScope -> IO ()
$cpokeByteOff :: forall b. Ptr b -> Int -> VkSystemAllocationScope -> IO ()
peekByteOff :: Ptr b -> Int -> IO VkSystemAllocationScope
$cpeekByteOff :: forall b. Ptr b -> Int -> IO VkSystemAllocationScope
pokeElemOff :: Ptr VkSystemAllocationScope
-> Int -> VkSystemAllocationScope -> IO ()
$cpokeElemOff :: Ptr VkSystemAllocationScope
-> Int -> VkSystemAllocationScope -> IO ()
peekElemOff :: Ptr VkSystemAllocationScope -> Int -> IO VkSystemAllocationScope
$cpeekElemOff :: Ptr VkSystemAllocationScope -> Int -> IO VkSystemAllocationScope
alignment :: VkSystemAllocationScope -> Int
$calignment :: VkSystemAllocationScope -> Int
sizeOf :: VkSystemAllocationScope -> Int
$csizeOf :: VkSystemAllocationScope -> Int
Storable, Int -> VkSystemAllocationScope
VkSystemAllocationScope -> Int
VkSystemAllocationScope -> [VkSystemAllocationScope]
VkSystemAllocationScope -> VkSystemAllocationScope
VkSystemAllocationScope
-> VkSystemAllocationScope -> [VkSystemAllocationScope]
VkSystemAllocationScope
-> VkSystemAllocationScope
-> VkSystemAllocationScope
-> [VkSystemAllocationScope]
(VkSystemAllocationScope -> VkSystemAllocationScope)
-> (VkSystemAllocationScope -> VkSystemAllocationScope)
-> (Int -> VkSystemAllocationScope)
-> (VkSystemAllocationScope -> Int)
-> (VkSystemAllocationScope -> [VkSystemAllocationScope])
-> (VkSystemAllocationScope
    -> VkSystemAllocationScope -> [VkSystemAllocationScope])
-> (VkSystemAllocationScope
    -> VkSystemAllocationScope -> [VkSystemAllocationScope])
-> (VkSystemAllocationScope
    -> VkSystemAllocationScope
    -> VkSystemAllocationScope
    -> [VkSystemAllocationScope])
-> Enum VkSystemAllocationScope
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
enumFromThenTo :: VkSystemAllocationScope
-> VkSystemAllocationScope
-> VkSystemAllocationScope
-> [VkSystemAllocationScope]
$cenumFromThenTo :: VkSystemAllocationScope
-> VkSystemAllocationScope
-> VkSystemAllocationScope
-> [VkSystemAllocationScope]
enumFromTo :: VkSystemAllocationScope
-> VkSystemAllocationScope -> [VkSystemAllocationScope]
$cenumFromTo :: VkSystemAllocationScope
-> VkSystemAllocationScope -> [VkSystemAllocationScope]
enumFromThen :: VkSystemAllocationScope
-> VkSystemAllocationScope -> [VkSystemAllocationScope]
$cenumFromThen :: VkSystemAllocationScope
-> VkSystemAllocationScope -> [VkSystemAllocationScope]
enumFrom :: VkSystemAllocationScope -> [VkSystemAllocationScope]
$cenumFrom :: VkSystemAllocationScope -> [VkSystemAllocationScope]
fromEnum :: VkSystemAllocationScope -> Int
$cfromEnum :: VkSystemAllocationScope -> Int
toEnum :: Int -> VkSystemAllocationScope
$ctoEnum :: Int -> VkSystemAllocationScope
pred :: VkSystemAllocationScope -> VkSystemAllocationScope
$cpred :: VkSystemAllocationScope -> VkSystemAllocationScope
succ :: VkSystemAllocationScope -> VkSystemAllocationScope
$csucc :: VkSystemAllocationScope -> VkSystemAllocationScope
Enum, Typeable VkSystemAllocationScope
DataType
Constr
Typeable VkSystemAllocationScope
-> (forall (c :: * -> *).
    (forall d b. Data d => c (d -> b) -> d -> c b)
    -> (forall g. g -> c g)
    -> VkSystemAllocationScope
    -> c VkSystemAllocationScope)
-> (forall (c :: * -> *).
    (forall b r. Data b => c (b -> r) -> c r)
    -> (forall r. r -> c r) -> Constr -> c VkSystemAllocationScope)
-> (VkSystemAllocationScope -> Constr)
-> (VkSystemAllocationScope -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
    Typeable t =>
    (forall d. Data d => c (t d)) -> Maybe (c VkSystemAllocationScope))
-> (forall (t :: * -> * -> *) (c :: * -> *).
    Typeable t =>
    (forall d e. (Data d, Data e) => c (t d e))
    -> Maybe (c VkSystemAllocationScope))
-> ((forall b. Data b => b -> b)
    -> VkSystemAllocationScope -> VkSystemAllocationScope)
-> (forall r r'.
    (r -> r' -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> VkSystemAllocationScope
    -> r)
-> (forall r r'.
    (r' -> r -> r)
    -> r
    -> (forall d. Data d => d -> r')
    -> VkSystemAllocationScope
    -> r)
-> (forall u.
    (forall d. Data d => d -> u) -> VkSystemAllocationScope -> [u])
-> (forall u.
    Int
    -> (forall d. Data d => d -> u) -> VkSystemAllocationScope -> u)
-> (forall (m :: * -> *).
    Monad m =>
    (forall d. Data d => d -> m d)
    -> VkSystemAllocationScope -> m VkSystemAllocationScope)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> VkSystemAllocationScope -> m VkSystemAllocationScope)
-> (forall (m :: * -> *).
    MonadPlus m =>
    (forall d. Data d => d -> m d)
    -> VkSystemAllocationScope -> m VkSystemAllocationScope)
-> Data VkSystemAllocationScope
VkSystemAllocationScope -> DataType
VkSystemAllocationScope -> Constr
(forall b. Data b => b -> b)
-> VkSystemAllocationScope -> VkSystemAllocationScope
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> VkSystemAllocationScope
-> c VkSystemAllocationScope
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c VkSystemAllocationScope
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) -> VkSystemAllocationScope -> u
forall u.
(forall d. Data d => d -> u) -> VkSystemAllocationScope -> [u]
forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> VkSystemAllocationScope
-> r
forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> VkSystemAllocationScope
-> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> VkSystemAllocationScope -> m VkSystemAllocationScope
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> VkSystemAllocationScope -> m VkSystemAllocationScope
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c VkSystemAllocationScope
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> VkSystemAllocationScope
-> c VkSystemAllocationScope
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c VkSystemAllocationScope)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c VkSystemAllocationScope)
$cVkSystemAllocationScope :: Constr
$tVkSystemAllocationScope :: DataType
gmapMo :: (forall d. Data d => d -> m d)
-> VkSystemAllocationScope -> m VkSystemAllocationScope
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> VkSystemAllocationScope -> m VkSystemAllocationScope
gmapMp :: (forall d. Data d => d -> m d)
-> VkSystemAllocationScope -> m VkSystemAllocationScope
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> VkSystemAllocationScope -> m VkSystemAllocationScope
gmapM :: (forall d. Data d => d -> m d)
-> VkSystemAllocationScope -> m VkSystemAllocationScope
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> VkSystemAllocationScope -> m VkSystemAllocationScope
gmapQi :: Int -> (forall d. Data d => d -> u) -> VkSystemAllocationScope -> u
$cgmapQi :: forall u.
Int -> (forall d. Data d => d -> u) -> VkSystemAllocationScope -> u
gmapQ :: (forall d. Data d => d -> u) -> VkSystemAllocationScope -> [u]
$cgmapQ :: forall u.
(forall d. Data d => d -> u) -> VkSystemAllocationScope -> [u]
gmapQr :: (r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> VkSystemAllocationScope
-> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r
-> (forall d. Data d => d -> r')
-> VkSystemAllocationScope
-> r
gmapQl :: (r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> VkSystemAllocationScope
-> r
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r
-> (forall d. Data d => d -> r')
-> VkSystemAllocationScope
-> r
gmapT :: (forall b. Data b => b -> b)
-> VkSystemAllocationScope -> VkSystemAllocationScope
$cgmapT :: (forall b. Data b => b -> b)
-> VkSystemAllocationScope -> VkSystemAllocationScope
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c VkSystemAllocationScope)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c VkSystemAllocationScope)
dataCast1 :: (forall d. Data d => c (t d)) -> Maybe (c VkSystemAllocationScope)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c VkSystemAllocationScope)
dataTypeOf :: VkSystemAllocationScope -> DataType
$cdataTypeOf :: VkSystemAllocationScope -> DataType
toConstr :: VkSystemAllocationScope -> Constr
$ctoConstr :: VkSystemAllocationScope -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c VkSystemAllocationScope
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c VkSystemAllocationScope
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> VkSystemAllocationScope
-> c VkSystemAllocationScope
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g)
-> VkSystemAllocationScope
-> c VkSystemAllocationScope
$cp1Data :: Typeable VkSystemAllocationScope
Data, (forall x.
 VkSystemAllocationScope -> Rep VkSystemAllocationScope x)
-> (forall x.
    Rep VkSystemAllocationScope x -> VkSystemAllocationScope)
-> Generic VkSystemAllocationScope
forall x. Rep VkSystemAllocationScope x -> VkSystemAllocationScope
forall x. VkSystemAllocationScope -> Rep VkSystemAllocationScope x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep VkSystemAllocationScope x -> VkSystemAllocationScope
$cfrom :: forall x. VkSystemAllocationScope -> Rep VkSystemAllocationScope x
Generic)

instance Show VkSystemAllocationScope where
        showsPrec :: Int -> VkSystemAllocationScope -> ShowS
showsPrec Int
_ VkSystemAllocationScope
VK_SYSTEM_ALLOCATION_SCOPE_COMMAND
          = String -> ShowS
showString String
"VK_SYSTEM_ALLOCATION_SCOPE_COMMAND"
        showsPrec Int
_ VkSystemAllocationScope
VK_SYSTEM_ALLOCATION_SCOPE_OBJECT
          = String -> ShowS
showString String
"VK_SYSTEM_ALLOCATION_SCOPE_OBJECT"
        showsPrec Int
_ VkSystemAllocationScope
VK_SYSTEM_ALLOCATION_SCOPE_CACHE
          = String -> ShowS
showString String
"VK_SYSTEM_ALLOCATION_SCOPE_CACHE"
        showsPrec Int
_ VkSystemAllocationScope
VK_SYSTEM_ALLOCATION_SCOPE_DEVICE
          = String -> ShowS
showString String
"VK_SYSTEM_ALLOCATION_SCOPE_DEVICE"
        showsPrec Int
_ VkSystemAllocationScope
VK_SYSTEM_ALLOCATION_SCOPE_INSTANCE
          = String -> ShowS
showString String
"VK_SYSTEM_ALLOCATION_SCOPE_INSTANCE"
        showsPrec Int
p (VkSystemAllocationScope Int32
x)
          = Bool -> ShowS -> ShowS
showParen (Int
p Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
>= Int
11)
              (String -> ShowS
showString String
"VkSystemAllocationScope " ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Int -> Int32 -> ShowS
forall a. Show a => Int -> a -> ShowS
showsPrec Int
11 Int32
x)

instance Read VkSystemAllocationScope where
        readPrec :: ReadPrec VkSystemAllocationScope
readPrec
          = ReadPrec VkSystemAllocationScope
-> ReadPrec VkSystemAllocationScope
forall a. ReadPrec a -> ReadPrec a
parens
              ([(String, ReadPrec VkSystemAllocationScope)]
-> ReadPrec VkSystemAllocationScope
forall a. [(String, ReadPrec a)] -> ReadPrec a
choose
                 [(String
"VK_SYSTEM_ALLOCATION_SCOPE_COMMAND",
                   VkSystemAllocationScope -> ReadPrec VkSystemAllocationScope
forall (f :: * -> *) a. Applicative f => a -> f a
pure VkSystemAllocationScope
VK_SYSTEM_ALLOCATION_SCOPE_COMMAND),
                  (String
"VK_SYSTEM_ALLOCATION_SCOPE_OBJECT",
                   VkSystemAllocationScope -> ReadPrec VkSystemAllocationScope
forall (f :: * -> *) a. Applicative f => a -> f a
pure VkSystemAllocationScope
VK_SYSTEM_ALLOCATION_SCOPE_OBJECT),
                  (String
"VK_SYSTEM_ALLOCATION_SCOPE_CACHE",
                   VkSystemAllocationScope -> ReadPrec VkSystemAllocationScope
forall (f :: * -> *) a. Applicative f => a -> f a
pure VkSystemAllocationScope
VK_SYSTEM_ALLOCATION_SCOPE_CACHE),
                  (String
"VK_SYSTEM_ALLOCATION_SCOPE_DEVICE",
                   VkSystemAllocationScope -> ReadPrec VkSystemAllocationScope
forall (f :: * -> *) a. Applicative f => a -> f a
pure VkSystemAllocationScope
VK_SYSTEM_ALLOCATION_SCOPE_DEVICE),
                  (String
"VK_SYSTEM_ALLOCATION_SCOPE_INSTANCE",
                   VkSystemAllocationScope -> ReadPrec VkSystemAllocationScope
forall (f :: * -> *) a. Applicative f => a -> f a
pure VkSystemAllocationScope
VK_SYSTEM_ALLOCATION_SCOPE_INSTANCE)]
                 ReadPrec VkSystemAllocationScope
-> ReadPrec VkSystemAllocationScope
-> ReadPrec VkSystemAllocationScope
forall a. ReadPrec a -> ReadPrec a -> ReadPrec a
+++
                 Int
-> ReadPrec VkSystemAllocationScope
-> ReadPrec VkSystemAllocationScope
forall a. Int -> ReadPrec a -> ReadPrec a
prec Int
10
                   (Lexeme -> ReadPrec ()
expectP (String -> Lexeme
Ident String
"VkSystemAllocationScope") ReadPrec ()
-> ReadPrec VkSystemAllocationScope
-> ReadPrec VkSystemAllocationScope
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>>
                      (Int32 -> VkSystemAllocationScope
VkSystemAllocationScope (Int32 -> VkSystemAllocationScope)
-> ReadPrec Int32 -> ReadPrec VkSystemAllocationScope
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> ReadPrec Int32 -> ReadPrec Int32
forall a. ReadPrec a -> ReadPrec a
step ReadPrec Int32
forall a. Read a => ReadPrec a
readPrec)))

pattern VK_SYSTEM_ALLOCATION_SCOPE_COMMAND ::
        VkSystemAllocationScope

pattern $bVK_SYSTEM_ALLOCATION_SCOPE_COMMAND :: VkSystemAllocationScope
$mVK_SYSTEM_ALLOCATION_SCOPE_COMMAND :: forall r.
VkSystemAllocationScope -> (Void# -> r) -> (Void# -> r) -> r
VK_SYSTEM_ALLOCATION_SCOPE_COMMAND =
        VkSystemAllocationScope 0

pattern VK_SYSTEM_ALLOCATION_SCOPE_OBJECT ::
        VkSystemAllocationScope

pattern $bVK_SYSTEM_ALLOCATION_SCOPE_OBJECT :: VkSystemAllocationScope
$mVK_SYSTEM_ALLOCATION_SCOPE_OBJECT :: forall r.
VkSystemAllocationScope -> (Void# -> r) -> (Void# -> r) -> r
VK_SYSTEM_ALLOCATION_SCOPE_OBJECT =
        VkSystemAllocationScope 1

pattern VK_SYSTEM_ALLOCATION_SCOPE_CACHE :: VkSystemAllocationScope

pattern $bVK_SYSTEM_ALLOCATION_SCOPE_CACHE :: VkSystemAllocationScope
$mVK_SYSTEM_ALLOCATION_SCOPE_CACHE :: forall r.
VkSystemAllocationScope -> (Void# -> r) -> (Void# -> r) -> r
VK_SYSTEM_ALLOCATION_SCOPE_CACHE =
        VkSystemAllocationScope 2

pattern VK_SYSTEM_ALLOCATION_SCOPE_DEVICE ::
        VkSystemAllocationScope

pattern $bVK_SYSTEM_ALLOCATION_SCOPE_DEVICE :: VkSystemAllocationScope
$mVK_SYSTEM_ALLOCATION_SCOPE_DEVICE :: forall r.
VkSystemAllocationScope -> (Void# -> r) -> (Void# -> r) -> r
VK_SYSTEM_ALLOCATION_SCOPE_DEVICE =
        VkSystemAllocationScope 3

pattern VK_SYSTEM_ALLOCATION_SCOPE_INSTANCE ::
        VkSystemAllocationScope

pattern $bVK_SYSTEM_ALLOCATION_SCOPE_INSTANCE :: VkSystemAllocationScope
$mVK_SYSTEM_ALLOCATION_SCOPE_INSTANCE :: forall r.
VkSystemAllocationScope -> (Void# -> r) -> (Void# -> r) -> r
VK_SYSTEM_ALLOCATION_SCOPE_INSTANCE =
        VkSystemAllocationScope 4