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

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

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

pattern CCW :: forall a. (Eq a, Num a) => a
pattern $bCCW :: a
$mCCW :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
CCW = 0x00000000

pattern CW :: forall a. (Eq a, Num a) => a
pattern $bCW :: a
$mCW :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
CW = 0x00000001