ktx-codec-0.0.1.1: Khronos texture format

Safe HaskellNone
LanguageHaskell2010

Codec.Ktx

Contents

Synopsis

Documentation

data Ktx Source #

Constructors

Ktx 
Instances
Show Ktx Source # 
Instance details

Defined in Codec.Ktx

Methods

showsPrec :: Int -> Ktx -> ShowS #

show :: Ktx -> String #

showList :: [Ktx] -> ShowS #

Generic Ktx Source # 
Instance details

Defined in Codec.Ktx

Associated Types

type Rep Ktx :: Type -> Type #

Methods

from :: Ktx -> Rep Ktx x #

to :: Rep Ktx x -> Ktx #

Binary Ktx Source # 
Instance details

Defined in Codec.Ktx

Methods

put :: Ktx -> Put #

get :: Get Ktx #

putList :: [Ktx] -> Put #

type Rep Ktx Source # 
Instance details

Defined in Codec.Ktx

Header

data Header Source #

Instances
Show Header Source # 
Instance details

Defined in Codec.Ktx

Generic Header Source # 
Instance details

Defined in Codec.Ktx

Associated Types

type Rep Header :: Type -> Type #

Methods

from :: Header -> Rep Header x #

to :: Rep Header x -> Header #

Binary Header Source # 
Instance details

Defined in Codec.Ktx

Methods

put :: Header -> Put #

get :: Get Header #

putList :: [Header] -> Put #

type Rep Header Source # 
Instance details

Defined in Codec.Ktx

type Rep Header = D1 (MetaData "Header" "Codec.Ktx" "ktx-codec-0.0.1.1-3xdSuGqsU3hLU0Ia9EaWNj" False) (C1 (MetaCons "Header" PrefixI True) (((S1 (MetaSel (Just "identifier") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 ByteString) :*: (S1 (MetaSel (Just "endianness") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word32) :*: S1 (MetaSel (Just "glType") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word32))) :*: ((S1 (MetaSel (Just "glTypeSize") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word32) :*: S1 (MetaSel (Just "glFormat") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word32)) :*: (S1 (MetaSel (Just "glInternalFormat") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word32) :*: S1 (MetaSel (Just "glBaseInternalFormat") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word32)))) :*: ((S1 (MetaSel (Just "pixelWidth") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word32) :*: (S1 (MetaSel (Just "pixelHeight") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word32) :*: S1 (MetaSel (Just "pixelDepth") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word32))) :*: ((S1 (MetaSel (Just "numberOfArrayElements") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word32) :*: S1 (MetaSel (Just "numberOfFaces") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word32)) :*: (S1 (MetaSel (Just "numberOfMipmapLevels") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word32) :*: S1 (MetaSel (Just "bytesOfKeyValueData") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word32))))))

Key-value data

newtype Key Source #

Constructors

Key Text 
Instances
Eq Key Source # 
Instance details

Defined in Codec.Ktx

Methods

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

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

Ord Key Source # 
Instance details

Defined in Codec.Ktx

Methods

compare :: Key -> Key -> Ordering #

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

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

(>) :: Key -> Key -> Bool #

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

max :: Key -> Key -> Key #

min :: Key -> Key -> Key #

Show Key Source # 
Instance details

Defined in Codec.Ktx

Methods

showsPrec :: Int -> Key -> ShowS #

show :: Key -> String #

showList :: [Key] -> ShowS #

Generic Key Source # 
Instance details

Defined in Codec.Ktx

Associated Types

type Rep Key :: Type -> Type #

Methods

from :: Key -> Rep Key x #

to :: Rep Key x -> Key #

type Rep Key Source # 
Instance details

Defined in Codec.Ktx

