-- 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/HTMLLabelElement.chs" #-}
module Graphics.UI.Gtk.WebKit.DOM.HTMLLabelElement(
getForm,
setHtmlFor,
getHtmlFor,
getControl,
HTMLLabelElement,
castToHTMLLabelElement,
gTypeHTMLLabelElement,
HTMLLabelElementClass,
toHTMLLabelElement,
) 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/HTMLLabelElement.chs" #-}
import Graphics.UI.Gtk.WebKit.DOM.Enums

 
getForm ::
        (MonadIO m, HTMLLabelElementClass self) =>
          self -> m (Maybe HTMLFormElement)
getForm self
  = liftIO
      (maybeNull (makeNewGObject mkHTMLFormElement)
         ((\(HTMLLabelElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_label_element_get_form argPtr1)
{-# LINE 33 "./Graphics/UI/Gtk/WebKit/DOM/HTMLLabelElement.chs" #-}
            (toHTMLLabelElement self)))
 
setHtmlFor ::
           (MonadIO m, HTMLLabelElementClass self, GlibString string) =>
             self -> string -> m ()
setHtmlFor self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLLabelElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_label_element_set_html_for argPtr1 arg2)
{-# LINE 43 "./Graphics/UI/Gtk/WebKit/DOM/HTMLLabelElement.chs" #-}
             (toHTMLLabelElement self)
             valPtr)
 
getHtmlFor ::
           (MonadIO m, HTMLLabelElementClass self, GlibString string) =>
             self -> m string
getHtmlFor self
  = liftIO
      (((\(HTMLLabelElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_label_element_get_html_for argPtr1)
{-# LINE 52 "./Graphics/UI/Gtk/WebKit/DOM/HTMLLabelElement.chs" #-}
          (toHTMLLabelElement self))
         >>=
         readUTFString)
 
getControl ::
           (MonadIO m, HTMLLabelElementClass self) =>
             self -> m (Maybe HTMLElement)
getControl self
  = liftIO
      (maybeNull (makeNewGObject mkHTMLElement)
         ((\(HTMLLabelElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_label_element_get_control argPtr1)
{-# LINE 63 "./Graphics/UI/Gtk/WebKit/DOM/HTMLLabelElement.chs" #-}
            (toHTMLLabelElement self)))

foreign import ccall safe "webkit_dom_html_label_element_get_form"
  webkit_dom_html_label_element_get_form :: ((Ptr HTMLLabelElement) -> (IO (Ptr HTMLFormElement)))

foreign import ccall safe "webkit_dom_html_label_element_set_html_for"
  webkit_dom_html_label_element_set_html_for :: ((Ptr HTMLLabelElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_label_element_get_html_for"
  webkit_dom_html_label_element_get_html_for :: ((Ptr HTMLLabelElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_label_element_get_control"
  webkit_dom_html_label_element_get_control :: ((Ptr HTMLLabelElement) -> (IO (Ptr HTMLElement)))