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

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

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

pattern Float :: forall a. (Eq a, Num a) => a
pattern $bFloat :: a
$mFloat :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Float = 0x00000000

pattern Sint :: forall a. (Eq a, Num a) => a
pattern $bSint :: a
$mSint :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Sint = 0x00000001

pattern Uint :: forall a. (Eq a, Num a) => a
pattern $bUint :: a
$mUint :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Uint = 0x00000002

pattern DepthComparison :: forall a. (Eq a, Num a) => a
pattern $bDepthComparison :: a
$mDepthComparison :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
DepthComparison = 0x00000003