hdf5-1.8.14: Haskell interface to the HDF5 scientific data storage library.
Safe HaskellSafe-Inferred
LanguageHaskell2010

Bindings.HDF5.Datatype

Documentation

data Datatype Source #

Instances

Instances details
Eq Datatype Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

(==) :: Datatype -> Datatype -> Bool

(/=) :: Datatype -> Datatype -> Bool

HDFResultType Datatype Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

isError :: Datatype -> Bool Source #

FromHId Datatype Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

HId Datatype Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

hid :: Datatype -> HId_t Source #

Object Datatype Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

data Class Source #

Instances

Instances details
Bounded Class Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Enum Class Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Read Class Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

readsPrec :: Int -> ReadS Class

readList :: ReadS [Class]

readPrec :: ReadPrec Class

readListPrec :: ReadPrec [Class]

Show Class Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

showsPrec :: Int -> Class -> ShowS

show :: Class -> String

showList :: [Class] -> ShowS

Eq Class Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

(==) :: Class -> Class -> Bool

(/=) :: Class -> Class -> Bool

Ord Class Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

compare :: Class -> Class -> Ordering

(<) :: Class -> Class -> Bool

(<=) :: Class -> Class -> Bool

(>) :: Class -> Class -> Bool

(>=) :: Class -> Class -> Bool

max :: Class -> Class -> Class

min :: Class -> Class -> Class

data CSet Source #

Instances

Instances details
Bounded CSet Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Enum CSet Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

succ :: CSet -> CSet

pred :: CSet -> CSet

toEnum :: Int -> CSet

fromEnum :: CSet -> Int

enumFrom :: CSet -> [CSet]

enumFromThen :: CSet -> CSet -> [CSet]

enumFromTo :: CSet -> CSet -> [CSet]

enumFromThenTo :: CSet -> CSet -> CSet -> [CSet]

Read CSet Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

readsPrec :: Int -> ReadS CSet

readList :: ReadS [CSet]

readPrec :: ReadPrec CSet

readListPrec :: ReadPrec [CSet]

Show CSet Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

showsPrec :: Int -> CSet -> ShowS

show :: CSet -> String

showList :: [CSet] -> ShowS

Eq CSet Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

(==) :: CSet -> CSet -> Bool

(/=) :: CSet -> CSet -> Bool

Ord CSet Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

compare :: CSet -> CSet -> Ordering

(<) :: CSet -> CSet -> Bool

(<=) :: CSet -> CSet -> Bool

(>) :: CSet -> CSet -> Bool

(>=) :: CSet -> CSet -> Bool

max :: CSet -> CSet -> CSet

min :: CSet -> CSet -> CSet

data ByteOrder Source #

Constructors

LE 
BE 
VAX 
Mixed 

Instances

Instances details
Bounded ByteOrder Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Enum ByteOrder Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Read ByteOrder Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

readsPrec :: Int -> ReadS ByteOrder

readList :: ReadS [ByteOrder]

readPrec :: ReadPrec ByteOrder

readListPrec :: ReadPrec [ByteOrder]

Show ByteOrder Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

showsPrec :: Int -> ByteOrder -> ShowS

show :: ByteOrder -> String

showList :: [ByteOrder] -> ShowS

Eq ByteOrder Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

(==) :: ByteOrder -> ByteOrder -> Bool

(/=) :: ByteOrder -> ByteOrder -> Bool

Ord ByteOrder Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

compare :: ByteOrder -> ByteOrder -> Ordering

(<) :: ByteOrder -> ByteOrder -> Bool

(<=) :: ByteOrder -> ByteOrder -> Bool

(>) :: ByteOrder -> ByteOrder -> Bool

(>=) :: ByteOrder -> ByteOrder -> Bool

max :: ByteOrder -> ByteOrder -> ByteOrder

min :: ByteOrder -> ByteOrder -> ByteOrder

data Normalization Source #

Constructors

Implied 
MSBSet 

Instances

Instances details
Bounded Normalization Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Enum Normalization Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Read Normalization Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

readsPrec :: Int -> ReadS Normalization

readList :: ReadS [Normalization]

readPrec :: ReadPrec Normalization

readListPrec :: ReadPrec [Normalization]

Show Normalization Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

showsPrec :: Int -> Normalization -> ShowS

show :: Normalization -> String

showList :: [Normalization] -> ShowS

Eq Normalization Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Ord Normalization Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

data Pad Source #

Constructors

Zero 
One 
Background 

Instances

Instances details
Bounded Pad Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

minBound :: Pad

maxBound :: Pad

Enum Pad Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

succ :: Pad -> Pad

pred :: Pad -> Pad

toEnum :: Int -> Pad

