module Data.SpirV.Reflect.Enums.Format where

import Data.SpirV.Reflect.Enums.Common

newtype Format = Format Int
  deriving (Format -> Format -> Bool
(Format -> Format -> Bool)
-> (Format -> Format -> Bool) -> Eq Format
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Format -> Format -> Bool
$c/= :: Format -> Format -> Bool
== :: Format -> Format -> Bool
$c== :: Format -> Format -> Bool
Eq, Eq Format
Eq Format
-> (Format -> Format -> Ordering)
-> (Format -> Format -> Bool)
-> (Format -> Format -> Bool)
-> (Format -> Format -> Bool)
-> (Format -> Format -> Bool)
-> (Format -> Format -> Format)
-> (Format -> Format -> Format)
-> Ord Format
Format -> Format -> Bool
Format -> Format -> Ordering
Format -> Format -> Format
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: Format -> Format -> Format
$cmin :: Format -> Format -> Format
max :: Format -> Format -> Format
$cmax :: Format -> Format -> Format
>= :: Format -> Format -> Bool
$c>= :: Format -> Format -> Bool
> :: Format -> Format -> Bool
$c> :: Format -> Format -> Bool
<= :: Format -> Format -> Bool
$c<= :: Format -> Format -> Bool
< :: Format -> Format -> Bool
$c< :: Format -> Format -> Bool
compare :: Format -> Format -> Ordering
$ccompare :: Format -> Format -> Ordering
$cp1Ord :: Eq Format
Ord, Int -> Format -> ShowS
[Format] -> ShowS
Format -> String
(Int -> Format -> ShowS)
-> (Format -> String) -> ([Format] -> ShowS) -> Show Format
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Format] -> ShowS
$cshowList :: [Format] -> ShowS
show :: Format -> String
$cshow :: Format -> String
showsPrec :: Int -> Format -> ShowS
$cshowsPrec :: Int -> Format -> ShowS
Show, Int -> Format
Format -> Int
Format -> [Format]
Format -> Format
Format -> Format -> [Format]
Format -> Format -> Format -> [Format]
(Format -> Format)
-> (Format -> Format)
-> (Int -> Format)
-> (Format -> Int)
-> (Format -> [Format])
-> (Format -> Format -> [Format])
-> (Format -> Format -> [Format])
-> (Format -> Format -> Format -> [Format])
-> Enum Format
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
enumFromThenTo :: Format -> Format -> Format -> [Format]
$cenumFromThenTo :: Format -> Format -> Format -> [Format]
enumFromTo :: Format -> Format -> [Format]
$cenumFromTo :: Format -> Format -> [Format]
enumFromThen :: Format -> Format -> [Format]
$cenumFromThen :: Format -> Format -> [Format]
enumFrom :: Format -> [Format]
$cenumFrom :: Format -> [Format]
fromEnum :: Format -> Int
$cfromEnum :: Format -> Int
toEnum :: Int -> Format
$ctoEnum :: Int -> Format
pred :: Format -> Format
$cpred :: Format -> Format
succ :: Format -> Format
$csucc :: Format -> Format
Enum)

pattern FORMAT_UNDEFINED :: Format
pattern $bFORMAT_UNDEFINED :: Format
$mFORMAT_UNDEFINED :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_UNDEFINED = Format 0

pattern FORMAT_R32_UINT :: Format
pattern $bFORMAT_R32_UINT :: Format
$mFORMAT_R32_UINT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R32_UINT = Format 98

pattern FORMAT_R32_SINT :: Format
pattern $bFORMAT_R32_SINT :: Format
$mFORMAT_R32_SINT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R32_SINT = Format 99

pattern FORMAT_R32_SFLOAT :: Format
pattern $bFORMAT_R32_SFLOAT :: Format
$mFORMAT_R32_SFLOAT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R32_SFLOAT = Format 100

pattern FORMAT_R32G32_UINT :: Format
pattern $bFORMAT_R32G32_UINT :: Format
$mFORMAT_R32G32_UINT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R32G32_UINT = Format 101

pattern FORMAT_R32G32_SINT :: Format
pattern $bFORMAT_R32G32_SINT :: Format
$mFORMAT_R32G32_SINT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R32G32_SINT = Format 102

pattern FORMAT_R32G32_SFLOAT :: Format
pattern $bFORMAT_R32G32_SFLOAT :: Format
$mFORMAT_R32G32_SFLOAT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R32G32_SFLOAT = Format 103

pattern FORMAT_R32G32B32_UINT :: Format
pattern $bFORMAT_R32G32B32_UINT :: Format
$mFORMAT_R32G32B32_UINT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R32G32B32_UINT = Format 104

pattern FORMAT_R32G32B32_SINT :: Format
pattern $bFORMAT_R32G32B32_SINT :: Format
$mFORMAT_R32G32B32_SINT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R32G32B32_SINT = Format 105

pattern FORMAT_R32G32B32_SFLOAT :: Format
pattern $bFORMAT_R32G32B32_SFLOAT :: Format
$mFORMAT_R32G32B32_SFLOAT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R32G32B32_SFLOAT = Format 106

pattern FORMAT_R32G32B32A32_UINT :: Format
pattern $bFORMAT_R32G32B32A32_UINT :: Format
$mFORMAT_R32G32B32A32_UINT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R32G32B32A32_UINT = Format 107

pattern FORMAT_R32G32B32A32_SINT :: Format
pattern $bFORMAT_R32G32B32A32_SINT :: Format
$mFORMAT_R32G32B32A32_SINT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R32G32B32A32_SINT = Format 108

