spirv-headers-0.1.0.0: Types and generator for SPIR-V JSON spec.
Safe HaskellSafe-Inferred
LanguageHaskell2010

Data.SpirV.Headers.Enum

Documentation

newtype SpirvJson Source #

Constructors

SpirvJson 

Fields

Instances

Instances details
FromJSON SpirvJson Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Generic SpirvJson Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Associated Types

type Rep SpirvJson :: Type -> Type #

Show SpirvJson Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Eq SpirvJson Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

type Rep SpirvJson Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

type Rep SpirvJson = D1 ('MetaData "SpirvJson" "Data.SpirV.Headers.Enum" "spirv-headers-0.1.0.0-JcqcdgV2eJHAzKJt5qwiJh" 'True) (C1 ('MetaCons "SpirvJson" 'PrefixI 'True) (S1 ('MetaSel ('Just "spv") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Spv)))

data Spv Source #

Constructors

Spv 

Fields

Instances

Instances details
FromJSON Spv Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Generic Spv Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Associated Types

type Rep Spv :: Type -> Type #

Methods

from :: Spv -> Rep Spv x #

to :: Rep Spv x -> Spv #

Show Spv Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Methods

showsPrec :: Int -> Spv -> ShowS #

show :: Spv -> String #

showList :: [Spv] -> ShowS #

Eq Spv Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Methods

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

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

type Rep Spv Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

type Rep Spv = D1 ('MetaData "Spv" "Data.SpirV.Headers.Enum" "spirv-headers-0.1.0.0-JcqcdgV2eJHAzKJt5qwiJh" 'False) (C1 ('MetaCons "Spv" 'PrefixI 'True) (S1 ('MetaSel ('Just "meta") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Meta) :*: S1 ('MetaSel ('Just "enum") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Enum])))

data Meta Source #

Constructors

Meta 

Instances

Instances details
FromJSON Meta Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Generic Meta Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Associated Types

type Rep Meta :: Type -> Type #

Methods

from :: Meta -> Rep Meta x #

to :: Rep Meta x -> Meta #

Show Meta Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Methods

showsPrec :: Int -> Meta -> ShowS #

show :: Meta -> String #

showList :: [Meta] -> ShowS #

Eq Meta Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Methods

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

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

type Rep Meta Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

data Enum Source #

Constructors

Enum 

Fields

Instances

Instances details
FromJSON Enum Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Generic Enum Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Associated Types

type Rep Enum :: Type -> Type #

Methods

from :: Enum -> Rep Enum x #

to :: Rep Enum x -> Enum #

Show Enum Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Methods

showsPrec :: Int -> Enum -> ShowS #

show :: Enum -> String #

showList :: [Enum] -> ShowS #

Eq Enum Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Methods

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

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

type Rep Enum Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

type Rep Enum = D1 ('MetaData "Enum" "Data.SpirV.Headers.Enum" "spirv-headers-0.1.0.0-JcqcdgV2eJHAzKJt5qwiJh" 'False) (C1 ('MetaCons "Enum" 'PrefixI 'True) (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: (S1 ('MetaSel ('Just "type_") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Type) :*: S1 ('MetaSel ('Just "values") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Map Text Word32)))))

data Type Source #

Constructors

Value 
Bit 

Instances

Instances details
FromJSON Type Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Generic Type Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Associated Types

type Rep Type :: Type -> Type #

Methods

from :: Type -> Rep Type x #

to :: Rep Type x -> Type #

Show Type Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Methods

showsPrec :: Int -> Type -> ShowS #

show :: Type -> String #

showList :: [Type] -> ShowS #

Eq Type Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

Methods

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

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

type Rep Type Source # 
Instance details

Defined in Data.SpirV.Headers.Enum

type Rep Type = D1 ('MetaData "Type" "Data.SpirV.Headers.Enum" "spirv-headers-0.1.0.0-JcqcdgV2eJHAzKJt5qwiJh" 'False) (C1 ('MetaCons "Value" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Bit" 'PrefixI 'False) (U1 :: Type -> Type))