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

-- This file was generated by wgpu-raw-hs-codegen on:
--   2021-08-25T10:02:03.522705
-- Using wgpu-native git hash:
--   b10496e7eed9349f0fd541e6dfe5029cb436de74 wgpu-native (v0.9.2.2)

module WGPU.Raw.Generated.Enum.WGPUBufferMapAsyncStatus where

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

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

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 = 0x00000003

pattern DestroyedBeforeCallback :: forall a. (Eq a, Num a) => a
pattern $bDestroyedBeforeCallback :: a
$mDestroyedBeforeCallback :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
DestroyedBeforeCallback = 0x00000004

pattern UnmappedBeforeCallback :: forall a. (Eq a, Num a) => a
pattern $bUnmappedBeforeCallback :: a
$mUnmappedBeforeCallback :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
UnmappedBeforeCallback = 0x00000005