{-# LANGUAGE GeneralizedNewtypeDeriving #-} {-# LANGUAGE DerivingStrategies #-} {-# LANGUAGE PatternSynonyms #-} {-# LANGUAGE TypeSynonymInstances #-} module Data.SpirV.Enum.QuantizationModes where import Data.Word (Word32) import Foreign.Storable (Storable) newtype QuantizationModes = QuantizationModes Word32 deriving newtype (QuantizationModes -> QuantizationModes -> Bool (QuantizationModes -> QuantizationModes -> Bool) -> (QuantizationModes -> QuantizationModes -> Bool) -> Eq QuantizationModes forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a $c== :: QuantizationModes -> QuantizationModes -> Bool == :: QuantizationModes -> QuantizationModes -> Bool $c/= :: QuantizationModes -> QuantizationModes -> Bool /= :: QuantizationModes -> QuantizationModes -> Bool Eq, Eq QuantizationModes Eq QuantizationModes => (QuantizationModes -> QuantizationModes -> Ordering) -> (QuantizationModes -> QuantizationModes -> Bool) -> (QuantizationModes -> QuantizationModes -> Bool) -> (QuantizationModes -> QuantizationModes -> Bool) -> (QuantizationModes -> QuantizationModes -> Bool) -> (QuantizationModes -> QuantizationModes -> QuantizationModes) -> (QuantizationModes -> QuantizationModes -> QuantizationModes) -> Ord QuantizationModes QuantizationModes -> QuantizationModes -> Bool QuantizationModes -> QuantizationModes -> Ordering QuantizationModes -> QuantizationModes -> QuantizationModes 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 :: QuantizationModes -> QuantizationModes -> Ordering compare :: QuantizationModes -> QuantizationModes -> Ordering $c< :: QuantizationModes -> QuantizationModes -> Bool < :: QuantizationModes -> QuantizationModes -> Bool $c<= :: QuantizationModes -> QuantizationModes -> Bool <= :: QuantizationModes -> QuantizationModes -> Bool $c> :: QuantizationModes -> QuantizationModes -> Bool > :: QuantizationModes -> QuantizationModes -> Bool $c>= :: QuantizationModes -> QuantizationModes -> Bool >= :: QuantizationModes -> QuantizationModes -> Bool $cmax :: QuantizationModes -> QuantizationModes -> QuantizationModes max :: QuantizationModes -> QuantizationModes -> QuantizationModes $cmin :: QuantizationModes -> QuantizationModes -> QuantizationModes min :: QuantizationModes -> QuantizationModes -> QuantizationModes Ord, Ptr QuantizationModes -> IO QuantizationModes Ptr QuantizationModes -> Int -> IO QuantizationModes Ptr QuantizationModes -> Int -> QuantizationModes -> IO () Ptr QuantizationModes -> QuantizationModes -> IO () QuantizationModes -> Int (QuantizationModes -> Int) -> (QuantizationModes -> Int) -> (Ptr QuantizationModes -> Int -> IO QuantizationModes) -> (Ptr QuantizationModes -> Int -> QuantizationModes -> IO ()) -> (forall b. Ptr b -> Int -> IO QuantizationModes) -> (forall b. Ptr b -> Int -> QuantizationModes -> IO ()) -> (Ptr QuantizationModes -> IO QuantizationModes) -> (Ptr QuantizationModes -> QuantizationModes -> IO ()) -> Storable QuantizationModes forall b. Ptr b -> Int -> IO QuantizationModes forall b. Ptr b -> Int -> QuantizationModes -> 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 $csizeOf :: QuantizationModes -> Int sizeOf :: QuantizationModes -> Int $calignment :: QuantizationModes -> Int alignment :: QuantizationModes -> Int $cpeekElemOff :: Ptr QuantizationModes -> Int -> IO QuantizationModes peekElemOff :: Ptr QuantizationModes -> Int -> IO QuantizationModes $cpokeElemOff :: Ptr QuantizationModes -> Int -> QuantizationModes -> IO () pokeElemOff :: Ptr QuantizationModes -> Int -> QuantizationModes -> IO () $cpeekByteOff :: forall b. Ptr b -> Int -> IO QuantizationModes peekByteOff :: forall b. Ptr b -> Int -> IO QuantizationModes $cpokeByteOff :: forall b. Ptr b -> Int -> QuantizationModes -> IO () pokeByteOff :: forall b. Ptr b -> Int -> QuantizationModes -> IO () $cpeek :: Ptr QuantizationModes -> IO QuantizationModes peek :: Ptr QuantizationModes -> IO QuantizationModes $cpoke :: Ptr QuantizationModes -> QuantizationModes -> IO () poke :: Ptr QuantizationModes -> QuantizationModes -> IO () Storable) instance Show QuantizationModes where showsPrec :: Int -> QuantizationModes -> ShowS showsPrec Int p (QuantizationModes Word32 v) = case Word32 v of Word32 0 -> String -> ShowS showString String "TRN" Word32 1 -> String -> ShowS showString String "TRN_ZERO" Word32 2 -> String -> ShowS showString String "RND" Word32 3 -> String -> ShowS showString String "RND_ZERO" Word32 4 -> String -> ShowS showString String "RND_INF" Word32 5 -> String -> ShowS showString String "RND_MIN_INF" Word32 6 -> String -> ShowS showString String "RND_CONV" Word32 7 -> String -> ShowS showString String "RND_CONV_ODD" Word32 x -> Bool -> ShowS -> ShowS showParen (Int p Int -> Int -> Bool forall a. Ord a => a -> a -> Bool > Int 10) (ShowS -> ShowS) -> ShowS -> ShowS forall a b. (a -> b) -> a -> b $ String -> ShowS showString String "QuantizationModes " ShowS -> ShowS -> ShowS forall b c a. (b -> c) -> (a -> b) -> a -> c . Int -> Word32 -> ShowS forall a. Show a => Int -> a -> ShowS showsPrec (Int p Int -> Int -> Int forall a. Num a => a -> a -> a + Int 1) Word32 x pattern TRN :: QuantizationModes pattern $mTRN :: forall {r}. QuantizationModes -> ((# #) -> r) -> ((# #) -> r) -> r $bTRN :: QuantizationModes TRN = QuantizationModes 0 pattern TRN_ZERO :: QuantizationModes pattern $mTRN_ZERO :: forall {r}. QuantizationModes -> ((# #) -> r) -> ((# #) -> r) -> r $bTRN_ZERO :: QuantizationModes TRN_ZERO = QuantizationModes 1 pattern RND :: QuantizationModes pattern $mRND :: forall {r}. QuantizationModes -> ((# #) -> r) -> ((# #) -> r) -> r $bRND :: QuantizationModes RND = QuantizationModes 2 pattern RND_ZERO :: QuantizationModes pattern $mRND_ZERO :: forall {r}. QuantizationModes -> ((# #) -> r) -> ((# #) -> r) -> r $bRND_ZERO :: QuantizationModes RND_ZERO = QuantizationModes 3 pattern RND_INF :: QuantizationModes pattern $mRND_INF :: forall {r}. QuantizationModes -> ((# #) -> r) -> ((# #) -> r) -> r $bRND_INF :: QuantizationModes RND_INF = QuantizationModes 4 pattern RND_MIN_INF :: QuantizationModes pattern $mRND_MIN_INF :: forall {r}. QuantizationModes -> ((# #) -> r) -> ((# #) -> r) -> r $bRND_MIN_INF :: QuantizationModes RND_MIN_INF = QuantizationModes 5 pattern RND_CONV :: QuantizationModes pattern $mRND_CONV :: forall {r}. QuantizationModes -> ((# #) -> r) -> ((# #) -> r) -> r $bRND_CONV :: QuantizationModes RND_CONV = QuantizationModes 6 pattern RND_CONV_ODD :: QuantizationModes pattern $mRND_CONV_ODD :: forall {r}. QuantizationModes -> ((# #) -> r) -> ((# #) -> r) -> r $bRND_CONV_ODD :: QuantizationModes RND_CONV_ODD = QuantizationModes 7