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

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

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

pattern Store :: forall a. (Eq a, Num a) => a
pattern $bStore :: a
$mStore :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Store = 0x00000000

pattern Clear :: forall a. (Eq a, Num a) => a
pattern $bClear :: a
$mClear :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
Clear = 0x00000001