module Data.SpirV.Reflect.DescriptorSet where import Data.Vector (Vector) import Data.Word (Word32) import GHC.Generics (Generic) import Data.SpirV.Reflect.DescriptorBinding (DescriptorBinding) data DescriptorSet = DescriptorSet { DescriptorSet -> Word32 set :: Word32 , DescriptorSet -> Vector DescriptorBinding bindings :: Vector DescriptorBinding } deriving (DescriptorSet -> DescriptorSet -> Bool (DescriptorSet -> DescriptorSet -> Bool) -> (DescriptorSet -> DescriptorSet -> Bool) -> Eq DescriptorSet forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: DescriptorSet -> DescriptorSet -> Bool $c/= :: DescriptorSet -> DescriptorSet -> Bool == :: DescriptorSet -> DescriptorSet -> Bool $c== :: DescriptorSet -> DescriptorSet -> Bool Eq, Int -> DescriptorSet -> ShowS [DescriptorSet] -> ShowS DescriptorSet -> String (Int -> DescriptorSet -> ShowS) -> (DescriptorSet -> String) -> ([DescriptorSet] -> ShowS) -> Show DescriptorSet forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [DescriptorSet] -> ShowS $cshowList :: [DescriptorSet] -> ShowS show :: DescriptorSet -> String $cshow :: DescriptorSet -> String showsPrec :: Int -> DescriptorSet -> ShowS $cshowsPrec :: Int -> DescriptorSet -> ShowS Show, (forall x. DescriptorSet -> Rep DescriptorSet x) -> (forall x. Rep DescriptorSet x -> DescriptorSet) -> Generic DescriptorSet forall x. Rep DescriptorSet x -> DescriptorSet forall x. DescriptorSet -> Rep DescriptorSet x forall a. (forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a $cto :: forall x. Rep DescriptorSet x -> DescriptorSet $cfrom :: forall x. DescriptorSet -> Rep DescriptorSet x Generic)