{-# language CPP #-}
-- No documentation found for Chapter "InputSourceLocalizedNameFlags"
module OpenXR.Core10.Enums.InputSourceLocalizedNameFlags  (InputSourceLocalizedNameFlags(..)) where

import OpenXR.Internal.Utils (enumReadPrec)
import OpenXR.Internal.Utils (enumShowsPrec)
import GHC.Show (showString)
import Numeric (showHex)
import OpenXR.Zero (Zero)
import Data.Bits (Bits)
import Data.Bits (FiniteBits)
import Foreign.Storable (Storable)
import GHC.Read (Read(readPrec))
import GHC.Show (Show(showsPrec))
import OpenXR.Core10.FundamentalTypes (Flags64)
-- | XrInputSourceLocalizedNameFlags - Input source localized name flags
--
-- == Flag Descriptions
--
-- = See Also
--
-- 'OpenXR.Core10.Input.InputSourceLocalizedNameGetInfo',
-- 'OpenXR.Core10.Input.getInputSourceLocalizedName'
newtype InputSourceLocalizedNameFlags = InputSourceLocalizedNameFlags Flags64
  deriving newtype (InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Bool
(InputSourceLocalizedNameFlags
 -> InputSourceLocalizedNameFlags -> Bool)
-> (InputSourceLocalizedNameFlags
    -> InputSourceLocalizedNameFlags -> Bool)
-> Eq InputSourceLocalizedNameFlags
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Bool
$c/= :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Bool
== :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Bool
$c== :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Bool
Eq, Eq InputSourceLocalizedNameFlags
Eq InputSourceLocalizedNameFlags =>
(InputSourceLocalizedNameFlags
 -> InputSourceLocalizedNameFlags -> Ordering)
-> (InputSourceLocalizedNameFlags
    -> InputSourceLocalizedNameFlags -> Bool)
-> (InputSourceLocalizedNameFlags
    -> InputSourceLocalizedNameFlags -> Bool)
-> (InputSourceLocalizedNameFlags
    -> InputSourceLocalizedNameFlags -> Bool)
-> (InputSourceLocalizedNameFlags
    -> InputSourceLocalizedNameFlags -> Bool)
-> (InputSourceLocalizedNameFlags
    -> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags)
-> (InputSourceLocalizedNameFlags
    -> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags)
-> Ord InputSourceLocalizedNameFlags
InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Bool
InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Ordering
InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags
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 :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags
$cmin :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags
max :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags
$cmax :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags
>= :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Bool
$c>= :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Bool
> :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Bool
$c> :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Bool
<= :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Bool
$c<= :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Bool
< :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Bool
$c< :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Bool
compare :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Ordering
$ccompare :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> Ordering
$cp1Ord :: Eq InputSourceLocalizedNameFlags
Ord, Ptr b -> Int -> IO InputSourceLocalizedNameFlags
Ptr b -> Int -> InputSourceLocalizedNameFlags -> IO ()
Ptr InputSourceLocalizedNameFlags
-> IO InputSourceLocalizedNameFlags
Ptr InputSourceLocalizedNameFlags
-> Int -> IO InputSourceLocalizedNameFlags
Ptr InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags -> IO ()
Ptr InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> IO ()
InputSourceLocalizedNameFlags -> Int
(InputSourceLocalizedNameFlags -> Int)
-> (InputSourceLocalizedNameFlags -> Int)
-> (Ptr InputSourceLocalizedNameFlags
    -> Int -> IO InputSourceLocalizedNameFlags)
-> (Ptr InputSourceLocalizedNameFlags
    -> Int -> InputSourceLocalizedNameFlags -> IO ())
-> (forall b. Ptr b -> Int -> IO InputSourceLocalizedNameFlags)
-> (forall b.
    Ptr b -> Int -> InputSourceLocalizedNameFlags -> IO ())
-> (Ptr InputSourceLocalizedNameFlags
    -> IO InputSourceLocalizedNameFlags)
-> (Ptr InputSourceLocalizedNameFlags
    -> InputSourceLocalizedNameFlags -> IO ())
-> Storable InputSourceLocalizedNameFlags
forall b. Ptr b -> Int -> IO InputSourceLocalizedNameFlags
forall b. Ptr b -> Int -> InputSourceLocalizedNameFlags -> 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 InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> IO ()
$cpoke :: Ptr InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> IO ()
peek :: Ptr InputSourceLocalizedNameFlags
-> IO InputSourceLocalizedNameFlags
$cpeek :: Ptr InputSourceLocalizedNameFlags
-> IO InputSourceLocalizedNameFlags
pokeByteOff :: Ptr b -> Int -> InputSourceLocalizedNameFlags -> IO ()
$cpokeByteOff :: forall b. Ptr b -> Int -> InputSourceLocalizedNameFlags -> IO ()
peekByteOff :: Ptr b -> Int -> IO InputSourceLocalizedNameFlags
$cpeekByteOff :: forall b. Ptr b -> Int -> IO InputSourceLocalizedNameFlags
pokeElemOff :: Ptr InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags -> IO ()
$cpokeElemOff :: Ptr InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags -> IO ()
peekElemOff :: Ptr InputSourceLocalizedNameFlags
-> Int -> IO InputSourceLocalizedNameFlags
$cpeekElemOff :: Ptr InputSourceLocalizedNameFlags
-> Int -> IO InputSourceLocalizedNameFlags
alignment :: InputSourceLocalizedNameFlags -> Int
$calignment :: InputSourceLocalizedNameFlags -> Int
sizeOf :: InputSourceLocalizedNameFlags -> Int
$csizeOf :: InputSourceLocalizedNameFlags -> Int
Storable, InputSourceLocalizedNameFlags
InputSourceLocalizedNameFlags -> Zero InputSourceLocalizedNameFlags
forall a. a -> Zero a
zero :: InputSourceLocalizedNameFlags
$czero :: InputSourceLocalizedNameFlags
Zero, Eq InputSourceLocalizedNameFlags
InputSourceLocalizedNameFlags
Eq InputSourceLocalizedNameFlags =>
(InputSourceLocalizedNameFlags
 -> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags)
-> (InputSourceLocalizedNameFlags
    -> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags)
-> (InputSourceLocalizedNameFlags
    -> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags)
-> (InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags)
-> (InputSourceLocalizedNameFlags
    -> Int -> InputSourceLocalizedNameFlags)
-> (InputSourceLocalizedNameFlags
    -> Int -> InputSourceLocalizedNameFlags)
-> InputSourceLocalizedNameFlags
-> (Int -> InputSourceLocalizedNameFlags)
-> (InputSourceLocalizedNameFlags
    -> Int -> InputSourceLocalizedNameFlags)
-> (InputSourceLocalizedNameFlags
    -> Int -> InputSourceLocalizedNameFlags)
-> (InputSourceLocalizedNameFlags
    -> Int -> InputSourceLocalizedNameFlags)
-> (InputSourceLocalizedNameFlags -> Int -> Bool)
-> (InputSourceLocalizedNameFlags -> Maybe Int)
-> (InputSourceLocalizedNameFlags -> Int)
-> (InputSourceLocalizedNameFlags -> Bool)
-> (InputSourceLocalizedNameFlags
    -> Int -> InputSourceLocalizedNameFlags)
-> (InputSourceLocalizedNameFlags
    -> Int -> InputSourceLocalizedNameFlags)
-> (InputSourceLocalizedNameFlags
    -> Int -> InputSourceLocalizedNameFlags)
-> (InputSourceLocalizedNameFlags
    -> Int -> InputSourceLocalizedNameFlags)
-> (InputSourceLocalizedNameFlags
    -> Int -> InputSourceLocalizedNameFlags)
-> (InputSourceLocalizedNameFlags
    -> Int -> InputSourceLocalizedNameFlags)
-> (InputSourceLocalizedNameFlags -> Int)
-> Bits InputSourceLocalizedNameFlags
Int -> InputSourceLocalizedNameFlags
InputSourceLocalizedNameFlags -> Bool
InputSourceLocalizedNameFlags -> Int
InputSourceLocalizedNameFlags -> Maybe Int
InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags
InputSourceLocalizedNameFlags -> Int -> Bool
InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags
forall a.
Eq a =>
(a -> a -> a)
-> (a -> a -> a)
-> (a -> a -> a)
-> (a -> a)
-> (a -> Int -> a)
-> (a -> Int -> a)
-> a
-> (Int -> a)
-> (a -> Int -> a)
-> (a -> Int -> a)
-> (a -> Int -> a)
-> (a -> Int -> Bool)
-> (a -> Maybe Int)
-> (a -> Int)
-> (a -> Bool)
-> (a -> Int -> a)
-> (a -> Int -> a)
-> (a -> Int -> a)
-> (a -> Int -> a)
-> (a -> Int -> a)
-> (a -> Int -> a)
-> (a -> Int)
-> Bits a
popCount :: InputSourceLocalizedNameFlags -> Int
$cpopCount :: InputSourceLocalizedNameFlags -> Int
rotateR :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
$crotateR :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
rotateL :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
$crotateL :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
unsafeShiftR :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
$cunsafeShiftR :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
shiftR :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
$cshiftR :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
unsafeShiftL :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
$cunsafeShiftL :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
shiftL :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
$cshiftL :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
isSigned :: InputSourceLocalizedNameFlags -> Bool
$cisSigned :: InputSourceLocalizedNameFlags -> Bool
bitSize :: InputSourceLocalizedNameFlags -> Int
$cbitSize :: InputSourceLocalizedNameFlags -> Int
bitSizeMaybe :: InputSourceLocalizedNameFlags -> Maybe Int
$cbitSizeMaybe :: InputSourceLocalizedNameFlags -> Maybe Int
testBit :: InputSourceLocalizedNameFlags -> Int -> Bool
$ctestBit :: InputSourceLocalizedNameFlags -> Int -> Bool
complementBit :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
$ccomplementBit :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
clearBit :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
$cclearBit :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
setBit :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
$csetBit :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
bit :: Int -> InputSourceLocalizedNameFlags
$cbit :: Int -> InputSourceLocalizedNameFlags
zeroBits :: InputSourceLocalizedNameFlags
$czeroBits :: InputSourceLocalizedNameFlags
rotate :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
$crotate :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
shift :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
$cshift :: InputSourceLocalizedNameFlags
-> Int -> InputSourceLocalizedNameFlags
complement :: InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags
$ccomplement :: InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags
xor :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags
$cxor :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags
.|. :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags
$c.|. :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags
.&. :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags
$c.&. :: InputSourceLocalizedNameFlags
-> InputSourceLocalizedNameFlags -> InputSourceLocalizedNameFlags
$cp1Bits :: Eq InputSourceLocalizedNameFlags
Bits, Bits InputSourceLocalizedNameFlags
Bits InputSourceLocalizedNameFlags =>
(InputSourceLocalizedNameFlags -> Int)
-> (InputSourceLocalizedNameFlags -> Int)
-> (InputSourceLocalizedNameFlags -> Int)
-> FiniteBits InputSourceLocalizedNameFlags
InputSourceLocalizedNameFlags -> Int
forall b.
Bits b =>
(b -> Int) -> (b -> Int) -> (b -> Int) -> FiniteBits b
countTrailingZeros :: InputSourceLocalizedNameFlags -> Int
$ccountTrailingZeros :: InputSourceLocalizedNameFlags -> Int
countLeadingZeros :: InputSourceLocalizedNameFlags -> Int
$ccountLeadingZeros :: InputSourceLocalizedNameFlags -> Int
finiteBitSize :: InputSourceLocalizedNameFlags -> Int
$cfiniteBitSize :: InputSourceLocalizedNameFlags -> Int
$cp1FiniteBits :: Bits InputSourceLocalizedNameFlags
FiniteBits)



conNameInputSourceLocalizedNameFlags :: String
conNameInputSourceLocalizedNameFlags :: String
conNameInputSourceLocalizedNameFlags = "InputSourceLocalizedNameFlags"

enumPrefixInputSourceLocalizedNameFlags :: String
enumPrefixInputSourceLocalizedNameFlags :: String
enumPrefixInputSourceLocalizedNameFlags = ""

showTableInputSourceLocalizedNameFlags :: [(InputSourceLocalizedNameFlags, String)]
showTableInputSourceLocalizedNameFlags :: [(InputSourceLocalizedNameFlags, String)]
showTableInputSourceLocalizedNameFlags = []

instance Show InputSourceLocalizedNameFlags where
  showsPrec :: Int -> InputSourceLocalizedNameFlags -> ShowS
showsPrec = String
-> [(InputSourceLocalizedNameFlags, String)]
-> String
-> (InputSourceLocalizedNameFlags -> Flags64)
-> (Flags64 -> ShowS)
-> Int
-> InputSourceLocalizedNameFlags
-> ShowS
forall a i.
Eq a =>
String
-> [(a, String)]
-> String
-> (a -> i)
-> (i -> ShowS)
-> Int
-> a
-> ShowS
enumShowsPrec String
enumPrefixInputSourceLocalizedNameFlags
                            [(InputSourceLocalizedNameFlags, String)]
showTableInputSourceLocalizedNameFlags
                            String
conNameInputSourceLocalizedNameFlags
                            (\(InputSourceLocalizedNameFlags x :: Flags64
x) -> Flags64
x)
                            (\x :: Flags64
x -> String -> ShowS
showString "0x" ShowS -> ShowS -> ShowS
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Flags64 -> ShowS
forall a. (Integral a, Show a) => a -> ShowS
showHex Flags64
x)

instance Read InputSourceLocalizedNameFlags where
  readPrec :: ReadPrec InputSourceLocalizedNameFlags
readPrec = String
-> [(InputSourceLocalizedNameFlags, String)]
-> String
-> (Flags64 -> InputSourceLocalizedNameFlags)
-> ReadPrec InputSourceLocalizedNameFlags
forall i a.
Read i =>
String -> [(a, String)] -> String -> (i -> a) -> ReadPrec a
enumReadPrec String
enumPrefixInputSourceLocalizedNameFlags
                          [(InputSourceLocalizedNameFlags, String)]
showTableInputSourceLocalizedNameFlags
                          String
conNameInputSourceLocalizedNameFlags
                          Flags64 -> InputSourceLocalizedNameFlags
InputSourceLocalizedNameFlags