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

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

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

pattern VertexShaderInvocations :: forall a. (Eq a, Num a) => a
pattern $bVertexShaderInvocations :: a
$mVertexShaderInvocations :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
VertexShaderInvocations = 0x00000000

pattern ClipperInvocations :: forall a. (Eq a, Num a) => a
pattern $bClipperInvocations :: a
$mClipperInvocations :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
ClipperInvocations = 0x00000001

pattern ClipperPrimitivesOut :: forall a. (Eq a, Num a) => a
pattern $bClipperPrimitivesOut :: a
$mClipperPrimitivesOut :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
ClipperPrimitivesOut = 0x00000002

pattern FragmentShaderInvocations :: forall a. (Eq a, Num a) => a
pattern $bFragmentShaderInvocations :: a
$mFragmentShaderInvocations :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
FragmentShaderInvocations = 0x00000003

pattern ComputeShaderInvocations :: forall a. (Eq a, Num a) => a
pattern $bComputeShaderInvocations :: a
$mComputeShaderInvocations :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
ComputeShaderInvocations = 0x00000004