{-# LINE 1 "src/Bindings/HDF5/Raw/H5FD/Direct.hsc" #-}



-- |The Direct I/O file driver forces the data to be written to
-- the file directly without being copied into system kernel
-- buffer.  The main system supporting this feature is Linux.
module Bindings.HDF5.Raw.H5FD.Direct where

import Bindings.HDF5.Raw.H5I

{-# LINE 13 "src/Bindings/HDF5/Raw/H5FD/Direct.hsc" #-}

h5fd_DIRECT
{-# LINE 15 "src/Bindings/HDF5/Raw/H5FD/Direct.hsc" #-}
  :: HId_t
h5fd_DIRECT :: HId_t
h5fd_DIRECT
{-# LINE 17 "src/Bindings/HDF5/Raw/H5FD/Direct.hsc" #-}

{-# LINE 20 "src/Bindings/HDF5/Raw/H5FD/Direct.hsc" #-}
    = (Int64 -> HId_t
HId_t) (-Int64
1)
{-# LINE 21 "src/Bindings/HDF5/Raw/H5FD/Direct.hsc" #-}

{-# LINE 22 "src/Bindings/HDF5/Raw/H5FD/Direct.hsc" #-}


{-# LINE 60 "src/Bindings/HDF5/Raw/H5FD/Direct.hsc" #-}