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

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

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

pattern Null :: forall a. (Eq a, Num a) => a
pattern $bNull :: a
$mNull :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Null = 0x00000000

pattern D3D11 :: forall a. (Eq a, Num a) => a
pattern $bD3D11 :: a
$mD3D11 :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
D3D11 = 0x00000001

pattern D3D12 :: forall a. (Eq a, Num a) => a
pattern $bD3D12 :: a
$mD3D12 :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
D3D12 = 0x00000002

pattern Metal :: forall a. (Eq a, Num a) => a
pattern $bMetal :: a
$mMetal :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Metal = 0x00000003

pattern Vulkan :: forall a. (Eq a, Num a) => a
pattern $bVulkan :: a
$mVulkan :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Vulkan = 0x00000004

pattern OpenGL :: forall a. (Eq a, Num a) => a
pattern $bOpenGL :: a
$mOpenGL :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
OpenGL = 0x00000005

pattern OpenGLES :: forall a. (Eq a, Num a) => a
pattern $bOpenGLES :: a
$mOpenGLES :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
OpenGLES = 0x00000006