-- 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/CSS.chs" #-}
module Graphics.UI.Gtk.WebKit.DOM.CSS(
supports2,
CSS,
castToCSS,
gTypeCSS,
CSSClass,
toCSS,
) 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 23 "./Graphics/UI/Gtk/WebKit/DOM/CSS.chs" #-}
import Graphics.UI.Gtk.WebKit.DOM.Enums

 
supports2 ::
          (MonadIO m, CSSClass self, GlibString string) =>
            self -> string -> string -> m Bool
supports2 self property value
  = liftIO
      (toBool <$>
         (withUTFString value $
            \ valuePtr ->
              withUTFString property $
                \ propertyPtr ->
                  (\(CSS arg1) arg2 arg3 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_dom_window_css_supports argPtr1 arg2 arg3) (toCSS self)
                    propertyPtr
                valuePtr))

foreign import ccall safe "dist/build/Graphics/UI/Gtk/WebKit/DOM/CSS.h webkit_dom_dom_window_css_supports"
  webkit_dom_dom_window_css_supports :: ((Ptr CSS) -> ((Ptr CChar) -> ((Ptr CChar) -> (IO CInt))))