-- 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/HTMLTableSectionElement.chs" #-}
module Graphics.UI.Gtk.WebKit.DOM.HTMLTableSectionElement(
insertRow,
deleteRow,
setAlign,
getAlign,
setCh,
getCh,
setChOff,
getChOff,
setVAlign,
getVAlign,
getRows,
HTMLTableSectionElement,
castToHTMLTableSectionElement,
gTypeHTMLTableSectionElement,
HTMLTableSectionElementClass,
toHTMLTableSectionElement,
) 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 30 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableSectionElement.chs" #-}
import Graphics.UI.Gtk.WebKit.DOM.Enums

 
insertRow ::
          (MonadIO m, HTMLTableSectionElementClass self) =>
            self -> Int -> m (Maybe HTMLElement)
insertRow self index
  = liftIO
      (maybeNull (makeNewGObject mkHTMLElement)
         (propagateGError $
            \ errorPtr_ ->
              (\(HTMLTableSectionElement arg1) arg2 arg3 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_section_element_insert_row argPtr1 arg2 arg3)
{-# LINE 42 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableSectionElement.chs" #-}
                (toHTMLTableSectionElement self)
                (fromIntegral index)
                errorPtr_))
 
deleteRow ::
          (MonadIO m, HTMLTableSectionElementClass self) =>
            self -> Int -> m ()
deleteRow self index
  = liftIO
      (propagateGError $
         \ errorPtr_ ->
           (\(HTMLTableSectionElement arg1) arg2 arg3 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_section_element_delete_row argPtr1 arg2 arg3)
{-# LINE 54 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableSectionElement.chs" #-}
             (toHTMLTableSectionElement self)
             (fromIntegral index)
             errorPtr_)
 
setAlign ::
         (MonadIO m, HTMLTableSectionElementClass self,
          GlibString string) =>
           self -> string -> m ()
setAlign self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLTableSectionElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_section_element_set_align argPtr1 arg2)
{-# LINE 67 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableSectionElement.chs" #-}
             (toHTMLTableSectionElement self)
             valPtr)
 
getAlign ::
         (MonadIO m, HTMLTableSectionElementClass self,
          GlibString string) =>
           self -> m string
getAlign self
  = liftIO
      (((\(HTMLTableSectionElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_section_element_get_align argPtr1)
{-# LINE 77 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableSectionElement.chs" #-}
          (toHTMLTableSectionElement self))
         >>=
         readUTFString)
 
setCh ::
      (MonadIO m, HTMLTableSectionElementClass self,
       GlibString string) =>
        self -> string -> m ()
setCh self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLTableSectionElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_section_element_set_ch argPtr1 arg2)
{-# LINE 90 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableSectionElement.chs" #-}
             (toHTMLTableSectionElement self)
             valPtr)
 
getCh ::
      (MonadIO m, HTMLTableSectionElementClass self,
       GlibString string) =>
        self -> m string
getCh self
  = liftIO
      (((\(HTMLTableSectionElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_section_element_get_ch argPtr1)
{-# LINE 100 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableSectionElement.chs" #-}
          (toHTMLTableSectionElement self))
         >>=
         readUTFString)
 
setChOff ::
         (MonadIO m, HTMLTableSectionElementClass self,
          GlibString string) =>
           self -> string -> m ()
setChOff self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLTableSectionElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_section_element_set_ch_off argPtr1 arg2)
{-# LINE 113 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableSectionElement.chs" #-}
             (toHTMLTableSectionElement self)
             valPtr)
 
getChOff ::
         (MonadIO m, HTMLTableSectionElementClass self,
          GlibString string) =>
           self -> m string
getChOff self
  = liftIO
      (((\(HTMLTableSectionElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_section_element_get_ch_off argPtr1)
{-# LINE 123 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableSectionElement.chs" #-}
          (toHTMLTableSectionElement self))
         >>=
         readUTFString)
 
setVAlign ::
          (MonadIO m, HTMLTableSectionElementClass self,
           GlibString string) =>
            self -> string -> m ()
setVAlign self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLTableSectionElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_section_element_set_v_align argPtr1 arg2)
{-# LINE 136 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableSectionElement.chs" #-}
             (toHTMLTableSectionElement self)
             valPtr)
 
getVAlign ::
          (MonadIO m, HTMLTableSectionElementClass self,
           GlibString string) =>
            self -> m string
getVAlign self
  = liftIO
      (((\(HTMLTableSectionElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_section_element_get_v_align argPtr1)
{-# LINE 146 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableSectionElement.chs" #-}
          (toHTMLTableSectionElement self))
         >>=
         readUTFString)
 
getRows ::
        (MonadIO m, HTMLTableSectionElementClass self) =>
          self -> m (Maybe HTMLCollection)
getRows self
  = liftIO
      (maybeNull (makeNewGObject mkHTMLCollection)
         ((\(HTMLTableSectionElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_section_element_get_rows argPtr1)
{-# LINE 157 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableSectionElement.chs" #-}
            (toHTMLTableSectionElement self)))

foreign import ccall safe "webkit_dom_html_table_section_element_insert_row"
  webkit_dom_html_table_section_element_insert_row :: ((Ptr HTMLTableSectionElement) -> (CLong -> ((Ptr (Ptr ())) -> (IO (Ptr HTMLElement)))))

foreign import ccall safe "webkit_dom_html_table_section_element_delete_row"
  webkit_dom_html_table_section_element_delete_row :: ((Ptr HTMLTableSectionElement) -> (CLong -> ((Ptr (Ptr ())) -> (IO ()))))

foreign import ccall safe "webkit_dom_html_table_section_element_set_align"
  webkit_dom_html_table_section_element_set_align :: ((Ptr HTMLTableSectionElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_table_section_element_get_align"
  webkit_dom_html_table_section_element_get_align :: ((Ptr HTMLTableSectionElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_table_section_element_set_ch"
  webkit_dom_html_table_section_element_set_ch :: ((Ptr HTMLTableSectionElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_table_section_element_get_ch"
  webkit_dom_html_table_section_element_get_ch :: ((Ptr HTMLTableSectionElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_table_section_element_set_ch_off"
  webkit_dom_html_table_section_element_set_ch_off :: ((Ptr HTMLTableSectionElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_table_section_element_get_ch_off"
  webkit_dom_html_table_section_element_get_ch_off :: ((Ptr HTMLTableSectionElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_table_section_element_set_v_align"
  webkit_dom_html_table_section_element_set_v_align :: ((Ptr HTMLTableSectionElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_table_section_element_get_v_align"
  webkit_dom_html_table_section_element_get_v_align :: ((Ptr HTMLTableSectionElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_table_section_element_get_rows"
  webkit_dom_html_table_section_element_get_rows :: ((Ptr HTMLTableSectionElement) -> (IO (Ptr HTMLCollection)))