{-# LANGUAGE GeneralizedNewtypeDeriving #-}
module Bindings.HDF5.PropertyList.DXPL
( module Bindings.HDF5.PropertyList
, DXPL
, DatasetTransferPropertyList
) where
import Bindings.HDF5.Core
import Bindings.HDF5.PropertyList
class PropertyList t => DatasetTransferPropertyList t where
newtype DXPL = DXPL PropertyListID
deriving (DXPL -> DXPL -> Bool
(DXPL -> DXPL -> Bool) -> (DXPL -> DXPL -> Bool) -> Eq DXPL
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: DXPL -> DXPL -> Bool
== :: DXPL -> DXPL -> Bool
$c/= :: DXPL -> DXPL -> Bool
/= :: DXPL -> DXPL -> Bool
Eq, DXPL -> HId_t
(DXPL -> HId_t) -> HId DXPL
forall t. (t -> HId_t) -> HId t
$chid :: DXPL -> HId_t
hid :: DXPL -> HId_t
HId, HId_t -> DXPL
(HId_t -> DXPL) -> FromHId DXPL
forall t. (HId_t -> t) -> FromHId t
$cuncheckedFromHId :: HId_t -> DXPL
uncheckedFromHId :: HId_t -> DXPL
FromHId, DXPL -> Bool
(DXPL -> Bool) -> HDFResultType DXPL
forall t. (t -> Bool) -> HDFResultType t
$cisError :: DXPL -> Bool
isError :: DXPL -> Bool
HDFResultType, FromHId DXPL
HId DXPL
(HId DXPL, FromHId DXPL) => PropertyListOrClass DXPL
forall t. (HId t, FromHId t) => PropertyListOrClass t
PropertyListOrClass)
instance PropertyList DXPL where
staticPlistClass :: Tagged DXPL PropertyListClassID
staticPlistClass = PropertyListClassID -> Tagged DXPL PropertyListClassID
forall {k} (s :: k) b. b -> Tagged s b
Tagged PropertyListClassID
datasetXfer
instance DatasetTransferPropertyList DXPL