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


{-# LINE 1 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
module Graphics.UI.Gtk.WebKit.DOM.HTMLTableRowElement
       (htmlTableRowElementInsertCell, htmlTableRowElementDeleteCell,
        htmlTableRowElementGetRowIndex,
        htmlTableRowElementGetSectionRowIndex, htmlTableRowElementGetCells,
        htmlTableRowElementSetAlign, htmlTableRowElementGetAlign,
        htmlTableRowElementSetBgColor, htmlTableRowElementGetBgColor,
        htmlTableRowElementSetCh, htmlTableRowElementGetCh,
        htmlTableRowElementSetChOff, htmlTableRowElementGetChOff,
        htmlTableRowElementSetVAlign, htmlTableRowElementGetVAlign)
       where
import System.Glib.FFI
import System.Glib.UTFString
import Control.Applicative
import Graphics.UI.Gtk.WebKit.Types
{-# LINE 14 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
import System.Glib.GError
import Graphics.UI.Gtk.WebKit.DOM.EventM
 
htmlTableRowElementInsertCell ::
                              (HTMLTableRowElementClass self) =>
                                self -> Int -> IO (Maybe HTMLElement)
htmlTableRowElementInsertCell self index
  = maybeNull (makeNewGObject mkHTMLElement)
      (propagateGError $
         \ errorPtr_ ->
           (\(HTMLTableRowElement arg1) arg2 arg3 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_insert_cell argPtr1 arg2 arg3)
{-# LINE 25 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
             (toHTMLTableRowElement self)
             (fromIntegral index)
             errorPtr_)
 
htmlTableRowElementDeleteCell ::
                              (HTMLTableRowElementClass self) => self -> Int -> IO ()
htmlTableRowElementDeleteCell self index
  = propagateGError $
      \ errorPtr_ ->
        (\(HTMLTableRowElement arg1) arg2 arg3 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_delete_cell argPtr1 arg2 arg3)
{-# LINE 35 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
          (toHTMLTableRowElement self)
          (fromIntegral index)
          errorPtr_
 
htmlTableRowElementGetRowIndex ::
                               (HTMLTableRowElementClass self) => self -> IO Int
htmlTableRowElementGetRowIndex self
  = fromIntegral <$>
      ((\(HTMLTableRowElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_get_row_index argPtr1)
{-# LINE 44 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
         (toHTMLTableRowElement self))
 
htmlTableRowElementGetSectionRowIndex ::
                                      (HTMLTableRowElementClass self) => self -> IO Int
htmlTableRowElementGetSectionRowIndex self
  = fromIntegral <$>
      ((\(HTMLTableRowElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_get_section_row_index argPtr1)
{-# LINE 51 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
         (toHTMLTableRowElement self))
 
htmlTableRowElementGetCells ::
                            (HTMLTableRowElementClass self) =>
                              self -> IO (Maybe HTMLCollection)
htmlTableRowElementGetCells self
  = maybeNull (makeNewGObject mkHTMLCollection)
      ((\(HTMLTableRowElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_get_cells argPtr1)
{-# LINE 59 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
         (toHTMLTableRowElement self))
 
htmlTableRowElementSetAlign ::
                            (HTMLTableRowElementClass self) => self -> String -> IO ()
htmlTableRowElementSetAlign self val
  = withUTFString val $
      \ valPtr ->
        (\(HTMLTableRowElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_set_align argPtr1 arg2)
{-# LINE 67 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
          (toHTMLTableRowElement self)
          valPtr
 
htmlTableRowElementGetAlign ::
                            (HTMLTableRowElementClass self) => self -> IO String
htmlTableRowElementGetAlign self
  = ((\(HTMLTableRowElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_get_align argPtr1)
{-# LINE 74 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
       (toHTMLTableRowElement self))
      >>=
      readUTFString
 
htmlTableRowElementSetBgColor ::
                              (HTMLTableRowElementClass self) => self -> String -> IO ()
htmlTableRowElementSetBgColor self val
  = withUTFString val $
      \ valPtr ->
        (\(HTMLTableRowElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_set_bg_color argPtr1 arg2)
{-# LINE 84 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
          (toHTMLTableRowElement self)
          valPtr
 
htmlTableRowElementGetBgColor ::
                              (HTMLTableRowElementClass self) => self -> IO String
htmlTableRowElementGetBgColor self
  = ((\(HTMLTableRowElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_get_bg_color argPtr1)
{-# LINE 91 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
       (toHTMLTableRowElement self))
      >>=
      readUTFString
 
htmlTableRowElementSetCh ::
                         (HTMLTableRowElementClass self) => self -> String -> IO ()
htmlTableRowElementSetCh self val
  = withUTFString val $
      \ valPtr ->
        (\(HTMLTableRowElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_set_ch argPtr1 arg2)
{-# LINE 101 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
          (toHTMLTableRowElement self)
          valPtr
 
htmlTableRowElementGetCh ::
                         (HTMLTableRowElementClass self) => self -> IO String
htmlTableRowElementGetCh self
  = ((\(HTMLTableRowElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_get_ch argPtr1)
{-# LINE 108 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
       (toHTMLTableRowElement self))
      >>=
      readUTFString
 
htmlTableRowElementSetChOff ::
                            (HTMLTableRowElementClass self) => self -> String -> IO ()
htmlTableRowElementSetChOff self val
  = withUTFString val $
      \ valPtr ->
        (\(HTMLTableRowElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_set_ch_off argPtr1 arg2)
{-# LINE 118 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
          (toHTMLTableRowElement self)
          valPtr
 
htmlTableRowElementGetChOff ::
                            (HTMLTableRowElementClass self) => self -> IO String
htmlTableRowElementGetChOff self
  = ((\(HTMLTableRowElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_get_ch_off argPtr1)
{-# LINE 125 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
       (toHTMLTableRowElement self))
      >>=
      readUTFString
 
htmlTableRowElementSetVAlign ::
                             (HTMLTableRowElementClass self) => self -> String -> IO ()
htmlTableRowElementSetVAlign self val
  = withUTFString val $
      \ valPtr ->
        (\(HTMLTableRowElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_set_v_align argPtr1 arg2)
{-# LINE 135 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
          (toHTMLTableRowElement self)
          valPtr
 
htmlTableRowElementGetVAlign ::
                             (HTMLTableRowElementClass self) => self -> IO String
htmlTableRowElementGetVAlign self
  = ((\(HTMLTableRowElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_get_v_align argPtr1)
{-# LINE 142 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
       (toHTMLTableRowElement self))
      >>=
      readUTFString

foreign import ccall safe "webkit_dom_html_table_row_element_insert_cell"
  webkit_dom_html_table_row_element_insert_cell :: ((Ptr HTMLTableRowElement) -> (CLong -> ((Ptr (Ptr ())) -> (IO (Ptr HTMLElement)))))

foreign import ccall safe "webkit_dom_html_table_row_element_delete_cell"
  webkit_dom_html_table_row_element_delete_cell :: ((Ptr HTMLTableRowElement) -> (CLong -> ((Ptr (Ptr ())) -> (IO ()))))

foreign import ccall safe "webkit_dom_html_table_row_element_get_row_index"
  webkit_dom_html_table_row_element_get_row_index :: ((Ptr HTMLTableRowElement) -> (IO CLong))

foreign import ccall safe "webkit_dom_html_table_row_element_get_section_row_index"
  webkit_dom_html_table_row_element_get_section_row_index :: ((Ptr HTMLTableRowElement) -> (IO CLong))

foreign import ccall safe "webkit_dom_html_table_row_element_get_cells"
  webkit_dom_html_table_row_element_get_cells :: ((Ptr HTMLTableRowElement) -> (IO (Ptr HTMLCollection)))

foreign import ccall safe "webkit_dom_html_table_row_element_set_align"
  webkit_dom_html_table_row_element_set_align :: ((Ptr HTMLTableRowElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_table_row_element_get_align"
  webkit_dom_html_table_row_element_get_align :: ((Ptr HTMLTableRowElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_table_row_element_set_bg_color"
  webkit_dom_html_table_row_element_set_bg_color :: ((Ptr HTMLTableRowElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_table_row_element_get_bg_color"
  webkit_dom_html_table_row_element_get_bg_color :: ((Ptr HTMLTableRowElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_table_row_element_set_ch"
  webkit_dom_html_table_row_element_set_ch :: ((Ptr HTMLTableRowElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_table_row_element_get_ch"
  webkit_dom_html_table_row_element_get_ch :: ((Ptr HTMLTableRowElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_table_row_element_set_ch_off"
  webkit_dom_html_table_row_element_set_ch_off :: ((Ptr HTMLTableRowElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_table_row_element_get_ch_off"
  webkit_dom_html_table_row_element_get_ch_off :: ((Ptr HTMLTableRowElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_table_row_element_set_v_align"
  webkit_dom_html_table_row_element_set_v_align :: ((Ptr HTMLTableRowElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_table_row_element_get_v_align"
  webkit_dom_html_table_row_element_get_v_align :: ((Ptr HTMLTableRowElement) -> (IO (Ptr CChar)))