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

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

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

pattern DeviceExtras :: forall a. (Eq a, Num a) => a
pattern $bDeviceExtras :: a
$mDeviceExtras :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
DeviceExtras = 0x60000001

pattern AdapterExtras :: forall a. (Eq a, Num a) => a
pattern $bAdapterExtras :: a
$mAdapterExtras :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
AdapterExtras = 0x60000002