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

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

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

pattern Undefined :: forall a. (Eq a, Num a) => a
pattern $bUndefined :: a
$mUndefined :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Undefined = 0x00000000

pattern Uint16 :: forall a. (Eq a, Num a) => a
pattern $bUint16 :: a
$mUint16 :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Uint16 = 0x00000001

pattern Uint32 :: forall a. (Eq a, Num a) => a
pattern $bUint32 :: a
$mUint32 :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Uint32 = 0x00000002