-- GENERATED by C->Haskell Compiler, version 0.27.1 Eternal Sunshine, 29 November 2015 (Haskell)
-- Edit the ORIGNAL .chs file instead!


{-# LINE 1 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}
{-# LANGUAGE CPP, UndecidableInstances, TypeSynonymInstances, FlexibleInstances, MultiParamTypeClasses, FlexibleContexts, ExistentialQuantification #-}
{-# OPTIONS_GHC -fno-warn-orphans #-}
module Graphics.UI.FLTK.LowLevel.Window
    (
     CustomWindowFuncs(..),
     OptionalSizeRangeArgs(..),
     PositionSpec(..),
     WindowType(..),
     defaultCustomWindowFuncs,
     fillCustomWidgetFunctionStruct,
     defaultOptionalSizeRangeArgs,
     windowCustom,
     windowNew,
     windowMaker,
     currentWindow
     -- * Hierarchy
     --
     -- $hierarchy

     -- * Functions
     --
     -- $functions
    )
where
import qualified Foreign.C.Types as C2HSImp
import qualified Foreign.Ptr as C2HSImp
import qualified Foreign.Storable as C2HSImp






import Foreign
import Foreign.C
import Graphics.UI.FLTK.LowLevel.Fl_Types
import Graphics.UI.FLTK.LowLevel.Fl_Enumerations
import Graphics.UI.FLTK.LowLevel.Utils
import Graphics.UI.FLTK.LowLevel.Dispatch
import Graphics.UI.FLTK.LowLevel.Hierarchy
import Graphics.UI.FLTK.LowLevel.Widget

import C2HS hiding (cFromEnum, toBool,cToEnum,cToBool)

data WindowType = SingleWindowType
                | DoubleWindowType
  deriving (Show,Eq)
instance Enum WindowType where
  succ SingleWindowType = DoubleWindowType
  succ DoubleWindowType = error "WindowType.succ: DoubleWindowType has no successor"

  pred DoubleWindowType = SingleWindowType
  pred SingleWindowType = error "WindowType.pred: SingleWindowType has no predecessor"

  enumFromTo from to = go from
    where
      end = fromEnum to
      go v = case compare (fromEnum v) end of
                 LT -> v : go (succ v)
                 EQ -> [v]
                 GT -> []

  enumFrom from = enumFromTo from DoubleWindowType

  fromEnum SingleWindowType = 240
  fromEnum DoubleWindowType = 241

  toEnum 240 = SingleWindowType
  toEnum 241 = DoubleWindowType
  toEnum unmatched = error ("WindowType.toEnum: Cannot match " ++ show unmatched)

{-# LINE 45 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}


data PositionSpec = ByPosition Position
                  | forall a. (Parent a Widget) => ByWidget (Ref a)

data CustomWindowFuncs a =
    CustomWindowFuncs {
      flushCustom :: Maybe (Ref a -> IO ())
    }

data OptionalSizeRangeArgs = OptionalSizeRangeArgs {
      maxw :: Maybe Int,
      maxh :: Maybe Int,
      dw :: Maybe Int,
      dh :: Maybe Int,
      aspect :: Maybe Bool
    }

optionalSizeRangeArgsToStruct :: OptionalSizeRangeArgs -> IO (Ptr ())
optionalSizeRangeArgsToStruct args = do
  p <- mallocBytes 20
{-# LINE 65 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

  (\ptr val -> do {C2HSImp.pokeByteOff ptr 0 (val :: C2HSImp.CInt)}) p $ maybe 0 fromIntegral (maxw args)
  (\ptr val -> do {C2HSImp.pokeByteOff ptr 4 (val :: C2HSImp.CInt)}) p $ maybe 0 fromIntegral (maxh args)
  (\ptr val -> do {C2HSImp.pokeByteOff ptr 8 (val :: C2HSImp.CInt)}) p $ maybe 0 fromIntegral (dw args)
  (\ptr val -> do {C2HSImp.pokeByteOff ptr 12 (val :: C2HSImp.CInt)}) p $ maybe 0 fromIntegral (dh args)
  (\ptr val -> do {C2HSImp.pokeByteOff ptr 16 (val :: C2HSImp.CInt)}) p $ maybe 0 fromBool (aspect args)
  return p

defaultOptionalSizeRangeArgs :: OptionalSizeRangeArgs
defaultOptionalSizeRangeArgs = OptionalSizeRangeArgs Nothing Nothing Nothing Nothing Nothing

fillCustomWindowFunctionStruct :: forall a. (Parent a Window) =>
                                  Ptr () ->
                                  CustomWindowFuncs a ->
                                  IO ()
fillCustomWindowFunctionStruct structPtr (CustomWindowFuncs _flush') =
  toCallbackPrim  `orNullFunPtr` _flush' >>= (\ptr val -> do {C2HSImp.pokeByteOff ptr 64 (val :: (C2HSImp.FunPtr ((C2HSImp.Ptr ()) -> (IO ()))))}) structPtr

defaultCustomWindowFuncs :: forall a. (Parent a Window) => CustomWindowFuncs a
defaultCustomWindowFuncs = CustomWindowFuncs Nothing

virtualFuncs' :: IO ((Ptr ()))
virtualFuncs' =
  virtualFuncs''_ >>= \res ->
  let {res' = id res} in
  return (res')

{-# LINE 86 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

windowMaker :: forall a b. (Parent a Window, Parent b Widget) =>
               Size ->
               Maybe Position ->
               Maybe String ->
               Maybe (Ref b -> IO ()) ->
               CustomWidgetFuncs b ->
               CustomWindowFuncs a ->
               (Int -> Int -> Ptr () -> IO (Ptr ())) ->
               (Int -> Int -> String -> Ptr () -> IO (Ptr ())) ->
               (Int -> Int -> Int -> Int -> Ptr () -> IO (Ptr ())) ->
               (Int -> Int -> Int -> Int -> String -> Ptr () -> IO (Ptr ())) ->
               IO (Ref a)
windowMaker (Size (Width w) (Height h))
            position
            title
            draw'
            customWidgetFuncs'
            customWindowFuncs'
            custom'
            customWithLabel'
            customXY'
            customXYWithLabel' =
     do
       p <- virtualFuncs'
       fillCustomWidgetFunctionStruct p draw' customWidgetFuncs'
       fillCustomWindowFunctionStruct p customWindowFuncs'
       case (position, title) of
        (Nothing, Nothing) -> custom' w h p >>= toRef
        (Just (Position (X x) (Y y)), Nothing) -> customXY' x y w h p >>= toRef
        (Just (Position (X x) (Y y)), (Just l')) -> customXYWithLabel' x y w h l' p >>= toRef
        (Nothing, (Just l')) -> customWithLabel' w h l' p >>= toRef

overriddenWindowNew' :: (Int) -> (Int) -> (Ptr ()) -> IO ((Ptr ()))
overriddenWindowNew' a1 a2 a3 =
  let {a1' = fromIntegral a1} in 
  let {a2' = fromIntegral a2} in 
  let {a3' = id a3} in 
  overriddenWindowNew''_ a1' a2' a3' >>= \res ->
  let {res' = id res} in
  return (res')

{-# LINE 119 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

overriddenWindowNewXY' :: (Int) -> (Int) -> (Int) -> (Int) -> (Ptr ()) -> IO ((Ptr ()))
overriddenWindowNewXY' a1 a2 a3 a4 a5 =
  let {a1' = fromIntegral a1} in 
  let {a2' = fromIntegral a2} in 
  let {a3' = fromIntegral a3} in 
  let {a4' = fromIntegral a4} in 
  let {a5' = id a5} in 
  overriddenWindowNewXY''_ a1' a2' a3' a4' a5' >>= \res ->
  let {res' = id res} in
  return (res')

{-# LINE 120 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

overriddenWindowNewXYWithLabel' :: (Int) -> (Int) -> (Int) -> (Int) -> (String) -> (Ptr ()) -> IO ((Ptr ()))
overriddenWindowNewXYWithLabel' a1 a2 a3 a4 a5 a6 =
  let {a1' = fromIntegral a1} in 
  let {a2' = fromIntegral a2} in 
  let {a3' = fromIntegral a3} in 
  let {a4' = fromIntegral a4} in 
  let {a5' = unsafeToCString a5} in 
  let {a6' = id a6} in 
  overriddenWindowNewXYWithLabel''_ a1' a2' a3' a4' a5' a6' >>= \res ->
  let {res' = id res} in
  return (res')

{-# LINE 121 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

overriddenWindowNewWithLabel' :: (Int) -> (Int) -> (String) -> (Ptr ()) -> IO ((Ptr ()))
overriddenWindowNewWithLabel' a1 a2 a3 a4 =
  let {a1' = fromIntegral a1} in 
  let {a2' = fromIntegral a2} in 
  let {a3' = unsafeToCString a3} in 
  let {a4' = id a4} in 
  overriddenWindowNewWithLabel''_ a1' a2' a3' a4' >>= \res ->
  let {res' = id res} in
  return (res')

{-# LINE 122 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

windowCustom :: Size                        -- ^ Size of this window
             -> Maybe Position              -- ^ Optional position of this window
             -> Maybe String                -- ^ Optional label
             -> Maybe (Ref Window -> IO ()) -- ^ Optional table drawing routine
             -> CustomWidgetFuncs Window    -- ^ Custom widget overrides
             -> CustomWindowFuncs Window    -- ^ Custom window overrides
             -> IO (Ref Window)
windowCustom size position title draw' customWidgetFuncs' customWindowFuncs' =
  windowMaker
    size
    position
    title
    draw'
    customWidgetFuncs'
    customWindowFuncs'
    overriddenWindowNew'
    overriddenWindowNewWithLabel'
    overriddenWindowNewXY'
    overriddenWindowNewXYWithLabel'

windowNew :: Size -> Maybe Position -> Maybe String -> IO (Ref Window)
windowNew size position title =
  windowMaker
    size
    position
    title
    Nothing
    (defaultCustomWidgetFuncs :: CustomWidgetFuncs Window)
    (defaultCustomWindowFuncs :: CustomWindowFuncs Window)
    overriddenWindowNew'
    overriddenWindowNewWithLabel'
    overriddenWindowNewXY'
    overriddenWindowNewXYWithLabel'

windowDestroy' :: (Ptr ()) -> IO ((()))
windowDestroy' a1 =
  let {a1' = id a1} in 
  windowDestroy''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 157 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (IO ())) => Op (Destroy ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> windowDestroy' winPtr

drawSuper' :: (Ptr ()) -> IO ((()))
drawSuper' a1 =
  let {a1' = id a1} in 
  drawSuper''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 161 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO ())) => Op (DrawSuper ()) Window orig impl where
  runOp _ _ window = withRef window $ \windowPtr -> drawSuper' windowPtr

handleSuper' :: (Ptr ()) -> (Int) -> IO ((Int))
handleSuper' a1 a2 =
  let {a1' = id a1} in 
  let {a2' = fromIntegral a2} in 
  handleSuper''_ a1' a2' >>= \res ->
  let {res' = fromIntegral res} in
  return (res')

{-# LINE 165 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (Event ->  IO (Int))) => Op (HandleSuper ()) Window orig impl where
  runOp _ _ window event = withRef window $ \windowPtr -> handleSuper' windowPtr (fromIntegral (fromEnum event))

resizeSuper' :: (Ptr ()) -> (Int) -> (Int) -> (Int) -> (Int) -> IO ((()))
resizeSuper' a1 a2 a3 a4 a5 =
  let {a1' = id a1} in 
  let {a2' = fromIntegral a2} in 
  let {a3' = fromIntegral a3} in 
  let {a4' = fromIntegral a4} in 
  let {a5' = fromIntegral a5} in 
  resizeSuper''_ a1' a2' a3' a4' a5' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 169 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (Rectangle -> IO ())) => Op (ResizeSuper ()) Window orig impl where
  runOp _ _ window rectangle =
    let (x_pos, y_pos, width, height) = fromRectangle rectangle
    in withRef window $ \windowPtr -> resizeSuper' windowPtr x_pos y_pos width height

showSuper' :: (Ptr ()) -> IO ((()))
showSuper' a1 =
  let {a1' = id a1} in 
  showSuper''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 175 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO ())) => Op (ShowWidgetSuper ()) Window orig impl where
  runOp _ _ window = withRef window $ \windowPtr -> showSuper' windowPtr

hideSuper' :: (Ptr ()) -> IO ((()))
hideSuper' a1 =
  let {a1' = id a1} in 
  hideSuper''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 179 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO ())) => Op (HideSuper ()) Window orig impl where
  runOp _ _ window = withRef window $ \windowPtr -> hideSuper' windowPtr

flushSuper' :: (Ptr ()) -> IO ((()))
flushSuper' a1 =
  let {a1' = id a1} in 
  flushSuper''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 183 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO ())) => Op (FlushSuper ()) Window orig impl where
  runOp _ _ window = withRef window $ \windowPtr -> flushSuper' windowPtr

windowShow' :: (Ptr ()) -> IO ((()))
windowShow' a1 =
  let {a1' = id a1} in 
  windowShow''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 187 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (IO ())) => Op (ShowWidget ()) Window orig impl where
  runOp _ _ window = withRef window (\p -> windowShow' p)

windowHandle' :: (Ptr ()) -> (CInt) -> IO ((Int))
windowHandle' a1 a2 =
  let {a1' = id a1} in 
  let {a2' = id a2} in 
  windowHandle''_ a1' a2' >>= \res ->
  let {res' = fromIntegral res} in
  return (res')

{-# LINE 191 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (Event -> IO Int)) => Op (Handle ()) Window orig impl where
  runOp _ _ window event = withRef window (\p -> windowHandle' p (fromIntegral . fromEnum $ event))

resize' :: (Ptr ()) -> (Int) -> (Int) -> (Int) -> (Int) -> IO ((()))
resize' a1 a2 a3 a4 a5 =
  let {a1' = id a1} in 
  let {a2' = fromIntegral a2} in 
  let {a3' = fromIntegral a3} in 
  let {a4' = fromIntegral a4} in 
  let {a5' = fromIntegral a5} in 
  resize''_ a1' a2' a3' a4' a5' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 195 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (Rectangle -> IO ())) => Op (Resize ()) Window orig impl where
  runOp _ _ window rectangle = withRef window $ \windowPtr -> do
                                 let (x_pos,y_pos,w_pos,h_pos) = fromRectangle rectangle
                                 resize' windowPtr x_pos y_pos w_pos h_pos

windowSetCallback' :: (Ptr ()) -> (FunPtr CallbackWithUserDataPrim) -> IO ((()))
windowSetCallback' a1 a2 =
  let {a1' = id a1} in 
  let {a2' = id a2} in 
  windowSetCallback''_ a1' a2' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 201 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ((Ref orig -> IO ()) -> IO ())) => Op (SetCallback ()) Window orig impl where
  runOp _ _ window callback =
   withRef window $ (\p -> do
                           callbackPtr <- toCallbackPrimWithUserData callback
                           windowSetCallback' (castPtr p) callbackPtr)

hide' :: (Ptr ()) -> IO ((()))
hide' a1 =
  let {a1' = id a1} in 
  hide''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 208 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO ())) => Op (Hide ()) Window orig impl where
  runOp _ _ window = withRef window $ \windowPtr -> hide' windowPtr

changed' :: (Ptr ()) -> IO ((Bool))
changed' a1 =
  let {a1' = id a1} in 
  changed''_ a1' >>= \res ->
  let {res' = cToBool res} in
  return (res')

{-# LINE 212 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO (Bool))) => Op (Changed ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> changed' winPtr

fullscreen' :: (Ptr ()) -> IO ((()))
fullscreen' a1 =
  let {a1' = id a1} in 
  fullscreen''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 216 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO ())) => Op (MakeFullscreen ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> fullscreen' winPtr

fullscreenOff' :: (Ptr ()) -> IO ((()))
fullscreenOff' a1 =
  let {a1' = id a1} in 
  fullscreenOff''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 220 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

fullscreenOffWithResize' :: (Ptr ()) -> (Int) -> (Int) -> (Int) -> (Int) -> IO ((()))
fullscreenOffWithResize' a1 a2 a3 a4 a5 =
  let {a1' = id a1} in 
  let {a2' = fromIntegral a2} in 
  let {a3' = fromIntegral a3} in 
  let {a4' = fromIntegral a4} in 
  let {a5' = fromIntegral a5} in 
  fullscreenOffWithResize''_ a1' a2' a3' a4' a5' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 221 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (Maybe Rectangle ->  IO ())) => Op (FullscreenOff ()) Window orig impl where
  runOp _ _ win (Just rectangle) =
    withRef win $ \winPtr ->
        let (x_pos, y_pos, width, height) = fromRectangle rectangle
        in fullscreenOffWithResize' winPtr x_pos y_pos width height
  runOp _ _ win Nothing =
    withRef win $ \winPtr -> fullscreenOff' winPtr

setBorder' :: (Ptr ()) -> (Bool) -> IO ((()))
setBorder' a1 a2 =
  let {a1' = id a1} in 
  let {a2' = fromBool a2} in 
  setBorder''_ a1' a2' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 230 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (Bool ->  IO ())) => Op (SetBorder ()) Window orig impl where
  runOp _ _ win b = withRef win $ \winPtr -> setBorder' winPtr b

clearBorder' :: (Ptr ()) -> IO ((()))
clearBorder' a1 =
  let {a1' = id a1} in 
  clearBorder''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 234 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO ())) => Op (ClearBorder ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> clearBorder' winPtr

border' :: (Ptr ()) -> IO ((Bool))
border' a1 =
  let {a1' = id a1} in 
  border''_ a1' >>= \res ->
  let {res' = toBool res} in
  return (res')

{-# LINE 238 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO (Bool))) => Op (GetBorder ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> border' winPtr

setOverride' :: (Ptr ()) -> IO ((()))
setOverride' a1 =
  let {a1' = id a1} in 
  setOverride''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 242 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO ())) => Op (SetOverride ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> setOverride' winPtr

override' :: (Ptr ()) -> IO ((Bool))
override' a1 =
  let {a1' = id a1} in 
  override''_ a1' >>= \res ->
  let {res' = toBool res} in
  return (res')

{-# LINE 246 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO (Bool))) => Op (GetOverride ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> override' winPtr

setModal' :: (Ptr ()) -> IO ((()))
setModal' a1 =
  let {a1' = id a1} in 
  setModal''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 250 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO ())) => Op (SetModal ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> setModal' winPtr

modal' :: (Ptr ()) -> IO ((Bool))
modal' a1 =
  let {a1' = id a1} in 
  modal''_ a1' >>= \res ->
  let {res' = toBool res} in
  return (res')

{-# LINE 254 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO (Bool))) => Op (GetModal ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> modal' winPtr

setNonModal' :: (Ptr ()) -> IO ((()))
setNonModal' a1 =
  let {a1' = id a1} in 
  setNonModal''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 258 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO ())) => Op (SetNonModal ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> setNonModal' winPtr

nonModal' :: (Ptr ()) -> IO ((Bool))
nonModal' a1 =
  let {a1' = id a1} in 
  nonModal''_ a1' >>= \res ->
  let {res' = toBool res} in
  return (res')

{-# LINE 262 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO (Bool))) => Op (NonModal ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> nonModal' winPtr

setMenuWindow' :: (Ptr ()) -> IO ((()))
setMenuWindow' a1 =
  let {a1' = id a1} in 
  setMenuWindow''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 266 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO ())) => Op (SetMenuWindow ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> setMenuWindow' winPtr

menuWindow' :: (Ptr ()) -> IO ((Bool))
menuWindow' a1 =
  let {a1' = id a1} in 
  menuWindow''_ a1' >>= \res ->
  let {res' = toBool res} in
  return (res')

{-# LINE 270 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO (Bool))) => Op (GetMenuWindow ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> menuWindow' winPtr

setTooltipWindow' :: (Ptr ()) -> IO ((()))
setTooltipWindow' a1 =
  let {a1' = id a1} in 
  setTooltipWindow''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 274 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO ())) => Op (SetTooltipWindow ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> setTooltipWindow' winPtr

tooltipWindow' :: (Ptr ()) -> IO ((Bool))
tooltipWindow' a1 =
  let {a1' = id a1} in 
  tooltipWindow''_ a1' >>= \res ->
  let {res' = toBool res} in
  return (res')

{-# LINE 278 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO (Bool))) => Op (GetTooltipWindow ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> tooltipWindow' winPtr

hotspotWithXY' :: (Ptr ()) -> (Int) -> (Int) -> IO ((()))
hotspotWithXY' a1 a2 a3 =
  let {a1' = id a1} in 
  let {a2' = fromIntegral a2} in 
  let {a3' = fromIntegral a3} in 
  hotspotWithXY''_ a1' a2' a3' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 282 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

hotspotWithXYWithOffscreen' :: (Ptr ()) -> (Int) -> (Int) -> (Bool) -> IO ((()))
hotspotWithXYWithOffscreen' a1 a2 a3 a4 =
  let {a1' = id a1} in 
  let {a2' = fromIntegral a2} in 
  let {a3' = fromIntegral a3} in 
  let {a4' = fromBool a4} in 
  hotspotWithXYWithOffscreen''_ a1' a2' a3' a4' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 283 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

hotspotWithWidget' :: (Ptr ()) -> (Ptr ()) -> IO ((()))
hotspotWithWidget' a1 a2 =
  let {a1' = id a1} in 
  let {a2' = id a2} in 
  hotspotWithWidget''_ a1' a2' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 284 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

hotspotWithWidgetWithOffscreen' :: (Ptr ()) -> (Ptr ()) -> (Bool) -> IO ((()))
hotspotWithWidgetWithOffscreen' a1 a2 a3 =
  let {a1' = id a1} in 
  let {a2' = id a2} in 
  let {a3' = fromBool a3} in 
  hotspotWithWidgetWithOffscreen''_ a1' a2' a3' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 285 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (PositionSpec -> Maybe Bool -> IO ())) => Op (HotSpot ()) Window orig impl where
  runOp _ _ win positionSpec offscreen =
    withRef win $ \winPtr ->
            case (positionSpec, offscreen) of
              ((ByPosition (Position (X x) (Y y))), (Just offscreen')) ->
                  hotspotWithXYWithOffscreen' winPtr x y offscreen'
              ((ByPosition (Position (X x) (Y y))), Nothing) -> hotspotWithXY' winPtr x y
              ((ByWidget templateWidget), (Just offscreen')) ->
                  withRef templateWidget $ \templatePtr ->
                      hotspotWithWidgetWithOffscreen' winPtr templatePtr offscreen'
              ((ByWidget templateWidget), Nothing) ->
                  withRef templateWidget $ \templatePtr ->
                      hotspotWithWidget' winPtr templatePtr
freePosition' :: (Ptr ()) -> IO ((()))
freePosition' a1 =
  let {a1' = id a1} in 
  freePosition''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 299 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO ())) => Op (FreePosition ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> freePosition' winPtr

sizeRange' :: (Ptr ()) -> (Int) -> (Int) -> IO ((()))
sizeRange' a1 a2 a3 =
  let {a1' = id a1} in 
  let {a2' = fromIntegral a2} in 
  let {a3' = fromIntegral a3} in 
  sizeRange''_ a1' a2' a3' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 303 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

sizeRangeWithArgs' :: (Ptr ()) -> (Int) -> (Int) -> (Ptr ()) -> IO ((()))
sizeRangeWithArgs' a1 a2 a3 a4 =
  let {a1' = id a1} in 
  let {a2' = fromIntegral a2} in 
  let {a3' = fromIntegral a3} in 
  let {a4' = id a4} in 
  sizeRangeWithArgs''_ a1' a2' a3' a4' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 304 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (Int -> Int -> IO ())) => Op (SizeRange ()) Window orig impl where
  runOp _ _ win minw' minh' =
    withRef win $ \winPtr -> sizeRange' winPtr minw' minh'
instance (impl ~ (Int -> Int -> OptionalSizeRangeArgs ->  IO ())) => Op (SizeRangeWithArgs ()) Window orig impl where
  runOp _ _ win minw' minh' args =
    withRef win $ \winPtr -> do
      structPtr <- optionalSizeRangeArgsToStruct args
      sizeRangeWithArgs' winPtr minw' minh' structPtr

label' :: (Ptr ()) -> IO ((String))
label' a1 =
  let {a1' = id a1} in 
  label''_ a1' >>= \res ->
  let {res' = unsafeFromCString res} in
  return (res')

{-# LINE 314 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO (String))) => Op (GetLabel ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> label' winPtr

iconlabel' :: (Ptr ()) -> IO ((String))
iconlabel' a1 =
  let {a1' = id a1} in 
  iconlabel''_ a1' >>= \res ->
  let {res' = unsafeFromCString res} in
  return (res')

{-# LINE 318 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO (String))) => Op (GetIconlabel ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> iconlabel' winPtr

setLabel' :: (Ptr ()) -> (String) -> IO ((()))
setLabel' a1 a2 =
  let {a1' = id a1} in 
  let {a2' = unsafeToCString a2} in 
  setLabel''_ a1' a2' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 322 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (String ->  IO ())) => Op (SetLabel ()) Window orig impl where
  runOp _ _ win l' = withRef win $ \winPtr -> setLabel' winPtr l'

setIconlabel' :: (Ptr ()) -> (String) -> IO ((()))
setIconlabel' a1 a2 =
  let {a1' = id a1} in 
  let {a2' = unsafeToCString a2} in 
  setIconlabel''_ a1' a2' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 326 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (String ->  IO ())) => Op (SetIconlabel ()) Window orig impl where
  runOp _ _ win l' = withRef win $ \winPtr -> setIconlabel' winPtr l'

setLabelWithIconlabel' :: (Ptr ()) -> (String) -> (String) -> IO ((()))
setLabelWithIconlabel' a1 a2 a3 =
  let {a1' = id a1} in 
  let {a2' = unsafeToCString a2} in 
  let {a3' = unsafeToCString a3} in 
  setLabelWithIconlabel''_ a1' a2' a3' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 330 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (String -> String ->  IO ())) => Op (SetLabelWithIconlabel ()) Window orig impl where
  runOp _ _ win label iconlabel = withRef win $ \winPtr -> setLabelWithIconlabel' winPtr label iconlabel

copyLabel' :: (Ptr ()) -> (String) -> IO ((()))
copyLabel' a1 a2 =
  let {a1' = id a1} in 
  let {a2' = unsafeToCString a2} in 
  copyLabel''_ a1' a2' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 334 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (String ->  IO ())) => Op (CopyLabel ()) Window orig impl where
  runOp _ _ win a = withRef win $ \winPtr -> copyLabel' winPtr a

xclass' :: (Ptr ()) -> IO ((String))
xclass' a1 =
  let {a1' = id a1} in 
  xclass''_ a1' >>= \res ->
  let {res' = unsafeFromCString res} in
  return (res')

{-# LINE 338 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO (String))) => Op (GetXclass ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> xclass' winPtr

setXclass' :: (Ptr ()) -> (String) -> IO ((()))
setXclass' a1 a2 =
  let {a1' = id a1} in 
  let {a2' = unsafeToCString a2} in 
  setXclass''_ a1' a2' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 342 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (String ->  IO ())) => Op (SetXclass ()) Window orig impl where
  runOp _ _ win c = withRef win $ \winPtr -> setXclass' winPtr c

icon' :: (Ptr ()) -> IO ((Ptr ()))
icon' a1 =
  let {a1' = id a1} in 
  icon''_ a1' >>= \res ->
  let {res' = id res} in
  return (res')

{-# LINE 346 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO (Maybe (Ref Image)))) => Op (GetIcon ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> icon' winPtr >>= toMaybeRef

setIcon' :: (Ptr ()) -> (Ptr ()) -> IO ((()))
setIcon' a1 a2 =
  let {a1' = id a1} in 
  let {a2' = id a2} in 
  setIcon''_ a1' a2' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 350 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (Parent a Image, impl ~ (Maybe( Ref a ) ->  IO ())) => Op (SetIcon ()) Window orig impl where
  runOp _ _ win bitmap = withRef win $ \winPtr -> withMaybeRef bitmap $ \bitmapPtr -> setIcon' winPtr bitmapPtr

shown' :: (Ptr ()) -> IO ((Bool))
shown' a1 =
  let {a1' = id a1} in 
  shown''_ a1' >>= \res ->
  let {res' = toBool res} in
  return (res')

{-# LINE 354 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO (Bool))) => Op (Shown ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> shown' winPtr

iconize' :: (Ptr ()) -> IO ((()))
iconize' a1 =
  let {a1' = id a1} in 
  iconize''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 358 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO ())) => Op (Iconize ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> iconize' winPtr

xRoot' :: (Ptr ()) -> IO ((Int))
xRoot' a1 =
  let {a1' = id a1} in 
  xRoot''_ a1' >>= \res ->
  let {res' = fromIntegral res} in
  return (res')

{-# LINE 362 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO (Int))) => Op (GetXRoot ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> xRoot' winPtr

yRoot' :: (Ptr ()) -> IO ((Int))
yRoot' a1 =
  let {a1' = id a1} in 
  yRoot''_ a1' >>= \res ->
  let {res' = fromIntegral res} in
  return (res')

{-# LINE 366 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO (Int))) => Op (GetYRoot ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> yRoot' winPtr

current' :: IO ((Ptr ()))
current' =
  current''_ >>= \res ->
  let {res' = id res} in
  return (res')

{-# LINE 370 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

currentWindow ::  (Parent a Window) => IO (Ref a)
currentWindow = current' >>= toRef

makeCurrent' :: (Ptr ()) -> IO ((()))
makeCurrent' a1 =
  let {a1' = id a1} in 
  makeCurrent''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 374 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO ())) => Op (MakeCurrent ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> makeCurrent' winPtr

setCursorWithBg' :: (Ptr ()) -> (Cursor) -> (Color) -> IO ((()))
setCursorWithBg' a1 a2 a3 =
  let {a1' = id a1} in 
  let {a2' = cFromEnum a2} in 
  let {a3' = cFromColor a3} in 
  setCursorWithBg''_ a1' a2' a3' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 378 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

setCursorWithFg' :: (Ptr ()) -> (Cursor) -> (Color) -> IO ((()))
setCursorWithFg' a1 a2 a3 =
  let {a1' = id a1} in 
  let {a2' = cFromEnum a2} in 
  let {a3' = cFromColor a3} in 
  setCursorWithFg''_ a1' a2' a3' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 379 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

setCursorWithFgBg' :: (Ptr ()) -> (Cursor) -> (Color) -> (Color) -> IO ((()))
setCursorWithFgBg' a1 a2 a3 a4 =
  let {a1' = id a1} in 
  let {a2' = cFromEnum a2} in 
  let {a3' = cFromColor a3} in 
  let {a4' = cFromColor a4} in 
  setCursorWithFgBg''_ a1' a2' a3' a4' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 380 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

setCursor' :: (Ptr ()) -> (Cursor) -> IO ((()))
setCursor' a1 a2 =
  let {a1' = id a1} in 
  let {a2' = cFromEnum a2} in 
  setCursor''_ a1' a2' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 381 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (Cursor -> IO ())) => Op (SetCursor ()) Window orig impl where
  runOp _ _ win cursor =  withRef win $ \winPtr -> setCursor' winPtr cursor
instance (impl ~ (Cursor -> (Maybe Color, Maybe Color) ->  IO ())) => Op (SetCursorWithFgBg ()) Window orig impl where
  runOp _ _ win cursor fgbg =
    case fgbg of
      ((Just fg), (Just bg)) -> withRef win $ \winPtr -> setCursorWithFgBg' winPtr cursor fg bg
      (Nothing , (Just bg)) -> withRef win $ \winPtr -> setCursorWithBg' winPtr cursor bg
      ((Just fg), Nothing)  -> withRef win $ \winPtr -> setCursorWithFg' winPtr cursor fg
      (Nothing, Nothing)    -> withRef win $ \winPtr -> setCursor' winPtr cursor

setDefaultCursorWithBg' :: (Ptr ()) -> (CursorType) -> (Color) -> IO ((()))
setDefaultCursorWithBg' a1 a2 a3 =
  let {a1' = id a1} in 
  let {a2' = cFromEnum a2} in 
  let {a3' = cFromColor a3} in 
  setDefaultCursorWithBg''_ a1' a2' a3' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 392 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

setDefaultCursorWithFg' :: (Ptr ()) -> (CursorType) -> (Color) -> IO ((()))
setDefaultCursorWithFg' a1 a2 a3 =
  let {a1' = id a1} in 
  let {a2' = cFromEnum a2} in 
  let {a3' = cFromColor a3} in 
  setDefaultCursorWithFg''_ a1' a2' a3' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 393 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

setDefaultCursorWithFgBg' :: (Ptr ()) -> (CursorType) -> (Color) -> (Color) -> IO ((()))
setDefaultCursorWithFgBg' a1 a2 a3 a4 =
  let {a1' = id a1} in 
  let {a2' = cFromEnum a2} in 
  let {a3' = cFromColor a3} in 
  let {a4' = cFromColor a4} in 
  setDefaultCursorWithFgBg''_ a1' a2' a3' a4' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 394 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

setDefaultCursor' :: (Ptr ()) -> (CursorType) -> IO ((()))
setDefaultCursor' a1 a2 =
  let {a1' = id a1} in 
  let {a2' = cFromEnum a2} in 
  setDefaultCursor''_ a1' a2' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 395 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (CursorType -> IO ())) => Op (SetDefaultCursor ()) Window orig impl where
  runOp _ _ win cursor = withRef win $ \winPtr -> setDefaultCursor' winPtr cursor
instance (impl ~ (CursorType -> (Maybe Color, Maybe Color) -> IO ())) => Op (SetDefaultCursorWithFgBg ()) Window orig impl where
  runOp _ _ win cursor fgbg =
    case fgbg of
      ((Just fg), (Just bg)) -> withRef win $ \winPtr -> setDefaultCursorWithFgBg' winPtr cursor fg bg
      (Nothing , (Just bg)) -> withRef win $ \winPtr -> setDefaultCursorWithBg' winPtr cursor bg
      ((Just fg), Nothing)  -> withRef win $ \winPtr -> setDefaultCursorWithFg' winPtr cursor fg
      (Nothing, Nothing)    -> withRef win $ \winPtr -> setDefaultCursor' winPtr cursor

decoratedW' :: (Ptr ()) -> IO ((Int))
decoratedW' a1 =
  let {a1' = id a1} in 
  decoratedW''_ a1' >>= \res ->
  let {res' = fromIntegral res} in
  return (res')

{-# LINE 406 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO (Int))) => Op (GetDecoratedW ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> decoratedW' winPtr

decoratedH' :: (Ptr ()) -> IO ((Int))
decoratedH' a1 =
  let {a1' = id a1} in 
  decoratedH''_ a1' >>= \res ->
  let {res' = fromIntegral res} in
  return (res')

{-# LINE 410 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO (Int))) => Op (GetDecoratedH ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> decoratedH' winPtr

windowDrawBox' :: (Ptr ()) -> IO ((()))
windowDrawBox' a1 =
  let {a1' = id a1} in 
  windowDrawBox''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 414 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

windowDrawBoxWithTC' :: (Ptr ()) -> (Boxtype) -> (Color) -> IO ((()))
windowDrawBoxWithTC' a1 a2 a3 =
  let {a1' = id a1} in 
  let {a2' = cFromEnum a2} in 
  let {a3' = cFromColor a3} in 
  windowDrawBoxWithTC''_ a1' a2' a3' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 415 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

windowDrawBoxWithTXywhC' :: (Ptr ()) -> (Boxtype) -> (Int) -> (Int) -> (Int) -> (Int) -> (Color) -> IO ((()))
windowDrawBoxWithTXywhC' a1 a2 a3 a4 a5 a6 a7 =
  let {a1' = id a1} in 
  let {a2' = cFromEnum a2} in 
  let {a3' = fromIntegral a3} in 
  let {a4' = fromIntegral a4} in 
  let {a5' = fromIntegral a5} in 
  let {a6' = fromIntegral a6} in 
  let {a7' = cFromColor a7} in 
  windowDrawBoxWithTXywhC''_ a1' a2' a3' a4' a5' a6' a7' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 416 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (IO ())) => Op (DrawBox ()) Window orig impl where
  runOp _ _ window = withRef window $ \windowPtr -> windowDrawBox' windowPtr
instance (impl ~ (Boxtype -> Color -> Maybe Rectangle -> IO ())) => Op (DrawBoxWithBoxtype ()) Window orig impl where
  runOp _ _ window bx c Nothing =
              withRef window $ \windowPtr -> windowDrawBoxWithTC' windowPtr bx c
  runOp _ _ window bx c (Just r) =
              withRef window $ \windowPtr -> do
                let (x_pos,y_pos,w_pos,h_pos) = fromRectangle r
                windowDrawBoxWithTXywhC' windowPtr bx x_pos y_pos w_pos h_pos c
windowDrawBackdrop' :: (Ptr ()) -> IO ((()))
windowDrawBackdrop' a1 =
  let {a1' = id a1} in 
  windowDrawBackdrop''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 426 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (IO ())) => Op (DrawBackdrop ()) Window orig impl where
  runOp _ _ window = withRef window $ \windowPtr -> windowDrawBackdrop' windowPtr

windowDrawFocus' :: (Ptr ()) -> IO ((()))
windowDrawFocus' a1 =
  let {a1' = id a1} in 
  windowDrawFocus''_ a1' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 430 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

windowDrawFocusWithTXywh' :: (Ptr ()) -> (Boxtype) -> (Int) -> (Int) -> (Int) -> (Int) -> IO ((()))
windowDrawFocusWithTXywh' a1 a2 a3 a4 a5 a6 =
  let {a1' = id a1} in 
  let {a2' = cFromEnum a2} in 
  let {a3' = fromIntegral a3} in 
  let {a4' = fromIntegral a4} in 
  let {a5' = fromIntegral a5} in 
  let {a6' = fromIntegral a6} in 
  windowDrawFocusWithTXywh''_ a1' a2' a3' a4' a5' a6' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 431 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (Maybe (Boxtype, Rectangle) -> IO ())) => Op (DrawFocus ()) Window orig impl where
  runOp _ _ window Nothing =
                withRef window $ \ windowPtr -> windowDrawFocus' windowPtr
  runOp _ _ window (Just (bx, r)) =
                withRef window $ \windowPtr -> do
                  let (x_pos,y_pos,w_pos,h_pos) = fromRectangle r
                  windowDrawFocusWithTXywh' windowPtr bx x_pos y_pos w_pos h_pos

waitForExpose' :: (Ptr ()) -> IO ()
waitForExpose' a1 =
  let {a1' = id a1} in 
  waitForExpose''_ a1' >>
  return ()

{-# LINE 440 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ ( IO ())) => Op (WaitForExpose ()) Window orig impl where
  runOp _ _ win = withRef win $ \winPtr -> waitForExpose' winPtr

setType' :: (Ptr ()) -> (Word8) -> IO ((()))
setType' a1 a2 =
  let {a1' = id a1} in 
  let {a2' = fromIntegral a2} in 
  setType''_ a1' a2' >>= \res ->
  let {res' = supressWarningAboutRes res} in
  return (res')

{-# LINE 444 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ (WindowType ->  IO ())) => Op (SetType ()) Window orig impl where
  runOp _ _ widget t = withRef widget $ \widgetPtr -> setType' widgetPtr (fromInteger $ toInteger $ fromEnum t)
type' :: (Ptr ()) -> IO ((Word8))
type' a1 =
  let {a1' = id a1} in 
  type''_ a1' >>= \res ->
  let {res' = fromIntegral res} in
  return (res')

{-# LINE 447 "src/Graphics/UI/FLTK/LowLevel/Window.chs" #-}

instance (impl ~ IO (WindowType)) => Op (GetType_ ()) Window orig impl where
  runOp _ _ widget = withRef widget $ \widgetPtr -> type' widgetPtr >>= return . toEnum . fromInteger . toInteger

-- $hierarchy
-- @
-- "Graphics.UI.FLTK.LowLevel.Widget"
--  |
--  v
-- "Graphics.UI.FLTK.LowLevel.Group"
--  |
--  v
-- "Graphics.UI.FLTK.LowLevel.Window"
-- @

-- $functions
-- @
-- changed :: 'Ref' 'Window' -> 'IO' ('Bool')
--
-- clearBorder :: 'Ref' 'Window' -> 'IO' ()
--
-- copyLabel :: 'Ref' 'Window' -> 'String' -> 'IO' ()
--
-- destroy :: 'Ref' 'Window' -> 'IO' ()
--
-- drawBackdrop :: 'Ref' 'Window' -> 'IO' ()
--
-- drawBox :: 'Ref' 'Window' -> 'IO' ()
--
-- drawBoxWithBoxtype :: 'Ref' 'Window' -> 'Boxtype' -> 'Color' -> 'Maybe' 'Rectangle' -> 'IO' ()
--
-- drawFocus :: 'Ref' 'Window' -> 'Maybe' ('Boxtype', 'Rectangle') -> 'IO' ()
--
-- drawSuper :: 'Ref' 'Window' -> 'IO' ()
--
-- flushSuper :: 'Ref' 'Window' -> 'IO' ()
--
-- freePosition :: 'Ref' 'Window' -> 'IO' ()
--
-- fullscreenOff :: 'Ref' 'Window' -> 'Maybe' 'Rectangle' -> 'IO' ()
--
-- getBorder :: 'Ref' 'Window' -> 'IO' ('Bool')
--
-- getDecoratedH :: 'Ref' 'Window' -> 'IO' ('Int')
--
-- getDecoratedW :: 'Ref' 'Window' -> 'IO' ('Int')
--
-- getIcon :: 'Ref' 'Window' -> 'IO' ('Maybe' ('Ref' 'Image'))
--
-- getIconlabel :: 'Ref' 'Window' -> 'IO' ('String')
--
-- getLabel :: 'Ref' 'Window' -> 'IO' ('String')
--
-- getMenuWindow :: 'Ref' 'Window' -> 'IO' ('Bool')
--
-- getModal :: 'Ref' 'Window' -> 'IO' ('Bool')
--
-- getOverride :: 'Ref' 'Window' -> 'IO' ('Bool')
--
-- getTooltipWindow :: 'Ref' 'Window' -> 'IO' ('Bool')
--
-- getType_ :: 'Ref' 'Window' -> 'IO' ('WindowType')
--
-- getXRoot :: 'Ref' 'Window' -> 'IO' ('Int')
--
-- getXclass :: 'Ref' 'Window' -> 'IO' ('String')
--
-- getYRoot :: 'Ref' 'Window' -> 'IO' ('Int')
--
-- handle :: 'Ref' 'Window' -> 'Event' -> 'IO' 'Int'
--
-- handleSuper :: 'Ref' 'Window' -> 'Int' -> 'IO' ('Int')
--
-- hide :: 'Ref' 'Window' -> 'IO' ()
--
-- hideSuper :: 'Ref' 'Window' -> 'IO' ()
--
-- hotSpot :: 'Ref' 'Window' -> 'PositionSpec' -> 'Maybe' 'Bool' -> 'IO' ()
--
-- iconize :: 'Ref' 'Window' -> 'IO' ()
--
-- makeCurrent :: 'Ref' 'Window' -> 'IO' ()
--
-- makeFullscreen :: 'Ref' 'Window' -> 'IO' ()
--
-- nonModal :: 'Ref' 'Window' -> 'IO' ('Bool')
--
-- resize :: 'Ref' 'Window' -> 'Rectangle' -> 'IO' ()
--
-- resizeSuper :: 'Ref' 'Window' -> 'Rectangle' -> 'IO' ()
--
-- setBorder :: 'Ref' 'Window' -> 'Bool' -> 'IO' ()
--
-- setCallback :: 'Ref' 'Window' -> ('Ref' orig -> 'IO' ()) -> 'IO' ()
--
-- setCursor :: 'Ref' 'Window' -> 'Cursor' -> 'IO' ()
--
-- setCursorWithFgBg :: 'Ref' 'Window' -> 'Cursor' -> ('Maybe' 'Color', 'Maybe' 'Color') -> 'IO' ()
--
-- setDefaultCursor :: 'Ref' 'Window' -> 'CursorType' -> 'IO' ()
--
-- setDefaultCursorWithFgBg :: 'Ref' 'Window' -> 'CursorType' -> ('Maybe' 'Color', 'Maybe' 'Color') -> 'IO' ()
--
-- setIcon:: ('Parent' a 'Image') => 'Ref' 'Window' -> 'Maybe'( 'Ref' a ) -> 'IO' ()
--
-- setIconlabel :: 'Ref' 'Window' -> 'String' -> 'IO' ()
--
-- setLabel :: 'Ref' 'Window' -> 'String' -> 'IO' ()
--
-- setLabelWithIconlabel :: 'Ref' 'Window' -> 'String' -> 'String' -> 'IO' ()
--
-- setMenuWindow :: 'Ref' 'Window' -> 'IO' ()
--
-- setModal :: 'Ref' 'Window' -> 'IO' ()
--
-- setNonModal :: 'Ref' 'Window' -> 'IO' ()
--
-- setOverride :: 'Ref' 'Window' -> 'IO' ()
--
-- setTooltipWindow :: 'Ref' 'Window' -> 'IO' ()
--
-- setType :: 'Ref' 'Window' -> 'WindowType' -> 'IO' ()
--
-- setXclass :: 'Ref' 'Window' -> 'String' -> 'IO' ()
--
-- showWidget :: 'Ref' 'Window' -> 'IO' ()
--
-- showWidgetSuper :: 'Ref' 'Window' -> 'IO' ()
--
-- shown :: 'Ref' 'Window' -> 'IO' ('Bool')
--
-- sizeRange :: 'Ref' 'Window' -> 'Int' -> 'Int' -> 'IO' ()
--
-- sizeRangeWithArgs :: 'Ref' 'Window' -> 'Int' -> 'Int' -> 'OptionalSizeRangeArgs' -> 'IO' ()
--
-- waitForExpose :: 'Ref' 'Window' -> 'IO' ()
-- @

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_default_virtual_funcs"
  virtualFuncs''_ :: (IO (C2HSImp.Ptr ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_OverriddenWindow_New"
  overriddenWindowNew''_ :: (C2HSImp.CInt -> (C2HSImp.CInt -> ((C2HSImp.Ptr ()) -> (IO (C2HSImp.Ptr ())))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_OverriddenWindow_NewXY"
  overriddenWindowNewXY''_ :: (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> ((C2HSImp.Ptr ()) -> (IO (C2HSImp.Ptr ())))))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_OverriddenWindow_NewXY_WithLabel"
  overriddenWindowNewXYWithLabel''_ :: (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> ((C2HSImp.Ptr C2HSImp.CChar) -> ((C2HSImp.Ptr ()) -> (IO (C2HSImp.Ptr ()))))))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_OverriddenWindow_New_WithLabel"
  overriddenWindowNewWithLabel''_ :: (C2HSImp.CInt -> (C2HSImp.CInt -> ((C2HSImp.Ptr C2HSImp.CChar) -> ((C2HSImp.Ptr ()) -> (IO (C2HSImp.Ptr ()))))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_Destroy"
  windowDestroy''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_draw_super"
  drawSuper''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_handle_super"
  handleSuper''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (IO C2HSImp.CInt)))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_resize_super"
  resizeSuper''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> (IO ()))))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_show_super"
  showSuper''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_hide_super"
  hideSuper''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_flush_super"
  flushSuper''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_show"
  windowShow''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_handle"
  windowHandle''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (IO C2HSImp.CInt)))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_resize"
  resize''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> (IO ()))))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_callback"
  windowSetCallback''_ :: ((C2HSImp.Ptr ()) -> ((C2HSImp.FunPtr ((C2HSImp.Ptr ()) -> ((C2HSImp.Ptr ()) -> (IO ())))) -> (IO ())))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_hide"
  hide''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_changed"
  changed''_ :: ((C2HSImp.Ptr ()) -> (IO C2HSImp.CUInt))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_fullscreen"
  fullscreen''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_fullscreen_off"
  fullscreenOff''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_fullscreen_off_with_resize"
  fullscreenOffWithResize''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> (IO ()))))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_border"
  setBorder''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (IO ())))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_clear_border"
  clearBorder''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_border"
  border''_ :: ((C2HSImp.Ptr ()) -> (IO C2HSImp.CUInt))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_override"
  setOverride''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_override"
  override''_ :: ((C2HSImp.Ptr ()) -> (IO C2HSImp.CUInt))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_modal"
  setModal''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_modal"
  modal''_ :: ((C2HSImp.Ptr ()) -> (IO C2HSImp.CUInt))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_non_modal"
  setNonModal''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_non_modal"
  nonModal''_ :: ((C2HSImp.Ptr ()) -> (IO C2HSImp.CUInt))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_menu_window"
  setMenuWindow''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_menu_window"
  menuWindow''_ :: ((C2HSImp.Ptr ()) -> (IO C2HSImp.CUInt))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_tooltip_window"
  setTooltipWindow''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_tooltip_window"
  tooltipWindow''_ :: ((C2HSImp.Ptr ()) -> (IO C2HSImp.CUInt))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_hotspot_with_x_y"
  hotspotWithXY''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (C2HSImp.CInt -> (IO ()))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_hotspot_with_x_y_with_offscreen"
  hotspotWithXYWithOffscreen''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> (IO ())))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_hotspot_with_widget"
  hotspotWithWidget''_ :: ((C2HSImp.Ptr ()) -> ((C2HSImp.Ptr ()) -> (IO ())))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_hotspot_with_widget_with_offscreen"
  hotspotWithWidgetWithOffscreen''_ :: ((C2HSImp.Ptr ()) -> ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (IO ()))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_free_position"
  freePosition''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_size_range"
  sizeRange''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (C2HSImp.CInt -> (IO ()))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_size_range_with_args"
  sizeRangeWithArgs''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (C2HSImp.CInt -> ((C2HSImp.Ptr ()) -> (IO ())))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_label"
  label''_ :: ((C2HSImp.Ptr ()) -> (IO (C2HSImp.Ptr C2HSImp.CChar)))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_iconlabel"
  iconlabel''_ :: ((C2HSImp.Ptr ()) -> (IO (C2HSImp.Ptr C2HSImp.CChar)))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_label"
  setLabel''_ :: ((C2HSImp.Ptr ()) -> ((C2HSImp.Ptr C2HSImp.CChar) -> (IO ())))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_iconlabel"
  setIconlabel''_ :: ((C2HSImp.Ptr ()) -> ((C2HSImp.Ptr C2HSImp.CChar) -> (IO ())))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_label_with_iconlabel"
  setLabelWithIconlabel''_ :: ((C2HSImp.Ptr ()) -> ((C2HSImp.Ptr C2HSImp.CChar) -> ((C2HSImp.Ptr C2HSImp.CChar) -> (IO ()))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_copy_label"
  copyLabel''_ :: ((C2HSImp.Ptr ()) -> ((C2HSImp.Ptr C2HSImp.CChar) -> (IO ())))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_xclass"
  xclass''_ :: ((C2HSImp.Ptr ()) -> (IO (C2HSImp.Ptr C2HSImp.CChar)))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_xclass"
  setXclass''_ :: ((C2HSImp.Ptr ()) -> ((C2HSImp.Ptr C2HSImp.CChar) -> (IO ())))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_icon"
  icon''_ :: ((C2HSImp.Ptr ()) -> (IO (C2HSImp.Ptr ())))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_icon"
  setIcon''_ :: ((C2HSImp.Ptr ()) -> ((C2HSImp.Ptr ()) -> (IO ())))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_shown"
  shown''_ :: ((C2HSImp.Ptr ()) -> (IO C2HSImp.CInt))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_iconize"
  iconize''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_x_root"
  xRoot''_ :: ((C2HSImp.Ptr ()) -> (IO C2HSImp.CInt))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_y_root"
  yRoot''_ :: ((C2HSImp.Ptr ()) -> (IO C2HSImp.CInt))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_current"
  current''_ :: (IO (C2HSImp.Ptr ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_make_current"
  makeCurrent''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_cursor_with_bg"
  setCursorWithBg''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (C2HSImp.CUInt -> (IO ()))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_cursor_with_fg"
  setCursorWithFg''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (C2HSImp.CUInt -> (IO ()))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_cursor_with_fg_bg"
  setCursorWithFgBg''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (C2HSImp.CUInt -> (C2HSImp.CUInt -> (IO ())))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_cursor"
  setCursor''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (IO ())))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_default_cursor_with_bg"
  setDefaultCursorWithBg''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (C2HSImp.CUInt -> (IO ()))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_default_cursor_with_fg"
  setDefaultCursorWithFg''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (C2HSImp.CUInt -> (IO ()))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_default_cursor_with_fg_bg"
  setDefaultCursorWithFgBg''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (C2HSImp.CUInt -> (C2HSImp.CUInt -> (IO ())))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_set_default_cursor"
  setDefaultCursor''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (IO ())))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_decorated_w"
  decoratedW''_ :: ((C2HSImp.Ptr ()) -> (IO C2HSImp.CInt))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_decorated_h"
  decoratedH''_ :: ((C2HSImp.Ptr ()) -> (IO C2HSImp.CInt))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_draw_box"
  windowDrawBox''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_draw_box_with_tc"
  windowDrawBoxWithTC''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (C2HSImp.CUInt -> (IO ()))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_draw_box_with_txywhc"
  windowDrawBoxWithTXywhC''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CUInt -> (IO ()))))))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_draw_backdrop"
  windowDrawBackdrop''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_draw_focus"
  windowDrawFocus''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_draw_focus_with_txywh"
  windowDrawFocusWithTXywh''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> (C2HSImp.CInt -> (IO ())))))))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Window_wait_for_expose"
  waitForExpose''_ :: ((C2HSImp.Ptr ()) -> (IO ()))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Widget_set_type"
  setType''_ :: ((C2HSImp.Ptr ()) -> (C2HSImp.CUChar -> (IO ())))

foreign import ccall safe "Graphics/UI/FLTK/LowLevel/Window.chs.h Fl_Widget_type"
  type''_ :: ((C2HSImp.Ptr ()) -> (IO C2HSImp.CUChar))