spirv-reflect-types-0.2: Data types from spirv-reflect tool.
Safe HaskellSafe-Inferred
LanguageHaskell2010

Data.SpirV.Reflect.Traits

Documentation

data Numeric Source #

Constructors

Numeric 

Fields

Instances

Instances details
Generic Numeric Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Associated Types

type Rep Numeric :: Type -> Type #

Methods

from :: Numeric -> Rep Numeric x #

to :: Rep Numeric x -> Numeric #

Show Numeric Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Eq Numeric Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Methods

(==) :: Numeric -> Numeric -> Bool #

(/=) :: Numeric -> Numeric -> Bool #

Ord Numeric Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

type Rep Numeric Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

type Rep Numeric = D1 ('MetaData "Numeric" "Data.SpirV.Reflect.Traits" "spirv-reflect-types-0.2-4qH5LVRcOpML0ZdVMzyXs4" 'False) (C1 ('MetaCons "Numeric" 'PrefixI 'True) (S1 ('MetaSel ('Just "scalar") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Scalar) :*: (S1 ('MetaSel ('Just "vector") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Vector) :*: S1 ('MetaSel ('Just "matrix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Matrix))))

data Scalar Source #

Constructors

Scalar 

Fields

Instances

Instances details
Generic Scalar Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Associated Types

type Rep Scalar :: Type -> Type #

Methods

from :: Scalar -> Rep Scalar x #

to :: Rep Scalar x -> Scalar #

Show Scalar Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Eq Scalar Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Methods

(==) :: Scalar -> Scalar -> Bool #

(/=) :: Scalar -> Scalar -> Bool #

Ord Scalar Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

type Rep Scalar Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

type Rep Scalar = D1 ('MetaData "Scalar" "Data.SpirV.Reflect.Traits" "spirv-reflect-types-0.2-4qH5LVRcOpML0ZdVMzyXs4" 'False) (C1 ('MetaCons "Scalar" 'PrefixI 'True) (S1 ('MetaSel ('Just "width") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Word32) :*: S1 ('MetaSel ('Just "signedness") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Word32)))

data Vector Source #

Constructors

Vector 

Instances

Instances details
Generic Vector Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Associated Types

type Rep Vector :: Type -> Type #

Methods

from :: Vector -> Rep Vector x #

to :: Rep Vector x -> Vector #

Show Vector Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Eq Vector Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Methods

(==) :: Vector -> Vector -> Bool #

(/=) :: Vector -> Vector -> Bool #

Ord Vector Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

type Rep Vector Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

type Rep Vector = D1 ('MetaData "Vector" "Data.SpirV.Reflect.Traits" "spirv-reflect-types-0.2-4qH5LVRcOpML0ZdVMzyXs4" 'False) (C1 ('MetaCons "Vector" 'PrefixI 'True) (S1 ('MetaSel ('Just "component_count") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Word32)))

data Matrix Source #

Constructors

Matrix 

Fields

Instances

Instances details
Generic Matrix Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Associated Types

type Rep Matrix :: Type -> Type #

Methods

from :: Matrix -> Rep Matrix x #

to :: Rep Matrix x -> Matrix #

Show Matrix Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Eq Matrix Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Methods

(==) :: Matrix -> Matrix -> Bool #

(/=) :: Matrix -> Matrix -> Bool #

Ord Matrix Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

type Rep Matrix Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

type Rep Matrix = D1 ('MetaData "Matrix" "Data.SpirV.Reflect.Traits" "spirv-reflect-types-0.2-4qH5LVRcOpML0ZdVMzyXs4" 'False) (C1 ('MetaCons "Matrix" 'PrefixI 'True) (S1 ('MetaSel ('Just "column_count") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Word32) :*: (S1 ('MetaSel ('Just "row_count") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Word32) :*: S1 ('MetaSel ('Just "stride") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Word32))))

data Array Source #

Constructors

Array 

Instances

Instances details
Generic Array Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Associated Types

type Rep Array :: Type -> Type #

Methods

from :: Array -> Rep Array x #

to :: Rep Array x -> Array #

Show Array Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Methods

showsPrec :: Int -> Array -> ShowS #

show :: Array -> String #

showList :: [Array] -> ShowS #

Eq Array Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Methods

(==) :: Array -> Array -> Bool #

(/=) :: Array -> Array -> Bool #

Ord Array Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Methods

compare :: Array -> Array -> Ordering #

(<) :: Array -> Array -> Bool #

(<=) :: Array -> Array -> Bool #

(>) :: Array -> Array -> Bool #

(>=) :: Array -> Array -> Bool #

max :: Array -> Array -> Array #

min :: Array -> Array -> Array #

type Rep Array Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

type Rep Array = D1 ('MetaData "Array" "Data.SpirV.Reflect.Traits" "spirv-reflect-types-0.2-4qH5LVRcOpML0ZdVMzyXs4" 'False) (C1 ('MetaCons "Array" 'PrefixI 'True) (S1 ('MetaSel ('Just "dims_count") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Word32) :*: (S1 ('MetaSel ('Just "dims") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Vector Word32)) :*: S1 ('MetaSel ('Just "stride") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe Word32)))))

data Image Source #

Constructors

Image 

Fields

Instances

Instances details
Generic Image Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Associated Types

type Rep Image :: Type -> Type #

Methods

from :: Image -> Rep Image x #

to :: Rep Image x -> Image #

Show Image Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Methods

showsPrec :: Int -> Image -> ShowS #

show :: Image -> String #

showList :: [Image] -> ShowS #

Eq Image Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Methods

(==) :: Image -> Image -> Bool #

(/=) :: Image -> Image -> Bool #

Ord Image Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits

Methods

compare :: Image -> Image -> Ordering #

(<) :: Image -> Image -> Bool #

(<=) :: Image -> Image -> Bool #

(>) :: Image -> Image -> Bool #

(>=) :: Image -> Image -> Bool #

max :: Image -> Image -> Image #

min :: Image -> Image -> Image #

type Rep Image Source # 
Instance details

Defined in Data.SpirV.Reflect.Traits