-- 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/HTMLAppletElement.chs" #-}
module Graphics.UI.Gtk.WebKit.DOM.HTMLAppletElement(
setAlign,
getAlign,
setAlt,
getAlt,
setArchive,
getArchive,
setCode,
getCode,
setCodeBase,
getCodeBase,
setHeight,
getHeight,
setHspace,
getHspace,
setName,
getName,
setObject,
getObject,
setVspace,
getVspace,
setWidth,
getWidth,
HTMLAppletElement,
castToHTMLAppletElement,
gTypeHTMLAppletElement,
HTMLAppletElementClass,
toHTMLAppletElement,
) 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 41 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
import Graphics.UI.Gtk.WebKit.DOM.Enums

 
setAlign ::
         (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
           self -> string -> m ()
setAlign self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLAppletElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_set_align argPtr1 arg2)
{-# LINE 52 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
             (toHTMLAppletElement self)
             valPtr)
 
getAlign ::
         (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
           self -> m string
getAlign self
  = liftIO
      (((\(HTMLAppletElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_get_align argPtr1)
{-# LINE 61 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
          (toHTMLAppletElement self))
         >>=
         readUTFString)
 
setAlt ::
       (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
         self -> string -> m ()
setAlt self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLAppletElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_set_alt argPtr1 arg2)
{-# LINE 73 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
             (toHTMLAppletElement self)
             valPtr)
 
getAlt ::
       (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
         self -> m string
getAlt self
  = liftIO
      (((\(HTMLAppletElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_get_alt argPtr1)
{-# LINE 82 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
          (toHTMLAppletElement self))
         >>=
         readUTFString)
 
setArchive ::
           (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
             self -> string -> m ()
setArchive self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLAppletElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_set_archive argPtr1 arg2)
{-# LINE 94 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
             (toHTMLAppletElement self)
             valPtr)
 
getArchive ::
           (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
             self -> m string
getArchive self
  = liftIO
      (((\(HTMLAppletElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_get_archive argPtr1)
{-# LINE 103 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
          (toHTMLAppletElement self))
         >>=
         readUTFString)
 
setCode ::
        (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
          self -> string -> m ()
setCode self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLAppletElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_set_code argPtr1 arg2)
{-# LINE 115 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
             (toHTMLAppletElement self)
             valPtr)
 
getCode ::
        (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
          self -> m string
getCode self
  = liftIO
      (((\(HTMLAppletElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_get_code argPtr1)
{-# LINE 124 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
          (toHTMLAppletElement self))
         >>=
         readUTFString)
 
setCodeBase ::
            (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
              self -> string -> m ()
setCodeBase self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLAppletElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_set_code_base argPtr1 arg2)
{-# LINE 136 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
             (toHTMLAppletElement self)
             valPtr)
 
getCodeBase ::
            (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
              self -> m string
getCodeBase self
  = liftIO
      (((\(HTMLAppletElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_get_code_base argPtr1)
{-# LINE 145 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
          (toHTMLAppletElement self))
         >>=
         readUTFString)
 
setHeight ::
          (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
            self -> string -> m ()
setHeight self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLAppletElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_set_height argPtr1 arg2)
{-# LINE 157 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
             (toHTMLAppletElement self)
             valPtr)
 
getHeight ::
          (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
            self -> m string
getHeight self
  = liftIO
      (((\(HTMLAppletElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_get_height argPtr1)
{-# LINE 166 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
          (toHTMLAppletElement self))
         >>=
         readUTFString)
 
setHspace ::
          (MonadIO m, HTMLAppletElementClass self) => self -> Int -> m ()
setHspace self val
  = liftIO
      ((\(HTMLAppletElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_set_hspace argPtr1 arg2)
{-# LINE 175 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
         (toHTMLAppletElement self)
         (fromIntegral val))
 
getHspace ::
          (MonadIO m, HTMLAppletElementClass self) => self -> m Int
getHspace self
  = liftIO
      (fromIntegral <$>
         ((\(HTMLAppletElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_get_hspace argPtr1)
{-# LINE 184 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
            (toHTMLAppletElement self)))
 
setName ::
        (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
          self -> string -> m ()
setName self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLAppletElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_set_name argPtr1 arg2)
{-# LINE 194 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
             (toHTMLAppletElement self)
             valPtr)
 
getName ::
        (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
          self -> m string
getName self
  = liftIO
      (((\(HTMLAppletElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_get_name argPtr1)
{-# LINE 203 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
          (toHTMLAppletElement self))
         >>=
         readUTFString)
 
setObject ::
          (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
            self -> string -> m ()
setObject self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLAppletElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_set_object argPtr1 arg2)
{-# LINE 215 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
             (toHTMLAppletElement self)
             valPtr)
 
getObject ::
          (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
            self -> m string
getObject self
  = liftIO
      (((\(HTMLAppletElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_get_object argPtr1)
{-# LINE 224 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
          (toHTMLAppletElement self))
         >>=
         readUTFString)
 
setVspace ::
          (MonadIO m, HTMLAppletElementClass self) => self -> Int -> m ()
setVspace self val
  = liftIO
      ((\(HTMLAppletElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_set_vspace argPtr1 arg2)
{-# LINE 233 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
         (toHTMLAppletElement self)
         (fromIntegral val))
 
getVspace ::
          (MonadIO m, HTMLAppletElementClass self) => self -> m Int
getVspace self
  = liftIO
      (fromIntegral <$>
         ((\(HTMLAppletElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_get_vspace argPtr1)
{-# LINE 242 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
            (toHTMLAppletElement self)))
 
setWidth ::
         (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
           self -> string -> m ()
setWidth self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLAppletElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_set_width argPtr1 arg2)
{-# LINE 252 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
             (toHTMLAppletElement self)
             valPtr)
 
getWidth ::
         (MonadIO m, HTMLAppletElementClass self, GlibString string) =>
           self -> m string
getWidth self
  = liftIO
      (((\(HTMLAppletElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_applet_element_get_width argPtr1)
{-# LINE 261 "./Graphics/UI/Gtk/WebKit/DOM/HTMLAppletElement.chs" #-}
          (toHTMLAppletElement self))
         >>=
         readUTFString)

foreign import ccall safe "webkit_dom_html_applet_element_set_align"
  webkit_dom_html_applet_element_set_align :: ((Ptr HTMLAppletElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_applet_element_get_align"
  webkit_dom_html_applet_element_get_align :: ((Ptr HTMLAppletElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_applet_element_set_alt"
  webkit_dom_html_applet_element_set_alt :: ((Ptr HTMLAppletElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_applet_element_get_alt"
  webkit_dom_html_applet_element_get_alt :: ((Ptr HTMLAppletElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_applet_element_set_archive"
  webkit_dom_html_applet_element_set_archive :: ((Ptr HTMLAppletElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_applet_element_get_archive"
  webkit_dom_html_applet_element_get_archive :: ((Ptr HTMLAppletElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_applet_element_set_code"
  webkit_dom_html_applet_element_set_code :: ((Ptr HTMLAppletElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_applet_element_get_code"
  webkit_dom_html_applet_element_get_code :: ((Ptr HTMLAppletElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_applet_element_set_code_base"
  webkit_dom_html_applet_element_set_code_base :: ((Ptr HTMLAppletElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_applet_element_get_code_base"
  webkit_dom_html_applet_element_get_code_base :: ((Ptr HTMLAppletElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_applet_element_set_height"
  webkit_dom_html_applet_element_set_height :: ((Ptr HTMLAppletElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_applet_element_get_height"
  webkit_dom_html_applet_element_get_height :: ((Ptr HTMLAppletElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_applet_element_set_hspace"
  webkit_dom_html_applet_element_set_hspace :: ((Ptr HTMLAppletElement) -> (CLong -> (IO ())))

foreign import ccall safe "webkit_dom_html_applet_element_get_hspace"
  webkit_dom_html_applet_element_get_hspace :: ((Ptr HTMLAppletElement) -> (IO CLong))

foreign import ccall safe "webkit_dom_html_applet_element_set_name"
  webkit_dom_html_applet_element_set_name :: ((Ptr HTMLAppletElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_applet_element_get_name"
  webkit_dom_html_applet_element_get_name :: ((Ptr HTMLAppletElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_applet_element_set_object"
  webkit_dom_html_applet_element_set_object :: ((Ptr HTMLAppletElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_applet_element_get_object"
  webkit_dom_html_applet_element_get_object :: ((Ptr HTMLAppletElement) -> (IO (Ptr CChar)))

foreign import ccall safe "webkit_dom_html_applet_element_set_vspace"
  webkit_dom_html_applet_element_set_vspace :: ((Ptr HTMLAppletElement) -> (CLong -> (IO ())))

foreign import ccall safe "webkit_dom_html_applet_element_get_vspace"
  webkit_dom_html_applet_element_get_vspace :: ((Ptr HTMLAppletElement) -> (IO CLong))

foreign import ccall safe "webkit_dom_html_applet_element_set_width"
  webkit_dom_html_applet_element_set_width :: ((Ptr HTMLAppletElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_applet_element_get_width"
  webkit_dom_html_applet_element_get_width :: ((Ptr HTMLAppletElement) -> (IO (Ptr CChar)))