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

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

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

pattern DiscreteGPU :: forall a. (Eq a, Num a) => a
pattern $bDiscreteGPU :: a
$mDiscreteGPU :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
DiscreteGPU = 0x00000000

pattern IntegratedGPU :: forall a. (Eq a, Num a) => a
pattern $bIntegratedGPU :: a
$mIntegratedGPU :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
IntegratedGPU = 0x00000001

pattern CPU :: forall a. (Eq a, Num a) => a
pattern $bCPU :: a
$mCPU :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
CPU = 0x00000002

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