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

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

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

pattern TEXTURE_ADAPTER_SPECIFIC_FORMAT_FEATURES :: forall a. (Eq a, Num a) => a
pattern $bTEXTURE_ADAPTER_SPECIFIC_FORMAT_FEATURES :: a
$mTEXTURE_ADAPTER_SPECIFIC_FORMAT_FEATURES :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
TEXTURE_ADAPTER_SPECIFIC_FORMAT_FEATURES = 0x10000000