-- GENERATED by C->Haskell Compiler, version 0.13.13 (gtk2hs branch) "Bin IO", 27 May 2012 (Haskell)
-- Edit the ORIGNAL .chs file instead!


{-# LINE 1 "./Graphics/UI/Gtk/WebKit/DOM/Screen.chs" #-}
module Graphics.UI.Gtk.WebKit.DOM.Screen(
getHeight,
getWidth,
getColorDepth,
getPixelDepth,
getAvailLeft,
getAvailTop,
getAvailHeight,
getAvailWidth,
Screen,
castToScreen,
gTypeScreen,
ScreenClass,
toScreen,
) where
import Prelude hiding (drop, error, print)
import Data.Typeable (Typeable)
import Foreign.Marshal (maybePeek, maybeWith)
import System.Glib.FFI (maybeNull, withForeignPtr, nullForeignPtr, Ptr, nullPtr, castPtr, Word, Int64, Word64, CChar(..), CInt(..), CUInt(..), CLong(..), CULong(..), CLLong(..), CULLong(..), CShort(..), CUShort(..), CFloat(..), CDouble(..), toBool, fromBool)
import System.Glib.UTFString (GlibString(..), readUTFString)
import Control.Applicative ((<$>))
import Control.Monad (void)
import Control.Monad.IO.Class (MonadIO(..))
import System.Glib.GError
import Graphics.UI.Gtk.WebKit.DOM.EventTargetClosures
import Graphics.UI.Gtk.WebKit.DOM.EventM
import Graphics.UI.Gtk.WebKit.Types
{-# LINE 27 "./Graphics/UI/Gtk/WebKit/DOM/Screen.chs" #-}
import Graphics.UI.Gtk.WebKit.DOM.Enums

 
getHeight :: (MonadIO m, ScreenClass self) => self -> m Word
getHeight self
  = liftIO
      (fromIntegral <$>
         ((\(Screen arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_screen_get_height argPtr1) (toScreen self)))
 
getWidth :: (MonadIO m, ScreenClass self) => self -> m Word
getWidth self
  = liftIO
      (fromIntegral <$>
         ((\(Screen arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_screen_get_width argPtr1) (toScreen self)))
 
getColorDepth :: (MonadIO m, ScreenClass self) => self -> m Word
getColorDepth self
  = liftIO
      (fromIntegral <$>
         ((\(Screen arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_screen_get_color_depth argPtr1) (toScreen self)))
 
getPixelDepth :: (MonadIO m, ScreenClass self) => self -> m Word
getPixelDepth self
  = liftIO
      (fromIntegral <$>
         ((\(Screen arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_screen_get_pixel_depth argPtr1) (toScreen self)))
 
getAvailLeft :: (MonadIO m, ScreenClass self) => self -> m Int
getAvailLeft self
  = liftIO
      (fromIntegral <$>
         ((\(Screen arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_screen_get_avail_left argPtr1) (toScreen self)))
 
getAvailTop :: (MonadIO m, ScreenClass self) => self -> m Int
getAvailTop self
  = liftIO
      (fromIntegral <$>
         ((\(Screen arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_screen_get_avail_top argPtr1) (toScreen self)))
 
getAvailHeight :: (MonadIO m, ScreenClass self) => self -> m Word
getAvailHeight self
  = liftIO
      (fromIntegral <$>
         ((\(Screen arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_screen_get_avail_height argPtr1) (toScreen self)))
 
getAvailWidth :: (MonadIO m, ScreenClass self) => self -> m Word
getAvailWidth self
  = liftIO
      (fromIntegral <$>
         ((\(Screen arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_screen_get_avail_width argPtr1) (toScreen self)))

foreign import ccall safe "webkit_dom_screen_get_height"
  webkit_dom_screen_get_height :: ((Ptr Screen) -> (IO CULong))

foreign import ccall safe "webkit_dom_screen_get_width"
  webkit_dom_screen_get_width :: ((Ptr Screen) -> (IO CULong))

foreign import ccall safe "webkit_dom_screen_get_color_depth"
  webkit_dom_screen_get_color_depth :: ((Ptr Screen) -> (IO CULong))

foreign import ccall safe "webkit_dom_screen_get_pixel_depth"
  webkit_dom_screen_get_pixel_depth :: ((Ptr Screen) -> (IO CULong))

foreign import ccall safe "webkit_dom_screen_get_avail_left"
  webkit_dom_screen_get_avail_left :: ((Ptr Screen) -> (IO CLong))

foreign import ccall safe "webkit_dom_screen_get_avail_top"
  webkit_dom_screen_get_avail_top :: ((Ptr Screen) -> (IO CLong))

foreign import ccall safe "webkit_dom_screen_get_avail_height"
  webkit_dom_screen_get_avail_height :: ((Ptr Screen) -> (IO CULong))

foreign import ccall safe "webkit_dom_screen_get_avail_width"
  webkit_dom_screen_get_avail_width :: ((Ptr Screen) -> (IO CULong))