-- 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/HTMLTableRowElement.chs" #-}
module Graphics.UI.Gtk.WebKit.DOM.HTMLTableRowElement(
insertCell,
deleteCell,
getRowIndex,
getSectionRowIndex,
getCells,
setAlign,
getAlign,
setBgColor,
getBgColor,
setCh,
getCh,
setChOff,
getChOff,
setVAlign,
getVAlign,
HTMLTableRowElement,
castToHTMLTableRowElement,
gTypeHTMLTableRowElement,
HTMLTableRowElementClass,
toHTMLTableRowElement,
) 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 34 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
import Graphics.UI.Gtk.WebKit.DOM.Enums

 
insertCell ::
           (MonadIO m, HTMLTableRowElementClass self) =>
             self -> Int -> m (Maybe HTMLElement)
insertCell self index
  = liftIO
      (maybeNull (makeNewGObject mkHTMLElement)
         (propagateGError $
            \ errorPtr_ ->
              (\(HTMLTableRowElement arg1) arg2 arg3 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_insert_cell argPtr1 arg2 arg3)
{-# LINE 46 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
                (toHTMLTableRowElement self)
                (fromIntegral index)
                errorPtr_))
 
deleteCell ::
           (MonadIO m, HTMLTableRowElementClass self) => self -> Int -> m ()
deleteCell self index
  = liftIO
      (propagateGError $
         \ errorPtr_ ->
           (\(HTMLTableRowElement arg1) arg2 arg3 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_delete_cell argPtr1 arg2 arg3)
{-# LINE 57 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
             (toHTMLTableRowElement self)
             (fromIntegral index)
             errorPtr_)
 
getRowIndex ::
            (MonadIO m, HTMLTableRowElementClass self) => self -> m Int
getRowIndex self
  = liftIO
      (fromIntegral <$>
         ((\(HTMLTableRowElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_get_row_index argPtr1)
{-# LINE 67 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
            (toHTMLTableRowElement self)))
 
getSectionRowIndex ::
                   (MonadIO m, HTMLTableRowElementClass self) => self -> m Int
getSectionRowIndex self
  = liftIO
      (fromIntegral <$>
         ((\(HTMLTableRowElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_get_section_row_index argPtr1)
{-# LINE 75 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
            (toHTMLTableRowElement self)))
 
getCells ::
         (MonadIO m, HTMLTableRowElementClass self) =>
           self -> m (Maybe HTMLCollection)
getCells self
  = liftIO
      (maybeNull (makeNewGObject mkHTMLCollection)
         ((\(HTMLTableRowElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_get_cells argPtr1)
{-# LINE 84 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
            (toHTMLTableRowElement self)))
 
setAlign ::
         (MonadIO m, HTMLTableRowElementClass self, GlibString string) =>
           self -> string -> m ()
setAlign self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLTableRowElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_set_align argPtr1 arg2)
{-# LINE 94 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
             (toHTMLTableRowElement self)
             valPtr)
 
getAlign ::
         (MonadIO m, HTMLTableRowElementClass self, GlibString string) =>
           self -> m string
getAlign self
  = liftIO
      (((\(HTMLTableRowElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_get_align argPtr1)
{-# LINE 103 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
          (toHTMLTableRowElement self))
         >>=
         readUTFString)
 
setBgColor ::
           (MonadIO m, HTMLTableRowElementClass self, GlibString string) =>
             self -> string -> m ()
setBgColor self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLTableRowElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_set_bg_color argPtr1 arg2)
{-# LINE 115 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
             (toHTMLTableRowElement self)
             valPtr)
 
getBgColor ::
           (MonadIO m, HTMLTableRowElementClass self, GlibString string) =>
             self -> m string
getBgColor self
  = liftIO
      (((\(HTMLTableRowElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_get_bg_color argPtr1)
{-# LINE 124 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
          (toHTMLTableRowElement self))
         >>=
         readUTFString)
 
setCh ::
      (MonadIO m, HTMLTableRowElementClass self, GlibString string) =>
        self -> string -> m ()
setCh self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLTableRowElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_set_ch argPtr1 arg2)
{-# LINE 136 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
             (toHTMLTableRowElement self)
             valPtr)
 
getCh ::
      (MonadIO m, HTMLTableRowElementClass self, GlibString string) =>
        self -> m string
getCh self
  = liftIO
      (((\(HTMLTableRowElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_get_ch argPtr1)
{-# LINE 145 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
          (toHTMLTableRowElement self))
         >>=
         readUTFString)
 
setChOff ::
         (MonadIO m, HTMLTableRowElementClass self, GlibString string) =>
           self -> string -> m ()
setChOff self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLTableRowElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_set_ch_off argPtr1 arg2)
{-# LINE 157 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
             (toHTMLTableRowElement self)
             valPtr)
 
getChOff ::
         (MonadIO m, HTMLTableRowElementClass self, GlibString string) =>
           self -> m string
getChOff self
  = liftIO
      (((\(HTMLTableRowElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_get_ch_off argPtr1)
{-# LINE 166 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
          (toHTMLTableRowElement self))
         >>=
         readUTFString)
 
setVAlign ::
          (MonadIO m, HTMLTableRowElementClass self, GlibString string) =>
            self -> string -> m ()
setVAlign self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLTableRowElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_set_v_align argPtr1 arg2)
{-# LINE 178 "./Graphics/UI/Gtk/WebKit/DOM/HTMLTableRowElement.chs" #-}
             (toHTMLTableRowElement self)
             valPtr)
 
getVAlign ::
          (MonadIO m, HTMLTableRowElementClass self, GlibString string) =>
            self -> m string
getVAlign self
  = liftIO
      (((\(HTMLTableRowElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_table_row_element_get_v_align argPtr1)
{-# LINE 187 "./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)))