-- 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/HTMLQuoteElement.chs" #-}
module Graphics.UI.Gtk.WebKit.DOM.HTMLQuoteElement(
setCite,
getCite,
HTMLQuoteElement,
castToHTMLQuoteElement,
gTypeHTMLQuoteElement,
HTMLQuoteElementClass,
toHTMLQuoteElement,
) 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 21 "./Graphics/UI/Gtk/WebKit/DOM/HTMLQuoteElement.chs" #-}
import Graphics.UI.Gtk.WebKit.DOM.Enums

 
setCite ::
        (MonadIO m, HTMLQuoteElementClass self, GlibString string) =>
          self -> string -> m ()
setCite self val
  = liftIO
      (withUTFString val $
         \ valPtr ->
           (\(HTMLQuoteElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_quote_element_set_cite argPtr1 arg2)
{-# LINE 32 "./Graphics/UI/Gtk/WebKit/DOM/HTMLQuoteElement.chs" #-}
             (toHTMLQuoteElement self)
             valPtr)
 
getCite ::
        (MonadIO m, HTMLQuoteElementClass self, GlibString string) =>
          self -> m string
getCite self
  = liftIO
      (((\(HTMLQuoteElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_html_quote_element_get_cite argPtr1)
{-# LINE 41 "./Graphics/UI/Gtk/WebKit/DOM/HTMLQuoteElement.chs" #-}
          (toHTMLQuoteElement self))
         >>=
         readUTFString)

foreign import ccall safe "webkit_dom_html_quote_element_set_cite"
  webkit_dom_html_quote_element_set_cite :: ((Ptr HTMLQuoteElement) -> ((Ptr CChar) -> (IO ())))

foreign import ccall safe "webkit_dom_html_quote_element_get_cite"
  webkit_dom_html_quote_element_get_cite :: ((Ptr HTMLQuoteElement) -> (IO (Ptr CChar)))