module Graphics.UI.FLTK.LowLevel.BMPImage
    (
     bmpImageNew
     
     
     
    )
where
import qualified Foreign.C.Types as C2HSImp
import qualified Foreign.Ptr as C2HSImp
import C2HS hiding (cFromEnum, cFromBool, cToBool,cToEnum)
import Graphics.UI.FLTK.LowLevel.Fl_Types
import Graphics.UI.FLTK.LowLevel.Utils
import Graphics.UI.FLTK.LowLevel.Hierarchy
import Graphics.UI.FLTK.LowLevel.RGBImage
bmpImageNew' :: (String) -> IO ((Ptr ()))
bmpImageNew' a1 =
  let {a1' = unsafeToCString a1} in 
  bmpImageNew''_ a1' >>= \res ->
  let {res' = id res} in
  return (res')
bmpImageNew :: String -> IO (Either UnknownError (Ref BMPImage))
bmpImageNew filename' = do
  ptr <- bmpImageNew' filename'
  ref' <- (toRef ptr :: IO (Ref BMPImage))
  checkImage ref'
foreign import ccall safe "Graphics/UI/FLTK/LowLevel/BMPImage.chs.h Fl_BMP_Image_New"
  bmpImageNew''_ :: ((C2HSImp.Ptr C2HSImp.CChar) -> (IO (C2HSImp.Ptr ())))