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 $c== :: Format -> Format -> Bool == :: Format -> Format -> Bool $c/= :: Format -> Format -> Bool /= :: 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 $ccompare :: Format -> Format -> Ordering compare :: Format -> Format -> Ordering $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 >= :: Format -> Format -> Bool $cmax :: Format -> Format -> Format max :: Format -> Format -> Format $cmin :: Format -> Format -> Format min :: Format -> Format -> 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 $cshowsPrec :: Int -> Format -> ShowS showsPrec :: Int -> Format -> ShowS $cshow :: Format -> String show :: Format -> String $cshowList :: [Format] -> ShowS showList :: [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 $csucc :: Format -> Format succ :: Format -> Format $cpred :: Format -> Format pred :: Format -> Format $ctoEnum :: Int -> Format toEnum :: Int -> Format $cfromEnum :: Format -> Int fromEnum :: Format -> Int $cenumFrom :: Format -> [Format] enumFrom :: Format -> [Format] $cenumFromThen :: Format -> Format -> [Format] enumFromThen :: Format -> Format -> [Format] $cenumFromTo :: Format -> Format -> [Format] enumFromTo :: Format -> Format -> [Format] $cenumFromThenTo :: Format -> Format -> Format -> [Format] enumFromThenTo :: Format -> Format -> Format -> [Format] Enum) pattern FORMAT_UNDEFINED :: Format pattern $mFORMAT_UNDEFINED :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_UNDEFINED :: Format FORMAT_UNDEFINED = Format 0 pattern FORMAT_R16_UINT :: Format pattern $mFORMAT_R16_UINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R16_UINT :: Format FORMAT_R16_UINT = Format 74 pattern FORMAT_R16_SINT :: Format pattern $mFORMAT_R16_SINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R16_SINT :: Format FORMAT_R16_SINT = Format 75 pattern FORMAT_R16_SFLOAT :: Format pattern $mFORMAT_R16_SFLOAT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R16_SFLOAT :: Format FORMAT_R16_SFLOAT = Format 76 pattern FORMAT_R16G16_UINT :: Format pattern $mFORMAT_R16G16_UINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R16G16_UINT :: Format FORMAT_R16G16_UINT = Format 81 pattern FORMAT_R16G16_SINT :: Format pattern $mFORMAT_R16G16_SINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R16G16_SINT :: Format FORMAT_R16G16_SINT = Format 82 pattern FORMAT_R16G16_SFLOAT :: Format pattern $mFORMAT_R16G16_SFLOAT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R16G16_SFLOAT :: Format FORMAT_R16G16_SFLOAT = Format 83 pattern FORMAT_R16G16B16_UINT :: Format pattern $mFORMAT_R16G16B16_UINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R16G16B16_UINT :: Format FORMAT_R16G16B16_UINT = Format 88 pattern FORMAT_R16G16B16_SINT :: Format pattern $mFORMAT_R16G16B16_SINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R16G16B16_SINT :: Format FORMAT_R16G16B16_SINT = Format 89 pattern FORMAT_R16G16B16_SFLOAT :: Format pattern $mFORMAT_R16G16B16_SFLOAT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R16G16B16_SFLOAT :: Format FORMAT_R16G16B16_SFLOAT = Format 90 pattern FORMAT_R16G16B16A16_UINT :: Format pattern $mFORMAT_R16G16B16A16_UINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R16G16B16A16_UINT :: Format FORMAT_R16G16B16A16_UINT = Format 95 pattern FORMAT_R16G16B16A16_SINT :: Format pattern $mFORMAT_R16G16B16A16_SINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R16G16B16A16_SINT :: Format FORMAT_R16G16B16A16_SINT = Format 96 pattern FORMAT_R16G16B16A16_SFLOAT :: Format pattern $mFORMAT_R16G16B16A16_SFLOAT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R16G16B16A16_SFLOAT :: Format FORMAT_R16G16B16A16_SFLOAT = Format 97 pattern FORMAT_R32_UINT :: Format pattern $mFORMAT_R32_UINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R32_UINT :: Format FORMAT_R32_UINT = Format 98 pattern FORMAT_R32_SINT :: Format pattern $mFORMAT_R32_SINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R32_SINT :: Format FORMAT_R32_SINT = Format 99 pattern FORMAT_R32_SFLOAT :: Format pattern $mFORMAT_R32_SFLOAT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R32_SFLOAT :: Format FORMAT_R32_SFLOAT = Format 100 pattern FORMAT_R32G32_UINT :: Format pattern $mFORMAT_R32G32_UINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R32G32_UINT :: Format FORMAT_R32G32_UINT = Format 101 pattern FORMAT_R32G32_SINT :: Format pattern $mFORMAT_R32G32_SINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R32G32_SINT :: Format FORMAT_R32G32_SINT = Format 102 pattern FORMAT_R32G32_SFLOAT :: Format pattern $mFORMAT_R32G32_SFLOAT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R32G32_SFLOAT :: Format FORMAT_R32G32_SFLOAT = Format 103 pattern FORMAT_R32G32B32_UINT :: Format pattern $mFORMAT_R32G32B32_UINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R32G32B32_UINT :: Format FORMAT_R32G32B32_UINT = Format 104 pattern FORMAT_R32G32B32_SINT :: Format pattern $mFORMAT_R32G32B32_SINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R32G32B32_SINT :: Format FORMAT_R32G32B32_SINT = Format 105 pattern FORMAT_R32G32B32_SFLOAT :: Format pattern $mFORMAT_R32G32B32_SFLOAT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R32G32B32_SFLOAT :: Format FORMAT_R32G32B32_SFLOAT = Format 106 pattern FORMAT_R32G32B32A32_UINT :: Format pattern $mFORMAT_R32G32B32A32_UINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R32G32B32A32_UINT :: Format FORMAT_R32G32B32A32_UINT = Format 107 pattern FORMAT_R32G32B32A32_SINT :: Format pattern $mFORMAT_R32G32B32A32_SINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R32G32B32A32_SINT :: Format FORMAT_R32G32B32A32_SINT = Format 108 pattern FORMAT_R32G32B32A32_SFLOAT :: Format pattern $mFORMAT_R32G32B32A32_SFLOAT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R32G32B32A32_SFLOAT :: Format FORMAT_R32G32B32A32_SFLOAT = Format 109 pattern FORMAT_R64_UINT :: Format pattern $mFORMAT_R64_UINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R64_UINT :: Format FORMAT_R64_UINT = Format 110 pattern FORMAT_R64_SINT :: Format pattern $mFORMAT_R64_SINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R64_SINT :: Format FORMAT_R64_SINT = Format 111 pattern FORMAT_R64_SFLOAT :: Format pattern $mFORMAT_R64_SFLOAT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R64_SFLOAT :: Format FORMAT_R64_SFLOAT = Format 112 pattern FORMAT_R64G64_UINT :: Format pattern $mFORMAT_R64G64_UINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R64G64_UINT :: Format FORMAT_R64G64_UINT = Format 113 pattern FORMAT_R64G64_SINT :: Format pattern $mFORMAT_R64G64_SINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R64G64_SINT :: Format FORMAT_R64G64_SINT = Format 114 pattern FORMAT_R64G64_SFLOAT :: Format pattern $mFORMAT_R64G64_SFLOAT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R64G64_SFLOAT :: Format FORMAT_R64G64_SFLOAT = Format 115 pattern FORMAT_R64G64B64_UINT :: Format pattern $mFORMAT_R64G64B64_UINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R64G64B64_UINT :: Format FORMAT_R64G64B64_UINT = Format 116 pattern FORMAT_R64G64B64_SINT :: Format pattern $mFORMAT_R64G64B64_SINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R64G64B64_SINT :: Format FORMAT_R64G64B64_SINT = Format 117 pattern FORMAT_R64G64B64_SFLOAT :: Format pattern $mFORMAT_R64G64B64_SFLOAT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R64G64B64_SFLOAT :: Format FORMAT_R64G64B64_SFLOAT = Format 118 pattern FORMAT_R64G64B64A64_UINT :: Format pattern $mFORMAT_R64G64B64A64_UINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R64G64B64A64_UINT :: Format FORMAT_R64G64B64A64_UINT = Format 119 pattern FORMAT_R64G64B64A64_SINT :: Format pattern $mFORMAT_R64G64B64A64_SINT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R64G64B64A64_SINT :: Format FORMAT_R64G64B64A64_SINT = Format 120 pattern FORMAT_R64G64B64A64_SFLOAT :: Format pattern $mFORMAT_R64G64B64A64_SFLOAT :: forall {r}. Format -> ((# #) -> r) -> ((# #) -> r) -> r $bFORMAT_R64G64B64A64_SFLOAT :: Format FORMAT_R64G64B64A64_SFLOAT = Format 121 formatName :: IsString label => Format -> Maybe label formatName :: forall label. IsString label => 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 :: forall label. IsString label => [(Format, label)] formatNames = [ (Format FORMAT_UNDEFINED, label "UNDEFINED") , (Format FORMAT_R16_UINT, label "FORMAT_R16_UINT") , (Format FORMAT_R16_SINT, label "FORMAT_R16_SINT") , (Format FORMAT_R16_SFLOAT, label "FORMAT_R16_SFLOAT") , (Format FORMAT_R16G16_UINT, label "FORMAT_R16G16_UINT") , (Format FORMAT_R16G16_SINT, label "FORMAT_R16G16_SINT") , (Format FORMAT_R16G16_SFLOAT, label "FORMAT_R16G16_SFLOAT") , (Format FORMAT_R16G16B16_UINT, label "FORMAT_R16G16B16_UINT") , (Format FORMAT_R16G16B16_SINT, label "FORMAT_R16G16B16_SINT") , (Format FORMAT_R16G16B16_SFLOAT, label "FORMAT_R16G16B16_SFLOAT") , (Format FORMAT_R16G16B16A16_UINT, label "FORMAT_R16G16B16A16_UINT") , (Format FORMAT_R16G16B16A16_SINT, label "FORMAT_R16G16B16A16_SINT") , (Format FORMAT_R16G16B16A16_SFLOAT, label "FORMAT_R16G16B16A16_SFLOAT") , (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") ]