module Graphics.UI.Gtk.WebKit.DOM.DOMSecurityPolicy (
domSecurityPolicyAllowsConnectionTo,
domSecurityPolicyAllowsFontFrom, domSecurityPolicyAllowsFormAction,
domSecurityPolicyAllowsFrameFrom, domSecurityPolicyAllowsImageFrom,
domSecurityPolicyAllowsMediaFrom,
domSecurityPolicyAllowsObjectFrom,
domSecurityPolicyAllowsPluginType,
domSecurityPolicyAllowsScriptFrom,
domSecurityPolicyAllowsStyleFrom, domSecurityPolicyAllowsEval,
domSecurityPolicyAllowsInlineScript,
domSecurityPolicyAllowsInlineStyle, domSecurityPolicyGetReportURIs,
DOMSecurityPolicy, DOMSecurityPolicyClass, castToDOMSecurityPolicy,
gTypeDOMSecurityPolicy, toDOMSecurityPolicy
) where
import System.Glib.FFI
import System.Glib.UTFString
import Control.Applicative
import Graphics.UI.Gtk.WebKit.Types
import System.Glib.GError
import Graphics.UI.Gtk.WebKit.DOM.EventM
domSecurityPolicyAllowsConnectionTo ::
(DOMSecurityPolicyClass self, GlibString string) =>
self -> string -> IO Bool
domSecurityPolicyAllowsConnectionTo self url
= toBool <$>
(withUTFString url $
\ urlPtr ->
(\(DOMSecurityPolicy arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_dom_security_policy_allows_connection_to argPtr1 arg2)
(toDOMSecurityPolicy self)
urlPtr)
domSecurityPolicyAllowsFontFrom ::
(DOMSecurityPolicyClass self, GlibString string) =>
self -> string -> IO Bool
domSecurityPolicyAllowsFontFrom self url
= toBool <$>
(withUTFString url $
\ urlPtr ->
(\(DOMSecurityPolicy arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_dom_security_policy_allows_font_from argPtr1 arg2)
(toDOMSecurityPolicy self)
urlPtr)
domSecurityPolicyAllowsFormAction ::
(DOMSecurityPolicyClass self, GlibString string) =>
self -> string -> IO Bool
domSecurityPolicyAllowsFormAction self url
= toBool <$>
(withUTFString url $
\ urlPtr ->
(\(DOMSecurityPolicy arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_dom_security_policy_allows_form_action argPtr1 arg2)
(toDOMSecurityPolicy self)
urlPtr)
domSecurityPolicyAllowsFrameFrom ::
(DOMSecurityPolicyClass self, GlibString string) =>
self -> string -> IO Bool
domSecurityPolicyAllowsFrameFrom self url
= toBool <$>
(withUTFString url $
\ urlPtr ->
(\(DOMSecurityPolicy arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_dom_security_policy_allows_frame_from argPtr1 arg2)
(toDOMSecurityPolicy self)
urlPtr)
domSecurityPolicyAllowsImageFrom ::
(DOMSecurityPolicyClass self, GlibString string) =>
self -> string -> IO Bool
domSecurityPolicyAllowsImageFrom self url
= toBool <$>
(withUTFString url $
\ urlPtr ->
(\(DOMSecurityPolicy arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_dom_security_policy_allows_image_from argPtr1 arg2)
(toDOMSecurityPolicy self)
urlPtr)
domSecurityPolicyAllowsMediaFrom ::
(DOMSecurityPolicyClass self, GlibString string) =>
self -> string -> IO Bool
domSecurityPolicyAllowsMediaFrom self url
= toBool <$>
(withUTFString url $
\ urlPtr ->
(\(DOMSecurityPolicy arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_dom_security_policy_allows_media_from argPtr1 arg2)
(toDOMSecurityPolicy self)
urlPtr)
domSecurityPolicyAllowsObjectFrom ::
(DOMSecurityPolicyClass self, GlibString string) =>
self -> string -> IO Bool
domSecurityPolicyAllowsObjectFrom self url
= toBool <$>
(withUTFString url $
\ urlPtr ->
(\(DOMSecurityPolicy arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_dom_security_policy_allows_object_from argPtr1 arg2)
(toDOMSecurityPolicy self)
urlPtr)
domSecurityPolicyAllowsPluginType ::
(DOMSecurityPolicyClass self, GlibString string) =>
self -> string -> IO Bool
domSecurityPolicyAllowsPluginType self type'
= toBool <$>
(withUTFString type' $
\ typePtr ->
(\(DOMSecurityPolicy arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_dom_security_policy_allows_plugin_type argPtr1 arg2)
(toDOMSecurityPolicy self)
typePtr)
domSecurityPolicyAllowsScriptFrom ::
(DOMSecurityPolicyClass self, GlibString string) =>
self -> string -> IO Bool
domSecurityPolicyAllowsScriptFrom self url
= toBool <$>
(withUTFString url $
\ urlPtr ->
(\(DOMSecurityPolicy arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_dom_security_policy_allows_script_from argPtr1 arg2)
(toDOMSecurityPolicy self)
urlPtr)
domSecurityPolicyAllowsStyleFrom ::
(DOMSecurityPolicyClass self, GlibString string) =>
self -> string -> IO Bool
domSecurityPolicyAllowsStyleFrom self url
= toBool <$>
(withUTFString url $
\ urlPtr ->
(\(DOMSecurityPolicy arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_dom_security_policy_allows_style_from argPtr1 arg2)
(toDOMSecurityPolicy self)
urlPtr)
domSecurityPolicyAllowsEval :: (DOMSecurityPolicyClass self) => self -> IO Bool
domSecurityPolicyAllowsEval self = toBool <$>
((\(DOMSecurityPolicy arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_dom_security_policy_get_allows_eval argPtr1)
(toDOMSecurityPolicy self))
domSecurityPolicyAllowsInlineScript :: (DOMSecurityPolicyClass self) => self -> IO Bool
domSecurityPolicyAllowsInlineScript self = toBool <$>
((\(DOMSecurityPolicy arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_dom_security_policy_get_allows_inline_script argPtr1)
(toDOMSecurityPolicy self))
domSecurityPolicyAllowsInlineStyle :: (DOMSecurityPolicyClass self) => self -> IO Bool
domSecurityPolicyAllowsInlineStyle self = toBool <$>
((\(DOMSecurityPolicy arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_dom_security_policy_get_allows_inline_style argPtr1)
(toDOMSecurityPolicy self))
domSecurityPolicyGetReportURIs ::
(DOMSecurityPolicyClass self) => self -> IO (Maybe DOMStringList)
domSecurityPolicyGetReportURIs self
= maybeNull (makeNewGObject mkDOMStringList)
((\(DOMSecurityPolicy arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_dom_security_policy_get_report_ur_is argPtr1)
(toDOMSecurityPolicy self))
foreign import ccall safe "dist/build/Graphics/UI/Gtk/WebKit/DOM/DOMSecurityPolicy.h webkit_dom_dom_security_policy_allows_connection_to"
webkit_dom_dom_security_policy_allows_connection_to :: ((Ptr DOMSecurityPolicy) -> ((Ptr CChar) -> (IO CInt)))
foreign import ccall safe "dist/build/Graphics/UI/Gtk/WebKit/DOM/DOMSecurityPolicy.h webkit_dom_dom_security_policy_allows_font_from"
webkit_dom_dom_security_policy_allows_font_from :: ((Ptr DOMSecurityPolicy) -> ((Ptr CChar) -> (IO CInt)))
foreign import ccall safe "dist/build/Graphics/UI/Gtk/WebKit/DOM/DOMSecurityPolicy.h webkit_dom_dom_security_policy_allows_form_action"
webkit_dom_dom_security_policy_allows_form_action :: ((Ptr DOMSecurityPolicy) -> ((Ptr CChar) -> (IO CInt)))
foreign import ccall safe "dist/build/Graphics/UI/Gtk/WebKit/DOM/DOMSecurityPolicy.h webkit_dom_dom_security_policy_allows_frame_from"
webkit_dom_dom_security_policy_allows_frame_from :: ((Ptr DOMSecurityPolicy) -> ((Ptr CChar) -> (IO CInt)))
foreign import ccall safe "dist/build/Graphics/UI/Gtk/WebKit/DOM/DOMSecurityPolicy.h webkit_dom_dom_security_policy_allows_image_from"
webkit_dom_dom_security_policy_allows_image_from :: ((Ptr DOMSecurityPolicy) -> ((Ptr CChar) -> (IO CInt)))
foreign import ccall safe "dist/build/Graphics/UI/Gtk/WebKit/DOM/DOMSecurityPolicy.h webkit_dom_dom_security_policy_allows_media_from"
webkit_dom_dom_security_policy_allows_media_from :: ((Ptr DOMSecurityPolicy) -> ((Ptr CChar) -> (IO CInt)))
foreign import ccall safe "dist/build/Graphics/UI/Gtk/WebKit/DOM/DOMSecurityPolicy.h webkit_dom_dom_security_policy_allows_object_from"
webkit_dom_dom_security_policy_allows_object_from :: ((Ptr DOMSecurityPolicy) -> ((Ptr CChar) -> (IO CInt)))
foreign import ccall safe "dist/build/Graphics/UI/Gtk/WebKit/DOM/DOMSecurityPolicy.h webkit_dom_dom_security_policy_allows_plugin_type"
webkit_dom_dom_security_policy_allows_plugin_type :: ((Ptr DOMSecurityPolicy) -> ((Ptr CChar) -> (IO CInt)))
foreign import ccall safe "dist/build/Graphics/UI/Gtk/WebKit/DOM/DOMSecurityPolicy.h webkit_dom_dom_security_policy_allows_script_from"
webkit_dom_dom_security_policy_allows_script_from :: ((Ptr DOMSecurityPolicy) -> ((Ptr CChar) -> (IO CInt)))
foreign import ccall safe "dist/build/Graphics/UI/Gtk/WebKit/DOM/DOMSecurityPolicy.h webkit_dom_dom_security_policy_allows_style_from"
webkit_dom_dom_security_policy_allows_style_from :: ((Ptr DOMSecurityPolicy) -> ((Ptr CChar) -> (IO CInt)))
foreign import ccall safe "dist/build/Graphics/UI/Gtk/WebKit/DOM/DOMSecurityPolicy.h webkit_dom_dom_security_policy_get_allows_eval"
webkit_dom_dom_security_policy_get_allows_eval :: ((Ptr DOMSecurityPolicy) -> (IO CInt))
foreign import ccall safe "dist/build/Graphics/UI/Gtk/WebKit/DOM/DOMSecurityPolicy.h webkit_dom_dom_security_policy_get_allows_inline_script"
webkit_dom_dom_security_policy_get_allows_inline_script :: ((Ptr DOMSecurityPolicy) -> (IO CInt))
foreign import ccall safe "dist/build/Graphics/UI/Gtk/WebKit/DOM/DOMSecurityPolicy.h webkit_dom_dom_security_policy_get_allows_inline_style"
webkit_dom_dom_security_policy_get_allows_inline_style :: ((Ptr DOMSecurityPolicy) -> (IO CInt))
foreign import ccall safe "dist/build/Graphics/UI/Gtk/WebKit/DOM/DOMSecurityPolicy.h webkit_dom_dom_security_policy_get_report_ur_is"
webkit_dom_dom_security_policy_get_report_ur_is :: ((Ptr DOMSecurityPolicy) -> (IO (Ptr DOMStringList)))