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

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

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

pattern Occlusion :: forall a. (Eq a, Num a) => a
pattern $bOcclusion :: a
$mOcclusion :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Occlusion = 0x00000000

pattern PipelineStatistics :: forall a. (Eq a, Num a) => a
pattern $bPipelineStatistics :: a
$mPipelineStatistics :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
PipelineStatistics = 0x00000001

pattern Timestamp :: forall a. (Eq a, Num a) => a
pattern $bTimestamp :: a
$mTimestamp :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Timestamp = 0x00000002