fromEnum :: Pad -> Int

enumFrom :: Pad -> [Pad]

enumFromThen :: Pad -> Pad -> [Pad]

enumFromTo :: Pad -> Pad -> [Pad]

enumFromThenTo :: Pad -> Pad -> Pad -> [Pad]

Read Pad Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

readsPrec :: Int -> ReadS Pad

readList :: ReadS [Pad]

readPrec :: ReadPrec Pad

readListPrec :: ReadPrec [Pad]

Show Pad Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

showsPrec :: Int -> Pad -> ShowS

show :: Pad -> String

showList :: [Pad] -> ShowS

Eq Pad Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

(==) :: Pad -> Pad -> Bool

(/=) :: Pad -> Pad -> Bool

Ord Pad Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

compare :: Pad -> Pad -> Ordering

(<) :: Pad -> Pad -> Bool

(<=) :: Pad -> Pad -> Bool

(>) :: Pad -> Pad -> Bool

(>=) :: Pad -> Pad -> Bool

max :: Pad -> Pad -> Pad

min :: Pad -> Pad -> Pad

data StringPad Source #

Instances

Instances details
Bounded StringPad Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Enum StringPad Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Read StringPad Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

readsPrec :: Int -> ReadS StringPad

readList :: ReadS [StringPad]

readPrec :: ReadPrec StringPad

readListPrec :: ReadPrec [StringPad]

Show StringPad Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

showsPrec :: Int -> StringPad -> ShowS

show :: StringPad -> String

showList :: [StringPad] -> ShowS

Eq StringPad Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

(==) :: StringPad -> StringPad -> Bool

(/=) :: StringPad -> StringPad -> Bool

Ord StringPad Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

compare :: StringPad -> StringPad -> Ordering

(<) :: StringPad -> StringPad -> Bool

(<=) :: StringPad -> StringPad -> Bool

(>) :: StringPad -> StringPad -> Bool

(>=) :: StringPad -> StringPad -> Bool

max :: StringPad -> StringPad -> StringPad

min :: StringPad -> StringPad -> StringPad

class Storable t => NativeType t where Source #

Instances

Instances details
NativeType CChar Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType CDouble Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

nativeTypeId :: Tagged CDouble Datatype Source #

NativeType CFloat Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType CInt Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType CLLong Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType CLong Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType CSChar Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType CShort Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType CUChar Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType CUInt Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType CULLong Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

nativeTypeId :: Tagged CULLong Datatype Source #

NativeType CULong Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType CUShort Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

Methods

nativeTypeId :: Tagged CUShort Datatype Source #

NativeType Int16 Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType Int32 Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType Int64 Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType Int8 Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType Word16 Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType Word32 Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType Word64 Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType Word8 Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType HAddr Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType HSSize Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType HSize Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType HBool_t Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType HErr_t Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType Double Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType Float Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType Int Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

NativeType Word Source # 
Instance details

Defined in Bindings.HDF5.Datatype.Internal

createTypeID :: Class -> CSize -> IO Datatype Source #

commitTypeID :: Location t => t -> ByteString -> Datatype -> Maybe LCPL -> Maybe TCPL -> Maybe TAPL -> IO () Source #

openTypeID :: Location t => t -> ByteString -> Maybe TAPL -> IO Datatype Source #

commitTypeIDAnonymously :: Location t => t -> Datatype -> Maybe TCPL -> Maybe TAPL -> IO () Source #

encodeTypeID :: Datatype -> IO ByteString Source #

decodeTypeID :: ByteString -> IO Datatype Source #

insertCompoundTypeMember :: Datatype -> ByteString -> CSize -> Datatype -> IO () Source #

setOpaqueTypeTag :: Datatype -> ByteString -> IO () Source #

getOpaqueTypeTag :: Datatype -> IO ByteString Source #

getTypeSize :: Datatype -> IO CSize Source #

getFloatTypeFields :: Datatype -> IO (CSize, CSize, CSize, CSize, CSize) Source #

getMemberName :: Datatype -> CUInt -> IO ByteString Source #

getMemberIndex :: Datatype -> ByteString -> IO CInt Source #

setTypeSize :: Datatype -> CSize -> IO () Source #

setByteOrder :: Datatype -> Maybe ByteOrder -> IO () Source #

setTypePrecision :: Datatype -> CSize -> IO () Source #

setTypeOffset :: Datatype -> CSize -> IO () Source #

setTypePad :: Datatype -> Pad -> Pad -> IO () Source #

setFloatTypeFields :: Datatype -> CSize -> CSize -> CSize -> CSize -> CSize -> IO () Source #

setFloatTypeEBias :: Datatype -> CSize -> IO () Source #