pattern FORMAT_R32G32B32A32_SFLOAT :: Format
pattern $bFORMAT_R32G32B32A32_SFLOAT :: Format
$mFORMAT_R32G32B32A32_SFLOAT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R32G32B32A32_SFLOAT = Format 109

pattern FORMAT_R64_UINT :: Format
pattern $bFORMAT_R64_UINT :: Format
$mFORMAT_R64_UINT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R64_UINT = Format 110

pattern FORMAT_R64_SINT :: Format
pattern $bFORMAT_R64_SINT :: Format
$mFORMAT_R64_SINT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R64_SINT = Format 111

pattern FORMAT_R64_SFLOAT :: Format
pattern $bFORMAT_R64_SFLOAT :: Format
$mFORMAT_R64_SFLOAT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R64_SFLOAT = Format 112

pattern FORMAT_R64G64_UINT :: Format
pattern $bFORMAT_R64G64_UINT :: Format
$mFORMAT_R64G64_UINT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R64G64_UINT = Format 113

pattern FORMAT_R64G64_SINT :: Format
pattern $bFORMAT_R64G64_SINT :: Format
$mFORMAT_R64G64_SINT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R64G64_SINT = Format 114

pattern FORMAT_R64G64_SFLOAT :: Format
pattern $bFORMAT_R64G64_SFLOAT :: Format
$mFORMAT_R64G64_SFLOAT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R64G64_SFLOAT = Format 115

pattern FORMAT_R64G64B64_UINT :: Format
pattern $bFORMAT_R64G64B64_UINT :: Format
$mFORMAT_R64G64B64_UINT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R64G64B64_UINT = Format 116

pattern FORMAT_R64G64B64_SINT :: Format
pattern $bFORMAT_R64G64B64_SINT :: Format
$mFORMAT_R64G64B64_SINT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R64G64B64_SINT = Format 117

pattern FORMAT_R64G64B64_SFLOAT :: Format
pattern $bFORMAT_R64G64B64_SFLOAT :: Format
$mFORMAT_R64G64B64_SFLOAT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R64G64B64_SFLOAT = Format 118

pattern FORMAT_R64G64B64A64_UINT :: Format
pattern $bFORMAT_R64G64B64A64_UINT :: Format
$mFORMAT_R64G64B64A64_UINT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R64G64B64A64_UINT = Format 119

pattern FORMAT_R64G64B64A64_SINT :: Format
pattern $bFORMAT_R64G64B64A64_SINT :: Format
$mFORMAT_R64G64B64A64_SINT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R64G64B64A64_SINT = Format 120

pattern FORMAT_R64G64B64A64_SFLOAT :: Format
pattern $bFORMAT_R64G64B64A64_SFLOAT :: Format
$mFORMAT_R64G64B64A64_SFLOAT :: forall r. Format -> (Void# -> r) -> (Void# -> r) -> r
FORMAT_R64G64B64A64_SFLOAT = Format 121

formatName :: IsString label => Format -> Maybe label
formatName :: Format -> Maybe label
formatName = [(Format, label)] -> Format -> Maybe label
forall i label. Enum i => [(i, label)] -> i -> Maybe label
toLabel [(Format, label)]
forall label. IsString label => [(Format, label)]
formatNames

formatNames :: IsString label => [(Format, label)]
formatNames :: [(Format, label)]
formatNames =
  [ (Format
FORMAT_UNDEFINED, label
"UNDEFINED")
  , (Format
FORMAT_R32_UINT, label
"R32_UINT")
  , (Format
FORMAT_R32_SINT, label
"R32_SINT")
  , (Format
FORMAT_R32_SFLOAT, label
"R32_SFLOAT")
  , (Format
FORMAT_R32G32_UINT, label
"R32G32_UINT")
  , (Format
FORMAT_R32G32_SINT, label
"R32G32_SINT")
  , (Format
FORMAT_R32G32_SFLOAT, label
"R32G32_SFLOAT")
  , (Format
FORMAT_R32G32B32_UINT, label
"R32G32B32_UINT")
  , (Format
FORMAT_R32G32B32_SINT, label
"R32G32B32_SINT")
  , (Format
FORMAT_R32G32B32_SFLOAT, label
"R32G32B32_SFLOAT")
  , (Format
FORMAT_R32G32B32A32_UINT, label
"R32G32B32A32_UINT")
  , (Format
FORMAT_R32G32B32A32_SINT, label
"R32G32B32A32_SINT")
  , (Format
FORMAT_R32G32B32A32_SFLOAT, label
"R32G32B32A32_SFLOAT")
  , (Format
FORMAT_R64_UINT, label
"R64_UINT")
  , (Format
FORMAT_R64_SINT, label
"R64_SINT")
  , (Format
FORMAT_R64_SFLOAT, label
"R64_SFLOAT")
  , (Format
FORMAT_R64G64_UINT, label
"R64G64_UINT")
  , (Format
FORMAT_R64G64_SINT, label
"R64G64_SINT")
  , (Format
FORMAT_R64G64_SFLOAT, label
"R64G64_SFLOAT")
  , (Format
FORMAT_R64G64B64_UINT, label
"R64G64B64_UINT")
  , (Format
FORMAT_R64G64B64_SINT, label
"R64G64B64_SINT")
  , (Format
FORMAT_R64G64B64_SFLOAT, label
"R64G64B64_SFLOAT")
  , (Format
FORMAT_R64G64B64A64_UINT, label
"R64G64B64A64_UINT")
  , (Format
FORMAT_R64G64B64A64_SINT, label
"R64G64B64A64_SINT")
  , (Format
FORMAT_R64G64B64A64_SFLOAT, label
"R64G64B64A64_SFLOAT")
  ]