{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE PatternSynonyms #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE NoImplicitPrelude #-}

-- This file was generated by wgpu-raw-hs-codegen on:
--   2021-08-15T08:56:06.968390
-- Using wgpu-native git hash:
--   b10496e7eed9349f0fd541e6dfe5029cb436de74 wgpu-native (v0.9.2.2)

module WGPU.Raw.Generated.Enum.WGPUCreatePipelineAsyncStatus where

import Data.Word (Word32)
import Foreign (Storable)
import Prelude (Eq, Num, Show)

newtype WGPUCreatePipelineAsyncStatus = WGPUCreatePipelineAsyncStatus Word32
  deriving (WGPUCreatePipelineAsyncStatus
-> WGPUCreatePipelineAsyncStatus -> Bool
(WGPUCreatePipelineAsyncStatus
 -> WGPUCreatePipelineAsyncStatus -> Bool)
-> (WGPUCreatePipelineAsyncStatus
    -> WGPUCreatePipelineAsyncStatus -> Bool)
-> Eq WGPUCreatePipelineAsyncStatus
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: WGPUCreatePipelineAsyncStatus
-> WGPUCreatePipelineAsyncStatus -> Bool
$c/= :: WGPUCreatePipelineAsyncStatus
-> WGPUCreatePipelineAsyncStatus -> Bool
== :: WGPUCreatePipelineAsyncStatus
-> WGPUCreatePipelineAsyncStatus -> Bool
$c== :: WGPUCreatePipelineAsyncStatus
-> WGPUCreatePipelineAsyncStatus -> Bool
Eq, Int -> WGPUCreatePipelineAsyncStatus -> ShowS
[WGPUCreatePipelineAsyncStatus] -> ShowS
WGPUCreatePipelineAsyncStatus -> String
(Int -> WGPUCreatePipelineAsyncStatus -> ShowS)
-> (WGPUCreatePipelineAsyncStatus -> String)
-> ([WGPUCreatePipelineAsyncStatus] -> ShowS)
-> Show WGPUCreatePipelineAsyncStatus
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [WGPUCreatePipelineAsyncStatus] -> ShowS
$cshowList :: [WGPUCreatePipelineAsyncStatus] -> ShowS
show :: WGPUCreatePipelineAsyncStatus -> String
$cshow :: WGPUCreatePipelineAsyncStatus -> String
showsPrec :: Int -> WGPUCreatePipelineAsyncStatus -> ShowS
$cshowsPrec :: Int -> WGPUCreatePipelineAsyncStatus -> ShowS
Show, Integer -> WGPUCreatePipelineAsyncStatus
WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus
WGPUCreatePipelineAsyncStatus
-> WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus
(WGPUCreatePipelineAsyncStatus
 -> WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus)
-> (WGPUCreatePipelineAsyncStatus
    -> WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus)
-> (WGPUCreatePipelineAsyncStatus
    -> WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus)
-> (WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus)
-> (WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus)
-> (WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus)
-> (Integer -> WGPUCreatePipelineAsyncStatus)
-> Num WGPUCreatePipelineAsyncStatus
forall a.
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a)
-> (a -> a)
-> (a -> a)
-> (Integer -> a)
-> Num a
fromInteger :: Integer -> WGPUCreatePipelineAsyncStatus
$cfromInteger :: Integer -> WGPUCreatePipelineAsyncStatus
signum :: WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus
$csignum :: WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus
abs :: WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus
$cabs :: WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus
negate :: WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus
$cnegate :: WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus
* :: WGPUCreatePipelineAsyncStatus
-> WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus
$c* :: WGPUCreatePipelineAsyncStatus
-> WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus
- :: WGPUCreatePipelineAsyncStatus
-> WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus
$c- :: WGPUCreatePipelineAsyncStatus
-> WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus
+ :: WGPUCreatePipelineAsyncStatus
-> WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus
$c+ :: WGPUCreatePipelineAsyncStatus
-> WGPUCreatePipelineAsyncStatus -> WGPUCreatePipelineAsyncStatus
Num, Ptr b -> Int -> IO WGPUCreatePipelineAsyncStatus
Ptr b -> Int -> WGPUCreatePipelineAsyncStatus -> IO ()
Ptr WGPUCreatePipelineAsyncStatus
-> IO WGPUCreatePipelineAsyncStatus
Ptr WGPUCreatePipelineAsyncStatus
-> Int -> IO WGPUCreatePipelineAsyncStatus
Ptr WGPUCreatePipelineAsyncStatus
-> Int -> WGPUCreatePipelineAsyncStatus -> IO ()
Ptr WGPUCreatePipelineAsyncStatus
-> WGPUCreatePipelineAsyncStatus -> IO ()
WGPUCreatePipelineAsyncStatus -> Int
(WGPUCreatePipelineAsyncStatus -> Int)
-> (WGPUCreatePipelineAsyncStatus -> Int)
-> (Ptr WGPUCreatePipelineAsyncStatus
    -> Int -> IO WGPUCreatePipelineAsyncStatus)
-> (Ptr WGPUCreatePipelineAsyncStatus
    -> Int -> WGPUCreatePipelineAsyncStatus -> IO ())
-> (forall b. Ptr b -> Int -> IO WGPUCreatePipelineAsyncStatus)
-> (forall b.
    Ptr b -> Int -> WGPUCreatePipelineAsyncStatus -> IO ())
-> (Ptr WGPUCreatePipelineAsyncStatus
    -> IO WGPUCreatePipelineAsyncStatus)
-> (Ptr WGPUCreatePipelineAsyncStatus
    -> WGPUCreatePipelineAsyncStatus -> IO ())
-> Storable WGPUCreatePipelineAsyncStatus
forall b. Ptr b -> Int -> IO WGPUCreatePipelineAsyncStatus
forall b. Ptr b -> Int -> WGPUCreatePipelineAsyncStatus -> 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 WGPUCreatePipelineAsyncStatus
-> WGPUCreatePipelineAsyncStatus -> IO ()
$cpoke :: Ptr WGPUCreatePipelineAsyncStatus
-> WGPUCreatePipelineAsyncStatus -> IO ()
peek :: Ptr WGPUCreatePipelineAsyncStatus
-> IO WGPUCreatePipelineAsyncStatus
$cpeek :: Ptr WGPUCreatePipelineAsyncStatus
-> IO WGPUCreatePipelineAsyncStatus
pokeByteOff :: Ptr b -> Int -> WGPUCreatePipelineAsyncStatus -> IO ()
$cpokeByteOff :: forall b. Ptr b -> Int -> WGPUCreatePipelineAsyncStatus -> IO ()
peekByteOff :: Ptr b -> Int -> IO WGPUCreatePipelineAsyncStatus
$cpeekByteOff :: forall b. Ptr b -> Int -> IO WGPUCreatePipelineAsyncStatus
pokeElemOff :: Ptr WGPUCreatePipelineAsyncStatus
-> Int -> WGPUCreatePipelineAsyncStatus -> IO ()
$cpokeElemOff :: Ptr WGPUCreatePipelineAsyncStatus
-> Int -> WGPUCreatePipelineAsyncStatus -> IO ()
peekElemOff :: Ptr WGPUCreatePipelineAsyncStatus
-> Int -> IO WGPUCreatePipelineAsyncStatus
$cpeekElemOff :: Ptr WGPUCreatePipelineAsyncStatus
-> Int -> IO WGPUCreatePipelineAsyncStatus
alignment :: WGPUCreatePipelineAsyncStatus -> Int
$calignment :: WGPUCreatePipelineAsyncStatus -> Int
sizeOf :: WGPUCreatePipelineAsyncStatus -> Int
$csizeOf :: WGPUCreatePipelineAsyncStatus -> Int
Storable)

pattern Success :: forall a. (Eq a, Num a) => a
pattern $bSuccess :: a
$mSuccess :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Success = 0x00000000

pattern Error :: forall a. (Eq a, Num a) => a
pattern $bError :: a
$mError :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Error = 0x00000001

pattern DeviceLost :: forall a. (Eq a, Num a) => a
pattern $bDeviceLost :: a
$mDeviceLost :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
DeviceLost = 0x00000002

pattern DeviceDestroyed :: forall a. (Eq a, Num a) => a
pattern $bDeviceDestroyed :: a
$mDeviceDestroyed :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
DeviceDestroyed = 0x00000003

pattern Unknown :: forall a. (Eq a, Num a) => a
pattern $bUnknown :: a
$mUnknown :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Unknown = 0x00000004