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

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

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

pattern Undefined :: forall a. (Eq a, Num a) => a
pattern $bUndefined :: a
$mUndefined :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Undefined = 0x00000000

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

pattern UnfilterableFloat :: forall a. (Eq a, Num a) => a
pattern $bUnfilterableFloat :: a
$mUnfilterableFloat :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
UnfilterableFloat = 0x00000002

pattern Depth :: forall a. (Eq a, Num a) => a
pattern $bDepth :: a
$mDepth :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Depth = 0x00000003

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

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