type Rep Key = D1 (MetaData "Key" "Codec.Ktx" "ktx-codec-0.0.1.1-3xdSuGqsU3hLU0Ia9EaWNj" True) (C1 (MetaCons "Key" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

newtype Value Source #

Constructors

Value ByteString 
Instances
Show Value Source # 
Instance details

Defined in Codec.Ktx

Methods

showsPrec :: Int -> Value -> ShowS #

show :: Value -> String #

showList :: [Value] -> ShowS #

Generic Value Source # 
Instance details

Defined in Codec.Ktx

Associated Types

type Rep Value :: Type -> Type #

Methods

from :: Value -> Rep Value x #

to :: Rep Value x -> Value #

type Rep Value Source # 
Instance details

Defined in Codec.Ktx

type Rep Value = D1 (MetaData "Value" "Codec.Ktx" "ktx-codec-0.0.1.1-3xdSuGqsU3hLU0Ia9EaWNj" True) (C1 (MetaCons "Value" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)))

Images

data MipLevel Source #

Instances
Show MipLevel Source # 
Instance details

Defined in Codec.Ktx

Generic MipLevel Source # 
Instance details

Defined in Codec.Ktx

Associated Types

type Rep MipLevel :: Type -> Type #

Methods

from :: MipLevel -> Rep MipLevel x #

to :: Rep MipLevel x -> MipLevel #

type Rep MipLevel Source # 
Instance details

Defined in Codec.Ktx

type Rep MipLevel = D1 (MetaData "MipLevel" "Codec.Ktx" "ktx-codec-0.0.1.1-3xdSuGqsU3hLU0Ia9EaWNj" False) (C1 (MetaCons "MipLevel" PrefixI True) (S1 (MetaSel (Just "imageSize") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word32) :*: S1 (MetaSel (Just "arrayElements") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 (Vector ArrayElement))))

newtype ArrayElement Source #

Constructors

ArrayElement 

Fields

Instances
Show ArrayElement Source # 
Instance details

Defined in Codec.Ktx

Generic ArrayElement Source # 
Instance details

Defined in Codec.Ktx

Associated Types

type Rep ArrayElement :: Type -> Type #

type Rep ArrayElement Source # 
Instance details

Defined in Codec.Ktx

type Rep ArrayElement = D1 (MetaData "ArrayElement" "Codec.Ktx" "ktx-codec-0.0.1.1-3xdSuGqsU3hLU0Ia9EaWNj" True) (C1 (MetaCons "ArrayElement" PrefixI True) (S1 (MetaSel (Just "faces") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Vector Face))))

newtype Face Source #

Constructors

Face 

Fields

Instances
Show Face Source # 
Instance details

Defined in Codec.Ktx

Methods

showsPrec :: Int -> Face -> ShowS #

show :: Face -> String #

showList :: [Face] -> ShowS #

Generic Face Source # 
Instance details

Defined in Codec.Ktx

Associated Types

type Rep Face :: Type -> Type #

Methods

from :: Face -> Rep Face x #

to :: Rep Face x -> Face #

type Rep Face Source # 
Instance details

Defined in Codec.Ktx

type Rep Face = D1 (MetaData "Face" "Codec.Ktx" "ktx-codec-0.0.1.1-3xdSuGqsU3hLU0Ia9EaWNj" True) (C1 (MetaCons "Face" PrefixI True) (S1 (MetaSel (Just "zSlices") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Vector ZSlice))))

newtype ZSlice Source #

Constructors

ZSlice 

Fields

Instances
Show ZSlice Source # 
Instance details

Defined in Codec.Ktx

Generic ZSlice Source # 
Instance details

Defined in Codec.Ktx

Associated Types

type Rep ZSlice :: Type -> Type #

Methods

from :: ZSlice -> Rep ZSlice x #

to :: Rep ZSlice x -> ZSlice #

type Rep ZSlice Source # 
Instance details

Defined in Codec.Ktx

type Rep ZSlice = D1 (MetaData "ZSlice" "Codec.Ktx" "ktx-codec-0.0.1.1-3xdSuGqsU3hLU0Ia9EaWNj" True) (C1 (MetaCons "ZSlice" PrefixI True) (S1 (MetaSel (Just "block") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)))