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