{-# 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.WGPUSType where

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

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

pattern Invalid :: forall a. (Eq a, Num a) => a
pattern $bInvalid :: a
$mInvalid :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Invalid = 0x00000000

pattern SurfaceDescriptorFromMetalLayer :: forall a. (Eq a, Num a) => a
pattern $bSurfaceDescriptorFromMetalLayer :: a
$mSurfaceDescriptorFromMetalLayer :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
SurfaceDescriptorFromMetalLayer = 0x00000001

pattern SurfaceDescriptorFromWindowsHWND :: forall a. (Eq a, Num a) => a
pattern $bSurfaceDescriptorFromWindowsHWND :: a
$mSurfaceDescriptorFromWindowsHWND :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
SurfaceDescriptorFromWindowsHWND = 0x00000002

pattern SurfaceDescriptorFromXlib :: forall a. (Eq a, Num a) => a
pattern $bSurfaceDescriptorFromXlib :: a
$mSurfaceDescriptorFromXlib :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
SurfaceDescriptorFromXlib = 0x00000003

pattern SurfaceDescriptorFromCanvasHTMLSelector :: forall a. (Eq a, Num a) => a
pattern $bSurfaceDescriptorFromCanvasHTMLSelector :: a
$mSurfaceDescriptorFromCanvasHTMLSelector :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
SurfaceDescriptorFromCanvasHTMLSelector = 0x00000004

pattern ShaderModuleSPIRVDescriptor :: forall a. (Eq a, Num a) => a
pattern $bShaderModuleSPIRVDescriptor :: a
$mShaderModuleSPIRVDescriptor :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
ShaderModuleSPIRVDescriptor = 0x00000005

pattern ShaderModuleWGSLDescriptor :: forall a. (Eq a, Num a) => a
pattern $bShaderModuleWGSLDescriptor :: a
$mShaderModuleWGSLDescriptor :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
ShaderModuleWGSLDescriptor = 0x00000006

pattern PrimitiveDepthClampingState :: forall a. (Eq a, Num a) => a
pattern $bPrimitiveDepthClampingState :: a
$mPrimitiveDepthClampingState :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
PrimitiveDepthClampingState = 0x00000007