{-# LANGUAGE GeneralizedNewtypeDeriving #-}
module Bindings.HDF5.PropertyList.GAPL
    ( module Bindings.HDF5.PropertyList.LAPL

    , GAPL
    , GroupAccessPropertyList

    ) where

import Bindings.HDF5.Core
import Bindings.HDF5.PropertyList.LAPL

class LinkAccessPropertyList t => GroupAccessPropertyList t where
newtype GAPL = GAPL LAPL
    deriving (GAPL -> GAPL -> Bool
(GAPL -> GAPL -> Bool) -> (GAPL -> GAPL -> Bool) -> Eq GAPL
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: GAPL -> GAPL -> Bool
== :: GAPL -> GAPL -> Bool
$c/= :: GAPL -> GAPL -> Bool
/= :: GAPL -> GAPL -> Bool
Eq, GAPL -> HId_t
(GAPL -> HId_t) -> HId GAPL
forall t. (t -> HId_t) -> HId t
$chid :: GAPL -> HId_t
hid :: GAPL -> HId_t
HId, HId_t -> GAPL
(HId_t -> GAPL) -> FromHId GAPL
forall t. (HId_t -> t) -> FromHId t
$cuncheckedFromHId :: HId_t -> GAPL
uncheckedFromHId :: HId_t -> GAPL
FromHId, GAPL -> Bool
(GAPL -> Bool) -> HDFResultType GAPL
forall t. (t -> Bool) -> HDFResultType t
$cisError :: GAPL -> Bool
isError :: GAPL -> Bool
HDFResultType, FromHId GAPL
HId GAPL
(HId GAPL, FromHId GAPL) => PropertyListOrClass GAPL
forall t. (HId t, FromHId t) => PropertyListOrClass t
PropertyListOrClass, PropertyList GAPL
PropertyList GAPL => LinkAccessPropertyList GAPL
forall t. PropertyList t => LinkAccessPropertyList t
LinkAccessPropertyList)
instance PropertyList GAPL where
    staticPlistClass :: Tagged GAPL PropertyListClassID
staticPlistClass = PropertyListClassID -> Tagged GAPL PropertyListClassID
forall {k} (s :: k) b. b -> Tagged s b
Tagged PropertyListClassID
groupAccess
instance GroupAccessPropertyList GAPL

-- TODO: implement functions