{- |
Copyright  : Will Thompson, Iñaki García Etxebarria and Jonas Platte
License    : LGPL-2.1
Maintainer : Iñaki García Etxebarria (garetxe@gmail.com)
-}

module GI.WebKit2.Objects.Settings
    ( 

-- * Exported types
    Settings(..)                            ,
    SettingsK                               ,
    toSettings                              ,
    noSettings                              ,


 -- * Methods
-- ** settingsGetAllowFileAccessFromFileUrls
    settingsGetAllowFileAccessFromFileUrls  ,


-- ** settingsGetAllowModalDialogs
    settingsGetAllowModalDialogs            ,


-- ** settingsGetAutoLoadImages
    settingsGetAutoLoadImages               ,


-- ** settingsGetCursiveFontFamily
    settingsGetCursiveFontFamily            ,


-- ** settingsGetDefaultCharset
    settingsGetDefaultCharset               ,


-- ** settingsGetDefaultFontFamily
    settingsGetDefaultFontFamily            ,


-- ** settingsGetDefaultFontSize
    settingsGetDefaultFontSize              ,


-- ** settingsGetDefaultMonospaceFontSize
    settingsGetDefaultMonospaceFontSize     ,


-- ** settingsGetDrawCompositingIndicators
    settingsGetDrawCompositingIndicators    ,


-- ** settingsGetEnableAccelerated2dCanvas
    settingsGetEnableAccelerated2dCanvas    ,


-- ** settingsGetEnableCaretBrowsing
    settingsGetEnableCaretBrowsing          ,


-- ** settingsGetEnableDeveloperExtras
    settingsGetEnableDeveloperExtras        ,


-- ** settingsGetEnableDnsPrefetching
    settingsGetEnableDnsPrefetching         ,


-- ** settingsGetEnableFrameFlattening
    settingsGetEnableFrameFlattening        ,


-- ** settingsGetEnableFullscreen
    settingsGetEnableFullscreen             ,


-- ** settingsGetEnableHtml5Database
    settingsGetEnableHtml5Database          ,


-- ** settingsGetEnableHtml5LocalStorage
    settingsGetEnableHtml5LocalStorage      ,


-- ** settingsGetEnableHyperlinkAuditing
    settingsGetEnableHyperlinkAuditing      ,


-- ** settingsGetEnableJava
    settingsGetEnableJava                   ,


-- ** settingsGetEnableJavascript
    settingsGetEnableJavascript             ,


-- ** settingsGetEnableMediaStream
    settingsGetEnableMediaStream            ,


-- ** settingsGetEnableMediasource
    settingsGetEnableMediasource            ,


-- ** settingsGetEnableOfflineWebApplicationCache
    settingsGetEnableOfflineWebApplicationCache,


-- ** settingsGetEnablePageCache
    settingsGetEnablePageCache              ,


-- ** settingsGetEnablePlugins
    settingsGetEnablePlugins                ,


-- ** settingsGetEnablePrivateBrowsing
    settingsGetEnablePrivateBrowsing        ,


-- ** settingsGetEnableResizableTextAreas
    settingsGetEnableResizableTextAreas     ,


-- ** settingsGetEnableSiteSpecificQuirks
    settingsGetEnableSiteSpecificQuirks     ,


-- ** settingsGetEnableSmoothScrolling
    settingsGetEnableSmoothScrolling        ,


-- ** settingsGetEnableSpatialNavigation
    settingsGetEnableSpatialNavigation      ,


-- ** settingsGetEnableTabsToLinks
    settingsGetEnableTabsToLinks            ,


-- ** settingsGetEnableWebaudio
    settingsGetEnableWebaudio               ,


-- ** settingsGetEnableWebgl
    settingsGetEnableWebgl                  ,


-- ** settingsGetEnableWriteConsoleMessagesToStdout
    settingsGetEnableWriteConsoleMessagesToStdout,


-- ** settingsGetEnableXssAuditor
    settingsGetEnableXssAuditor             ,


-- ** settingsGetFantasyFontFamily
    settingsGetFantasyFontFamily            ,


-- ** settingsGetJavascriptCanAccessClipboard
    settingsGetJavascriptCanAccessClipboard ,


-- ** settingsGetJavascriptCanOpenWindowsAutomatically
    settingsGetJavascriptCanOpenWindowsAutomatically,


-- ** settingsGetLoadIconsIgnoringImageLoadSetting
    settingsGetLoadIconsIgnoringImageLoadSetting,


-- ** settingsGetMediaPlaybackAllowsInline
    settingsGetMediaPlaybackAllowsInline    ,


-- ** settingsGetMediaPlaybackRequiresUserGesture
    settingsGetMediaPlaybackRequiresUserGesture,


-- ** settingsGetMinimumFontSize
    settingsGetMinimumFontSize              ,


-- ** settingsGetMonospaceFontFamily
    settingsGetMonospaceFontFamily          ,


-- ** settingsGetPictographFontFamily
    settingsGetPictographFontFamily         ,


-- ** settingsGetPrintBackgrounds
    settingsGetPrintBackgrounds             ,


-- ** settingsGetSansSerifFontFamily
    settingsGetSansSerifFontFamily          ,


-- ** settingsGetSerifFontFamily
    settingsGetSerifFontFamily              ,


-- ** settingsGetUserAgent
    settingsGetUserAgent                    ,


-- ** settingsGetZoomTextOnly
    settingsGetZoomTextOnly                 ,


-- ** settingsNew
    settingsNew                             ,


-- ** settingsSetAllowFileAccessFromFileUrls
    settingsSetAllowFileAccessFromFileUrls  ,


-- ** settingsSetAllowModalDialogs
    settingsSetAllowModalDialogs            ,


-- ** settingsSetAutoLoadImages
    settingsSetAutoLoadImages               ,


-- ** settingsSetCursiveFontFamily
    settingsSetCursiveFontFamily            ,


-- ** settingsSetDefaultCharset
    settingsSetDefaultCharset               ,


-- ** settingsSetDefaultFontFamily
    settingsSetDefaultFontFamily            ,


-- ** settingsSetDefaultFontSize
    settingsSetDefaultFontSize              ,


-- ** settingsSetDefaultMonospaceFontSize
    settingsSetDefaultMonospaceFontSize     ,


-- ** settingsSetDrawCompositingIndicators
    settingsSetDrawCompositingIndicators    ,


-- ** settingsSetEnableAccelerated2dCanvas
    settingsSetEnableAccelerated2dCanvas    ,


-- ** settingsSetEnableCaretBrowsing
    settingsSetEnableCaretBrowsing          ,


-- ** settingsSetEnableDeveloperExtras
    settingsSetEnableDeveloperExtras        ,


-- ** settingsSetEnableDnsPrefetching
    settingsSetEnableDnsPrefetching         ,


-- ** settingsSetEnableFrameFlattening
    settingsSetEnableFrameFlattening        ,


-- ** settingsSetEnableFullscreen
    settingsSetEnableFullscreen             ,


-- ** settingsSetEnableHtml5Database
    settingsSetEnableHtml5Database          ,


-- ** settingsSetEnableHtml5LocalStorage
    settingsSetEnableHtml5LocalStorage      ,


-- ** settingsSetEnableHyperlinkAuditing
    settingsSetEnableHyperlinkAuditing      ,


-- ** settingsSetEnableJava
    settingsSetEnableJava                   ,


-- ** settingsSetEnableJavascript
    settingsSetEnableJavascript             ,


-- ** settingsSetEnableMediaStream
    settingsSetEnableMediaStream            ,


-- ** settingsSetEnableMediasource
    settingsSetEnableMediasource            ,


-- ** settingsSetEnableOfflineWebApplicationCache
    settingsSetEnableOfflineWebApplicationCache,


-- ** settingsSetEnablePageCache
    settingsSetEnablePageCache              ,


-- ** settingsSetEnablePlugins
    settingsSetEnablePlugins                ,


-- ** settingsSetEnablePrivateBrowsing
    settingsSetEnablePrivateBrowsing        ,


-- ** settingsSetEnableResizableTextAreas
    settingsSetEnableResizableTextAreas     ,


-- ** settingsSetEnableSiteSpecificQuirks
    settingsSetEnableSiteSpecificQuirks     ,


-- ** settingsSetEnableSmoothScrolling
    settingsSetEnableSmoothScrolling        ,


-- ** settingsSetEnableSpatialNavigation
    settingsSetEnableSpatialNavigation      ,


-- ** settingsSetEnableTabsToLinks
    settingsSetEnableTabsToLinks            ,


-- ** settingsSetEnableWebaudio
    settingsSetEnableWebaudio               ,


-- ** settingsSetEnableWebgl
    settingsSetEnableWebgl                  ,


-- ** settingsSetEnableWriteConsoleMessagesToStdout
    settingsSetEnableWriteConsoleMessagesToStdout,


-- ** settingsSetEnableXssAuditor
    settingsSetEnableXssAuditor             ,


-- ** settingsSetFantasyFontFamily
    settingsSetFantasyFontFamily            ,


-- ** settingsSetJavascriptCanAccessClipboard
    settingsSetJavascriptCanAccessClipboard ,


-- ** settingsSetJavascriptCanOpenWindowsAutomatically
    settingsSetJavascriptCanOpenWindowsAutomatically,


-- ** settingsSetLoadIconsIgnoringImageLoadSetting
    settingsSetLoadIconsIgnoringImageLoadSetting,


-- ** settingsSetMediaPlaybackAllowsInline
    settingsSetMediaPlaybackAllowsInline    ,


-- ** settingsSetMediaPlaybackRequiresUserGesture
    settingsSetMediaPlaybackRequiresUserGesture,


-- ** settingsSetMinimumFontSize
    settingsSetMinimumFontSize              ,


-- ** settingsSetMonospaceFontFamily
    settingsSetMonospaceFontFamily          ,


-- ** settingsSetPictographFontFamily
    settingsSetPictographFontFamily         ,


-- ** settingsSetPrintBackgrounds
    settingsSetPrintBackgrounds             ,


-- ** settingsSetSansSerifFontFamily
    settingsSetSansSerifFontFamily          ,


-- ** settingsSetSerifFontFamily
    settingsSetSerifFontFamily              ,


-- ** settingsSetUserAgent
    settingsSetUserAgent                    ,


-- ** settingsSetUserAgentWithApplicationDetails
    settingsSetUserAgentWithApplicationDetails,


-- ** settingsSetZoomTextOnly
    settingsSetZoomTextOnly                 ,




 -- * Properties
-- ** AllowFileAccessFromFileUrls
    SettingsAllowFileAccessFromFileUrlsPropertyInfo,
    constructSettingsAllowFileAccessFromFileUrls,
    getSettingsAllowFileAccessFromFileUrls  ,
    setSettingsAllowFileAccessFromFileUrls  ,


-- ** AllowModalDialogs
    SettingsAllowModalDialogsPropertyInfo   ,
    constructSettingsAllowModalDialogs      ,
    getSettingsAllowModalDialogs            ,
    setSettingsAllowModalDialogs            ,


-- ** AutoLoadImages
    SettingsAutoLoadImagesPropertyInfo      ,
    constructSettingsAutoLoadImages         ,
    getSettingsAutoLoadImages               ,
    setSettingsAutoLoadImages               ,


-- ** CursiveFontFamily
    SettingsCursiveFontFamilyPropertyInfo   ,
    constructSettingsCursiveFontFamily      ,
    getSettingsCursiveFontFamily            ,
    setSettingsCursiveFontFamily            ,


-- ** DefaultCharset
    SettingsDefaultCharsetPropertyInfo      ,
    constructSettingsDefaultCharset         ,
    getSettingsDefaultCharset               ,
    setSettingsDefaultCharset               ,


-- ** DefaultFontFamily
    SettingsDefaultFontFamilyPropertyInfo   ,
    constructSettingsDefaultFontFamily      ,
    getSettingsDefaultFontFamily            ,
    setSettingsDefaultFontFamily            ,


-- ** DefaultFontSize
    SettingsDefaultFontSizePropertyInfo     ,
    constructSettingsDefaultFontSize        ,
    getSettingsDefaultFontSize              ,
    setSettingsDefaultFontSize              ,


-- ** DefaultMonospaceFontSize
    SettingsDefaultMonospaceFontSizePropertyInfo,
    constructSettingsDefaultMonospaceFontSize,
    getSettingsDefaultMonospaceFontSize     ,
    setSettingsDefaultMonospaceFontSize     ,


-- ** DrawCompositingIndicators
    SettingsDrawCompositingIndicatorsPropertyInfo,
    constructSettingsDrawCompositingIndicators,
    getSettingsDrawCompositingIndicators    ,
    setSettingsDrawCompositingIndicators    ,


-- ** EnableAccelerated2dCanvas
    SettingsEnableAccelerated2dCanvasPropertyInfo,
    constructSettingsEnableAccelerated2dCanvas,
    getSettingsEnableAccelerated2dCanvas    ,
    setSettingsEnableAccelerated2dCanvas    ,


-- ** EnableCaretBrowsing
    SettingsEnableCaretBrowsingPropertyInfo ,
    constructSettingsEnableCaretBrowsing    ,
    getSettingsEnableCaretBrowsing          ,
    setSettingsEnableCaretBrowsing          ,


-- ** EnableDeveloperExtras
    SettingsEnableDeveloperExtrasPropertyInfo,
    constructSettingsEnableDeveloperExtras  ,
    getSettingsEnableDeveloperExtras        ,
    setSettingsEnableDeveloperExtras        ,


-- ** EnableDnsPrefetching
    SettingsEnableDnsPrefetchingPropertyInfo,
    constructSettingsEnableDnsPrefetching   ,
    getSettingsEnableDnsPrefetching         ,
    setSettingsEnableDnsPrefetching         ,


-- ** EnableFrameFlattening
    SettingsEnableFrameFlatteningPropertyInfo,
    constructSettingsEnableFrameFlattening  ,
    getSettingsEnableFrameFlattening        ,
    setSettingsEnableFrameFlattening        ,


-- ** EnableFullscreen
    SettingsEnableFullscreenPropertyInfo    ,
    constructSettingsEnableFullscreen       ,
    getSettingsEnableFullscreen             ,
    setSettingsEnableFullscreen             ,


-- ** EnableHtml5Database
    SettingsEnableHtml5DatabasePropertyInfo ,
    constructSettingsEnableHtml5Database    ,
    getSettingsEnableHtml5Database          ,
    setSettingsEnableHtml5Database          ,


-- ** EnableHtml5LocalStorage
    SettingsEnableHtml5LocalStoragePropertyInfo,
    constructSettingsEnableHtml5LocalStorage,
    getSettingsEnableHtml5LocalStorage      ,
    setSettingsEnableHtml5LocalStorage      ,


-- ** EnableHyperlinkAuditing
    SettingsEnableHyperlinkAuditingPropertyInfo,
    constructSettingsEnableHyperlinkAuditing,
    getSettingsEnableHyperlinkAuditing      ,
    setSettingsEnableHyperlinkAuditing      ,


-- ** EnableJava
    SettingsEnableJavaPropertyInfo          ,
    constructSettingsEnableJava             ,
    getSettingsEnableJava                   ,
    setSettingsEnableJava                   ,


-- ** EnableJavascript
    SettingsEnableJavascriptPropertyInfo    ,
    constructSettingsEnableJavascript       ,
    getSettingsEnableJavascript             ,
    setSettingsEnableJavascript             ,


-- ** EnableMediaStream
    SettingsEnableMediaStreamPropertyInfo   ,
    constructSettingsEnableMediaStream      ,
    getSettingsEnableMediaStream            ,
    setSettingsEnableMediaStream            ,


-- ** EnableMediasource
    SettingsEnableMediasourcePropertyInfo   ,
    constructSettingsEnableMediasource      ,
    getSettingsEnableMediasource            ,
    setSettingsEnableMediasource            ,


-- ** EnableOfflineWebApplicationCache
    SettingsEnableOfflineWebApplicationCachePropertyInfo,
    constructSettingsEnableOfflineWebApplicationCache,
    getSettingsEnableOfflineWebApplicationCache,
    setSettingsEnableOfflineWebApplicationCache,


-- ** EnablePageCache
    SettingsEnablePageCachePropertyInfo     ,
    constructSettingsEnablePageCache        ,
    getSettingsEnablePageCache              ,
    setSettingsEnablePageCache              ,


-- ** EnablePlugins
    SettingsEnablePluginsPropertyInfo       ,
    constructSettingsEnablePlugins          ,
    getSettingsEnablePlugins                ,
    setSettingsEnablePlugins                ,


-- ** EnablePrivateBrowsing
    SettingsEnablePrivateBrowsingPropertyInfo,
    constructSettingsEnablePrivateBrowsing  ,
    getSettingsEnablePrivateBrowsing        ,
    setSettingsEnablePrivateBrowsing        ,


-- ** EnableResizableTextAreas
    SettingsEnableResizableTextAreasPropertyInfo,
    constructSettingsEnableResizableTextAreas,
    getSettingsEnableResizableTextAreas     ,
    setSettingsEnableResizableTextAreas     ,


-- ** EnableSiteSpecificQuirks
    SettingsEnableSiteSpecificQuirksPropertyInfo,
    constructSettingsEnableSiteSpecificQuirks,
    getSettingsEnableSiteSpecificQuirks     ,
    setSettingsEnableSiteSpecificQuirks     ,


-- ** EnableSmoothScrolling
    SettingsEnableSmoothScrollingPropertyInfo,
    constructSettingsEnableSmoothScrolling  ,
    getSettingsEnableSmoothScrolling        ,
    setSettingsEnableSmoothScrolling        ,


-- ** EnableSpatialNavigation
    SettingsEnableSpatialNavigationPropertyInfo,
    constructSettingsEnableSpatialNavigation,
    getSettingsEnableSpatialNavigation      ,
    setSettingsEnableSpatialNavigation      ,


-- ** EnableTabsToLinks
    SettingsEnableTabsToLinksPropertyInfo   ,
    constructSettingsEnableTabsToLinks      ,
    getSettingsEnableTabsToLinks            ,
    setSettingsEnableTabsToLinks            ,


-- ** EnableWebaudio
    SettingsEnableWebaudioPropertyInfo      ,
    constructSettingsEnableWebaudio         ,
    getSettingsEnableWebaudio               ,
    setSettingsEnableWebaudio               ,


-- ** EnableWebgl
    SettingsEnableWebglPropertyInfo         ,
    constructSettingsEnableWebgl            ,
    getSettingsEnableWebgl                  ,
    setSettingsEnableWebgl                  ,


-- ** EnableWriteConsoleMessagesToStdout
    SettingsEnableWriteConsoleMessagesToStdoutPropertyInfo,
    constructSettingsEnableWriteConsoleMessagesToStdout,
    getSettingsEnableWriteConsoleMessagesToStdout,
    setSettingsEnableWriteConsoleMessagesToStdout,


-- ** EnableXssAuditor
    SettingsEnableXssAuditorPropertyInfo    ,
    constructSettingsEnableXssAuditor       ,
    getSettingsEnableXssAuditor             ,
    setSettingsEnableXssAuditor             ,


-- ** FantasyFontFamily
    SettingsFantasyFontFamilyPropertyInfo   ,
    constructSettingsFantasyFontFamily      ,
    getSettingsFantasyFontFamily            ,
    setSettingsFantasyFontFamily            ,


-- ** JavascriptCanAccessClipboard
    SettingsJavascriptCanAccessClipboardPropertyInfo,
    constructSettingsJavascriptCanAccessClipboard,
    getSettingsJavascriptCanAccessClipboard ,
    setSettingsJavascriptCanAccessClipboard ,


-- ** JavascriptCanOpenWindowsAutomatically
    SettingsJavascriptCanOpenWindowsAutomaticallyPropertyInfo,
    constructSettingsJavascriptCanOpenWindowsAutomatically,
    getSettingsJavascriptCanOpenWindowsAutomatically,
    setSettingsJavascriptCanOpenWindowsAutomatically,


-- ** LoadIconsIgnoringImageLoadSetting
    SettingsLoadIconsIgnoringImageLoadSettingPropertyInfo,
    constructSettingsLoadIconsIgnoringImageLoadSetting,
    getSettingsLoadIconsIgnoringImageLoadSetting,
    setSettingsLoadIconsIgnoringImageLoadSetting,


-- ** MediaPlaybackAllowsInline
    SettingsMediaPlaybackAllowsInlinePropertyInfo,
    constructSettingsMediaPlaybackAllowsInline,
    getSettingsMediaPlaybackAllowsInline    ,
    setSettingsMediaPlaybackAllowsInline    ,


-- ** MediaPlaybackRequiresUserGesture
    SettingsMediaPlaybackRequiresUserGesturePropertyInfo,
    constructSettingsMediaPlaybackRequiresUserGesture,
    getSettingsMediaPlaybackRequiresUserGesture,
    setSettingsMediaPlaybackRequiresUserGesture,


-- ** MinimumFontSize
    SettingsMinimumFontSizePropertyInfo     ,
    constructSettingsMinimumFontSize        ,
    getSettingsMinimumFontSize              ,
    setSettingsMinimumFontSize              ,


-- ** MonospaceFontFamily
    SettingsMonospaceFontFamilyPropertyInfo ,
    constructSettingsMonospaceFontFamily    ,
    getSettingsMonospaceFontFamily          ,
    setSettingsMonospaceFontFamily          ,


-- ** PictographFontFamily
    SettingsPictographFontFamilyPropertyInfo,
    constructSettingsPictographFontFamily   ,
    getSettingsPictographFontFamily         ,
    setSettingsPictographFontFamily         ,


-- ** PrintBackgrounds
    SettingsPrintBackgroundsPropertyInfo    ,
    constructSettingsPrintBackgrounds       ,
    getSettingsPrintBackgrounds             ,
    setSettingsPrintBackgrounds             ,


-- ** SansSerifFontFamily
    SettingsSansSerifFontFamilyPropertyInfo ,
    constructSettingsSansSerifFontFamily    ,
    getSettingsSansSerifFontFamily          ,
    setSettingsSansSerifFontFamily          ,


-- ** SerifFontFamily
    SettingsSerifFontFamilyPropertyInfo     ,
    constructSettingsSerifFontFamily        ,
    getSettingsSerifFontFamily              ,
    setSettingsSerifFontFamily              ,


-- ** UserAgent
    SettingsUserAgentPropertyInfo           ,
    constructSettingsUserAgent              ,
    getSettingsUserAgent                    ,
    setSettingsUserAgent                    ,


-- ** ZoomTextOnly
    SettingsZoomTextOnlyPropertyInfo        ,
    constructSettingsZoomTextOnly           ,
    getSettingsZoomTextOnly                 ,
    setSettingsZoomTextOnly                 ,




    ) where

import Prelude ()
import Data.GI.Base.ShortPrelude

import qualified Data.Text as T
import qualified Data.ByteString.Char8 as B
import qualified Data.Map as Map

import GI.WebKit2.Types
import GI.WebKit2.Callbacks
import qualified GI.GObject as GObject

newtype Settings = Settings (ForeignPtr Settings)
foreign import ccall "webkit_settings_get_type"
    c_webkit_settings_get_type :: IO GType

type instance ParentTypes Settings = SettingsParentTypes
type SettingsParentTypes = '[GObject.Object]

instance GObject Settings where
    gobjectIsInitiallyUnowned _ = False
    gobjectType _ = c_webkit_settings_get_type
    

class GObject o => SettingsK o
instance (GObject o, IsDescendantOf Settings o) => SettingsK o

toSettings :: SettingsK o => o -> IO Settings
toSettings = unsafeCastTo Settings

noSettings :: Maybe Settings
noSettings = Nothing

-- VVV Prop "allow-file-access-from-file-urls"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsAllowFileAccessFromFileUrls :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsAllowFileAccessFromFileUrls obj = liftIO $ getObjectPropertyBool obj "allow-file-access-from-file-urls"

setSettingsAllowFileAccessFromFileUrls :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsAllowFileAccessFromFileUrls obj val = liftIO $ setObjectPropertyBool obj "allow-file-access-from-file-urls" val

constructSettingsAllowFileAccessFromFileUrls :: Bool -> IO ([Char], GValue)
constructSettingsAllowFileAccessFromFileUrls val = constructObjectPropertyBool "allow-file-access-from-file-urls" val

data SettingsAllowFileAccessFromFileUrlsPropertyInfo
instance AttrInfo SettingsAllowFileAccessFromFileUrlsPropertyInfo where
    type AttrAllowedOps SettingsAllowFileAccessFromFileUrlsPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsAllowFileAccessFromFileUrlsPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsAllowFileAccessFromFileUrlsPropertyInfo = SettingsK
    type AttrGetType SettingsAllowFileAccessFromFileUrlsPropertyInfo = Bool
    type AttrLabel SettingsAllowFileAccessFromFileUrlsPropertyInfo = "Settings::allow-file-access-from-file-urls"
    attrGet _ = getSettingsAllowFileAccessFromFileUrls
    attrSet _ = setSettingsAllowFileAccessFromFileUrls
    attrConstruct _ = constructSettingsAllowFileAccessFromFileUrls

-- VVV Prop "allow-modal-dialogs"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsAllowModalDialogs :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsAllowModalDialogs obj = liftIO $ getObjectPropertyBool obj "allow-modal-dialogs"

setSettingsAllowModalDialogs :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsAllowModalDialogs obj val = liftIO $ setObjectPropertyBool obj "allow-modal-dialogs" val

constructSettingsAllowModalDialogs :: Bool -> IO ([Char], GValue)
constructSettingsAllowModalDialogs val = constructObjectPropertyBool "allow-modal-dialogs" val

data SettingsAllowModalDialogsPropertyInfo
instance AttrInfo SettingsAllowModalDialogsPropertyInfo where
    type AttrAllowedOps SettingsAllowModalDialogsPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsAllowModalDialogsPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsAllowModalDialogsPropertyInfo = SettingsK
    type AttrGetType SettingsAllowModalDialogsPropertyInfo = Bool
    type AttrLabel SettingsAllowModalDialogsPropertyInfo = "Settings::allow-modal-dialogs"
    attrGet _ = getSettingsAllowModalDialogs
    attrSet _ = setSettingsAllowModalDialogs
    attrConstruct _ = constructSettingsAllowModalDialogs

-- VVV Prop "auto-load-images"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsAutoLoadImages :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsAutoLoadImages obj = liftIO $ getObjectPropertyBool obj "auto-load-images"

setSettingsAutoLoadImages :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsAutoLoadImages obj val = liftIO $ setObjectPropertyBool obj "auto-load-images" val

constructSettingsAutoLoadImages :: Bool -> IO ([Char], GValue)
constructSettingsAutoLoadImages val = constructObjectPropertyBool "auto-load-images" val

data SettingsAutoLoadImagesPropertyInfo
instance AttrInfo SettingsAutoLoadImagesPropertyInfo where
    type AttrAllowedOps SettingsAutoLoadImagesPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsAutoLoadImagesPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsAutoLoadImagesPropertyInfo = SettingsK
    type AttrGetType SettingsAutoLoadImagesPropertyInfo = Bool
    type AttrLabel SettingsAutoLoadImagesPropertyInfo = "Settings::auto-load-images"
    attrGet _ = getSettingsAutoLoadImages
    attrSet _ = setSettingsAutoLoadImages
    attrConstruct _ = constructSettingsAutoLoadImages

-- VVV Prop "cursive-font-family"
   -- Type: TBasicType TUTF8
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsCursiveFontFamily :: (MonadIO m, SettingsK o) => o -> m T.Text
getSettingsCursiveFontFamily obj = liftIO $ getObjectPropertyString obj "cursive-font-family"

setSettingsCursiveFontFamily :: (MonadIO m, SettingsK o) => o -> T.Text -> m ()
setSettingsCursiveFontFamily obj val = liftIO $ setObjectPropertyString obj "cursive-font-family" val

constructSettingsCursiveFontFamily :: T.Text -> IO ([Char], GValue)
constructSettingsCursiveFontFamily val = constructObjectPropertyString "cursive-font-family" val

data SettingsCursiveFontFamilyPropertyInfo
instance AttrInfo SettingsCursiveFontFamilyPropertyInfo where
    type AttrAllowedOps SettingsCursiveFontFamilyPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsCursiveFontFamilyPropertyInfo = (~) T.Text
    type AttrBaseTypeConstraint SettingsCursiveFontFamilyPropertyInfo = SettingsK
    type AttrGetType SettingsCursiveFontFamilyPropertyInfo = T.Text
    type AttrLabel SettingsCursiveFontFamilyPropertyInfo = "Settings::cursive-font-family"
    attrGet _ = getSettingsCursiveFontFamily
    attrSet _ = setSettingsCursiveFontFamily
    attrConstruct _ = constructSettingsCursiveFontFamily

-- VVV Prop "default-charset"
   -- Type: TBasicType TUTF8
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsDefaultCharset :: (MonadIO m, SettingsK o) => o -> m T.Text
getSettingsDefaultCharset obj = liftIO $ getObjectPropertyString obj "default-charset"

setSettingsDefaultCharset :: (MonadIO m, SettingsK o) => o -> T.Text -> m ()
setSettingsDefaultCharset obj val = liftIO $ setObjectPropertyString obj "default-charset" val

constructSettingsDefaultCharset :: T.Text -> IO ([Char], GValue)
constructSettingsDefaultCharset val = constructObjectPropertyString "default-charset" val

data SettingsDefaultCharsetPropertyInfo
instance AttrInfo SettingsDefaultCharsetPropertyInfo where
    type AttrAllowedOps SettingsDefaultCharsetPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsDefaultCharsetPropertyInfo = (~) T.Text
    type AttrBaseTypeConstraint SettingsDefaultCharsetPropertyInfo = SettingsK
    type AttrGetType SettingsDefaultCharsetPropertyInfo = T.Text
    type AttrLabel SettingsDefaultCharsetPropertyInfo = "Settings::default-charset"
    attrGet _ = getSettingsDefaultCharset
    attrSet _ = setSettingsDefaultCharset
    attrConstruct _ = constructSettingsDefaultCharset

-- VVV Prop "default-font-family"
   -- Type: TBasicType TUTF8
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsDefaultFontFamily :: (MonadIO m, SettingsK o) => o -> m T.Text
getSettingsDefaultFontFamily obj = liftIO $ getObjectPropertyString obj "default-font-family"

setSettingsDefaultFontFamily :: (MonadIO m, SettingsK o) => o -> T.Text -> m ()
setSettingsDefaultFontFamily obj val = liftIO $ setObjectPropertyString obj "default-font-family" val

constructSettingsDefaultFontFamily :: T.Text -> IO ([Char], GValue)
constructSettingsDefaultFontFamily val = constructObjectPropertyString "default-font-family" val

data SettingsDefaultFontFamilyPropertyInfo
instance AttrInfo SettingsDefaultFontFamilyPropertyInfo where
    type AttrAllowedOps SettingsDefaultFontFamilyPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsDefaultFontFamilyPropertyInfo = (~) T.Text
    type AttrBaseTypeConstraint SettingsDefaultFontFamilyPropertyInfo = SettingsK
    type AttrGetType SettingsDefaultFontFamilyPropertyInfo = T.Text
    type AttrLabel SettingsDefaultFontFamilyPropertyInfo = "Settings::default-font-family"
    attrGet _ = getSettingsDefaultFontFamily
    attrSet _ = setSettingsDefaultFontFamily
    attrConstruct _ = constructSettingsDefaultFontFamily

-- VVV Prop "default-font-size"
   -- Type: TBasicType TUInt32
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsDefaultFontSize :: (MonadIO m, SettingsK o) => o -> m Word32
getSettingsDefaultFontSize obj = liftIO $ getObjectPropertyCUInt obj "default-font-size"

setSettingsDefaultFontSize :: (MonadIO m, SettingsK o) => o -> Word32 -> m ()
setSettingsDefaultFontSize obj val = liftIO $ setObjectPropertyCUInt obj "default-font-size" val

constructSettingsDefaultFontSize :: Word32 -> IO ([Char], GValue)
constructSettingsDefaultFontSize val = constructObjectPropertyCUInt "default-font-size" val

data SettingsDefaultFontSizePropertyInfo
instance AttrInfo SettingsDefaultFontSizePropertyInfo where
    type AttrAllowedOps SettingsDefaultFontSizePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsDefaultFontSizePropertyInfo = (~) Word32
    type AttrBaseTypeConstraint SettingsDefaultFontSizePropertyInfo = SettingsK
    type AttrGetType SettingsDefaultFontSizePropertyInfo = Word32
    type AttrLabel SettingsDefaultFontSizePropertyInfo = "Settings::default-font-size"
    attrGet _ = getSettingsDefaultFontSize
    attrSet _ = setSettingsDefaultFontSize
    attrConstruct _ = constructSettingsDefaultFontSize

-- VVV Prop "default-monospace-font-size"
   -- Type: TBasicType TUInt32
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsDefaultMonospaceFontSize :: (MonadIO m, SettingsK o) => o -> m Word32
getSettingsDefaultMonospaceFontSize obj = liftIO $ getObjectPropertyCUInt obj "default-monospace-font-size"

setSettingsDefaultMonospaceFontSize :: (MonadIO m, SettingsK o) => o -> Word32 -> m ()
setSettingsDefaultMonospaceFontSize obj val = liftIO $ setObjectPropertyCUInt obj "default-monospace-font-size" val

constructSettingsDefaultMonospaceFontSize :: Word32 -> IO ([Char], GValue)
constructSettingsDefaultMonospaceFontSize val = constructObjectPropertyCUInt "default-monospace-font-size" val

data SettingsDefaultMonospaceFontSizePropertyInfo
instance AttrInfo SettingsDefaultMonospaceFontSizePropertyInfo where
    type AttrAllowedOps SettingsDefaultMonospaceFontSizePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsDefaultMonospaceFontSizePropertyInfo = (~) Word32
    type AttrBaseTypeConstraint SettingsDefaultMonospaceFontSizePropertyInfo = SettingsK
    type AttrGetType SettingsDefaultMonospaceFontSizePropertyInfo = Word32
    type AttrLabel SettingsDefaultMonospaceFontSizePropertyInfo = "Settings::default-monospace-font-size"
    attrGet _ = getSettingsDefaultMonospaceFontSize
    attrSet _ = setSettingsDefaultMonospaceFontSize
    attrConstruct _ = constructSettingsDefaultMonospaceFontSize

-- VVV Prop "draw-compositing-indicators"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsDrawCompositingIndicators :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsDrawCompositingIndicators obj = liftIO $ getObjectPropertyBool obj "draw-compositing-indicators"

setSettingsDrawCompositingIndicators :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsDrawCompositingIndicators obj val = liftIO $ setObjectPropertyBool obj "draw-compositing-indicators" val

constructSettingsDrawCompositingIndicators :: Bool -> IO ([Char], GValue)
constructSettingsDrawCompositingIndicators val = constructObjectPropertyBool "draw-compositing-indicators" val

data SettingsDrawCompositingIndicatorsPropertyInfo
instance AttrInfo SettingsDrawCompositingIndicatorsPropertyInfo where
    type AttrAllowedOps SettingsDrawCompositingIndicatorsPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsDrawCompositingIndicatorsPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsDrawCompositingIndicatorsPropertyInfo = SettingsK
    type AttrGetType SettingsDrawCompositingIndicatorsPropertyInfo = Bool
    type AttrLabel SettingsDrawCompositingIndicatorsPropertyInfo = "Settings::draw-compositing-indicators"
    attrGet _ = getSettingsDrawCompositingIndicators
    attrSet _ = setSettingsDrawCompositingIndicators
    attrConstruct _ = constructSettingsDrawCompositingIndicators

-- VVV Prop "enable-accelerated-2d-canvas"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableAccelerated2dCanvas :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableAccelerated2dCanvas obj = liftIO $ getObjectPropertyBool obj "enable-accelerated-2d-canvas"

setSettingsEnableAccelerated2dCanvas :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableAccelerated2dCanvas obj val = liftIO $ setObjectPropertyBool obj "enable-accelerated-2d-canvas" val

constructSettingsEnableAccelerated2dCanvas :: Bool -> IO ([Char], GValue)
constructSettingsEnableAccelerated2dCanvas val = constructObjectPropertyBool "enable-accelerated-2d-canvas" val

data SettingsEnableAccelerated2dCanvasPropertyInfo
instance AttrInfo SettingsEnableAccelerated2dCanvasPropertyInfo where
    type AttrAllowedOps SettingsEnableAccelerated2dCanvasPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableAccelerated2dCanvasPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableAccelerated2dCanvasPropertyInfo = SettingsK
    type AttrGetType SettingsEnableAccelerated2dCanvasPropertyInfo = Bool
    type AttrLabel SettingsEnableAccelerated2dCanvasPropertyInfo = "Settings::enable-accelerated-2d-canvas"
    attrGet _ = getSettingsEnableAccelerated2dCanvas
    attrSet _ = setSettingsEnableAccelerated2dCanvas
    attrConstruct _ = constructSettingsEnableAccelerated2dCanvas

-- VVV Prop "enable-caret-browsing"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableCaretBrowsing :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableCaretBrowsing obj = liftIO $ getObjectPropertyBool obj "enable-caret-browsing"

setSettingsEnableCaretBrowsing :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableCaretBrowsing obj val = liftIO $ setObjectPropertyBool obj "enable-caret-browsing" val

constructSettingsEnableCaretBrowsing :: Bool -> IO ([Char], GValue)
constructSettingsEnableCaretBrowsing val = constructObjectPropertyBool "enable-caret-browsing" val

data SettingsEnableCaretBrowsingPropertyInfo
instance AttrInfo SettingsEnableCaretBrowsingPropertyInfo where
    type AttrAllowedOps SettingsEnableCaretBrowsingPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableCaretBrowsingPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableCaretBrowsingPropertyInfo = SettingsK
    type AttrGetType SettingsEnableCaretBrowsingPropertyInfo = Bool
    type AttrLabel SettingsEnableCaretBrowsingPropertyInfo = "Settings::enable-caret-browsing"
    attrGet _ = getSettingsEnableCaretBrowsing
    attrSet _ = setSettingsEnableCaretBrowsing
    attrConstruct _ = constructSettingsEnableCaretBrowsing

-- VVV Prop "enable-developer-extras"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableDeveloperExtras :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableDeveloperExtras obj = liftIO $ getObjectPropertyBool obj "enable-developer-extras"

setSettingsEnableDeveloperExtras :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableDeveloperExtras obj val = liftIO $ setObjectPropertyBool obj "enable-developer-extras" val

constructSettingsEnableDeveloperExtras :: Bool -> IO ([Char], GValue)
constructSettingsEnableDeveloperExtras val = constructObjectPropertyBool "enable-developer-extras" val

data SettingsEnableDeveloperExtrasPropertyInfo
instance AttrInfo SettingsEnableDeveloperExtrasPropertyInfo where
    type AttrAllowedOps SettingsEnableDeveloperExtrasPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableDeveloperExtrasPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableDeveloperExtrasPropertyInfo = SettingsK
    type AttrGetType SettingsEnableDeveloperExtrasPropertyInfo = Bool
    type AttrLabel SettingsEnableDeveloperExtrasPropertyInfo = "Settings::enable-developer-extras"
    attrGet _ = getSettingsEnableDeveloperExtras
    attrSet _ = setSettingsEnableDeveloperExtras
    attrConstruct _ = constructSettingsEnableDeveloperExtras

-- VVV Prop "enable-dns-prefetching"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableDnsPrefetching :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableDnsPrefetching obj = liftIO $ getObjectPropertyBool obj "enable-dns-prefetching"

setSettingsEnableDnsPrefetching :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableDnsPrefetching obj val = liftIO $ setObjectPropertyBool obj "enable-dns-prefetching" val

constructSettingsEnableDnsPrefetching :: Bool -> IO ([Char], GValue)
constructSettingsEnableDnsPrefetching val = constructObjectPropertyBool "enable-dns-prefetching" val

data SettingsEnableDnsPrefetchingPropertyInfo
instance AttrInfo SettingsEnableDnsPrefetchingPropertyInfo where
    type AttrAllowedOps SettingsEnableDnsPrefetchingPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableDnsPrefetchingPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableDnsPrefetchingPropertyInfo = SettingsK
    type AttrGetType SettingsEnableDnsPrefetchingPropertyInfo = Bool
    type AttrLabel SettingsEnableDnsPrefetchingPropertyInfo = "Settings::enable-dns-prefetching"
    attrGet _ = getSettingsEnableDnsPrefetching
    attrSet _ = setSettingsEnableDnsPrefetching
    attrConstruct _ = constructSettingsEnableDnsPrefetching

-- VVV Prop "enable-frame-flattening"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableFrameFlattening :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableFrameFlattening obj = liftIO $ getObjectPropertyBool obj "enable-frame-flattening"

setSettingsEnableFrameFlattening :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableFrameFlattening obj val = liftIO $ setObjectPropertyBool obj "enable-frame-flattening" val

constructSettingsEnableFrameFlattening :: Bool -> IO ([Char], GValue)
constructSettingsEnableFrameFlattening val = constructObjectPropertyBool "enable-frame-flattening" val

data SettingsEnableFrameFlatteningPropertyInfo
instance AttrInfo SettingsEnableFrameFlatteningPropertyInfo where
    type AttrAllowedOps SettingsEnableFrameFlatteningPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableFrameFlatteningPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableFrameFlatteningPropertyInfo = SettingsK
    type AttrGetType SettingsEnableFrameFlatteningPropertyInfo = Bool
    type AttrLabel SettingsEnableFrameFlatteningPropertyInfo = "Settings::enable-frame-flattening"
    attrGet _ = getSettingsEnableFrameFlattening
    attrSet _ = setSettingsEnableFrameFlattening
    attrConstruct _ = constructSettingsEnableFrameFlattening

-- VVV Prop "enable-fullscreen"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableFullscreen :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableFullscreen obj = liftIO $ getObjectPropertyBool obj "enable-fullscreen"

setSettingsEnableFullscreen :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableFullscreen obj val = liftIO $ setObjectPropertyBool obj "enable-fullscreen" val

constructSettingsEnableFullscreen :: Bool -> IO ([Char], GValue)
constructSettingsEnableFullscreen val = constructObjectPropertyBool "enable-fullscreen" val

data SettingsEnableFullscreenPropertyInfo
instance AttrInfo SettingsEnableFullscreenPropertyInfo where
    type AttrAllowedOps SettingsEnableFullscreenPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableFullscreenPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableFullscreenPropertyInfo = SettingsK
    type AttrGetType SettingsEnableFullscreenPropertyInfo = Bool
    type AttrLabel SettingsEnableFullscreenPropertyInfo = "Settings::enable-fullscreen"
    attrGet _ = getSettingsEnableFullscreen
    attrSet _ = setSettingsEnableFullscreen
    attrConstruct _ = constructSettingsEnableFullscreen

-- VVV Prop "enable-html5-database"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableHtml5Database :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableHtml5Database obj = liftIO $ getObjectPropertyBool obj "enable-html5-database"

setSettingsEnableHtml5Database :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableHtml5Database obj val = liftIO $ setObjectPropertyBool obj "enable-html5-database" val

constructSettingsEnableHtml5Database :: Bool -> IO ([Char], GValue)
constructSettingsEnableHtml5Database val = constructObjectPropertyBool "enable-html5-database" val

data SettingsEnableHtml5DatabasePropertyInfo
instance AttrInfo SettingsEnableHtml5DatabasePropertyInfo where
    type AttrAllowedOps SettingsEnableHtml5DatabasePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableHtml5DatabasePropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableHtml5DatabasePropertyInfo = SettingsK
    type AttrGetType SettingsEnableHtml5DatabasePropertyInfo = Bool
    type AttrLabel SettingsEnableHtml5DatabasePropertyInfo = "Settings::enable-html5-database"
    attrGet _ = getSettingsEnableHtml5Database
    attrSet _ = setSettingsEnableHtml5Database
    attrConstruct _ = constructSettingsEnableHtml5Database

-- VVV Prop "enable-html5-local-storage"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableHtml5LocalStorage :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableHtml5LocalStorage obj = liftIO $ getObjectPropertyBool obj "enable-html5-local-storage"

setSettingsEnableHtml5LocalStorage :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableHtml5LocalStorage obj val = liftIO $ setObjectPropertyBool obj "enable-html5-local-storage" val

constructSettingsEnableHtml5LocalStorage :: Bool -> IO ([Char], GValue)
constructSettingsEnableHtml5LocalStorage val = constructObjectPropertyBool "enable-html5-local-storage" val

data SettingsEnableHtml5LocalStoragePropertyInfo
instance AttrInfo SettingsEnableHtml5LocalStoragePropertyInfo where
    type AttrAllowedOps SettingsEnableHtml5LocalStoragePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableHtml5LocalStoragePropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableHtml5LocalStoragePropertyInfo = SettingsK
    type AttrGetType SettingsEnableHtml5LocalStoragePropertyInfo = Bool
    type AttrLabel SettingsEnableHtml5LocalStoragePropertyInfo = "Settings::enable-html5-local-storage"
    attrGet _ = getSettingsEnableHtml5LocalStorage
    attrSet _ = setSettingsEnableHtml5LocalStorage
    attrConstruct _ = constructSettingsEnableHtml5LocalStorage

-- VVV Prop "enable-hyperlink-auditing"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableHyperlinkAuditing :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableHyperlinkAuditing obj = liftIO $ getObjectPropertyBool obj "enable-hyperlink-auditing"

setSettingsEnableHyperlinkAuditing :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableHyperlinkAuditing obj val = liftIO $ setObjectPropertyBool obj "enable-hyperlink-auditing" val

constructSettingsEnableHyperlinkAuditing :: Bool -> IO ([Char], GValue)
constructSettingsEnableHyperlinkAuditing val = constructObjectPropertyBool "enable-hyperlink-auditing" val

data SettingsEnableHyperlinkAuditingPropertyInfo
instance AttrInfo SettingsEnableHyperlinkAuditingPropertyInfo where
    type AttrAllowedOps SettingsEnableHyperlinkAuditingPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableHyperlinkAuditingPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableHyperlinkAuditingPropertyInfo = SettingsK
    type AttrGetType SettingsEnableHyperlinkAuditingPropertyInfo = Bool
    type AttrLabel SettingsEnableHyperlinkAuditingPropertyInfo = "Settings::enable-hyperlink-auditing"
    attrGet _ = getSettingsEnableHyperlinkAuditing
    attrSet _ = setSettingsEnableHyperlinkAuditing
    attrConstruct _ = constructSettingsEnableHyperlinkAuditing

-- VVV Prop "enable-java"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableJava :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableJava obj = liftIO $ getObjectPropertyBool obj "enable-java"

setSettingsEnableJava :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableJava obj val = liftIO $ setObjectPropertyBool obj "enable-java" val

constructSettingsEnableJava :: Bool -> IO ([Char], GValue)
constructSettingsEnableJava val = constructObjectPropertyBool "enable-java" val

data SettingsEnableJavaPropertyInfo
instance AttrInfo SettingsEnableJavaPropertyInfo where
    type AttrAllowedOps SettingsEnableJavaPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableJavaPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableJavaPropertyInfo = SettingsK
    type AttrGetType SettingsEnableJavaPropertyInfo = Bool
    type AttrLabel SettingsEnableJavaPropertyInfo = "Settings::enable-java"
    attrGet _ = getSettingsEnableJava
    attrSet _ = setSettingsEnableJava
    attrConstruct _ = constructSettingsEnableJava

-- VVV Prop "enable-javascript"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableJavascript :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableJavascript obj = liftIO $ getObjectPropertyBool obj "enable-javascript"

setSettingsEnableJavascript :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableJavascript obj val = liftIO $ setObjectPropertyBool obj "enable-javascript" val

constructSettingsEnableJavascript :: Bool -> IO ([Char], GValue)
constructSettingsEnableJavascript val = constructObjectPropertyBool "enable-javascript" val

data SettingsEnableJavascriptPropertyInfo
instance AttrInfo SettingsEnableJavascriptPropertyInfo where
    type AttrAllowedOps SettingsEnableJavascriptPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableJavascriptPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableJavascriptPropertyInfo = SettingsK
    type AttrGetType SettingsEnableJavascriptPropertyInfo = Bool
    type AttrLabel SettingsEnableJavascriptPropertyInfo = "Settings::enable-javascript"
    attrGet _ = getSettingsEnableJavascript
    attrSet _ = setSettingsEnableJavascript
    attrConstruct _ = constructSettingsEnableJavascript

-- VVV Prop "enable-media-stream"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableMediaStream :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableMediaStream obj = liftIO $ getObjectPropertyBool obj "enable-media-stream"

setSettingsEnableMediaStream :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableMediaStream obj val = liftIO $ setObjectPropertyBool obj "enable-media-stream" val

constructSettingsEnableMediaStream :: Bool -> IO ([Char], GValue)
constructSettingsEnableMediaStream val = constructObjectPropertyBool "enable-media-stream" val

data SettingsEnableMediaStreamPropertyInfo
instance AttrInfo SettingsEnableMediaStreamPropertyInfo where
    type AttrAllowedOps SettingsEnableMediaStreamPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableMediaStreamPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableMediaStreamPropertyInfo = SettingsK
    type AttrGetType SettingsEnableMediaStreamPropertyInfo = Bool
    type AttrLabel SettingsEnableMediaStreamPropertyInfo = "Settings::enable-media-stream"
    attrGet _ = getSettingsEnableMediaStream
    attrSet _ = setSettingsEnableMediaStream
    attrConstruct _ = constructSettingsEnableMediaStream

-- VVV Prop "enable-mediasource"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableMediasource :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableMediasource obj = liftIO $ getObjectPropertyBool obj "enable-mediasource"

setSettingsEnableMediasource :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableMediasource obj val = liftIO $ setObjectPropertyBool obj "enable-mediasource" val

constructSettingsEnableMediasource :: Bool -> IO ([Char], GValue)
constructSettingsEnableMediasource val = constructObjectPropertyBool "enable-mediasource" val

data SettingsEnableMediasourcePropertyInfo
instance AttrInfo SettingsEnableMediasourcePropertyInfo where
    type AttrAllowedOps SettingsEnableMediasourcePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableMediasourcePropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableMediasourcePropertyInfo = SettingsK
    type AttrGetType SettingsEnableMediasourcePropertyInfo = Bool
    type AttrLabel SettingsEnableMediasourcePropertyInfo = "Settings::enable-mediasource"
    attrGet _ = getSettingsEnableMediasource
    attrSet _ = setSettingsEnableMediasource
    attrConstruct _ = constructSettingsEnableMediasource

-- VVV Prop "enable-offline-web-application-cache"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableOfflineWebApplicationCache :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableOfflineWebApplicationCache obj = liftIO $ getObjectPropertyBool obj "enable-offline-web-application-cache"

setSettingsEnableOfflineWebApplicationCache :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableOfflineWebApplicationCache obj val = liftIO $ setObjectPropertyBool obj "enable-offline-web-application-cache" val

constructSettingsEnableOfflineWebApplicationCache :: Bool -> IO ([Char], GValue)
constructSettingsEnableOfflineWebApplicationCache val = constructObjectPropertyBool "enable-offline-web-application-cache" val

data SettingsEnableOfflineWebApplicationCachePropertyInfo
instance AttrInfo SettingsEnableOfflineWebApplicationCachePropertyInfo where
    type AttrAllowedOps SettingsEnableOfflineWebApplicationCachePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableOfflineWebApplicationCachePropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableOfflineWebApplicationCachePropertyInfo = SettingsK
    type AttrGetType SettingsEnableOfflineWebApplicationCachePropertyInfo = Bool
    type AttrLabel SettingsEnableOfflineWebApplicationCachePropertyInfo = "Settings::enable-offline-web-application-cache"
    attrGet _ = getSettingsEnableOfflineWebApplicationCache
    attrSet _ = setSettingsEnableOfflineWebApplicationCache
    attrConstruct _ = constructSettingsEnableOfflineWebApplicationCache

-- VVV Prop "enable-page-cache"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnablePageCache :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnablePageCache obj = liftIO $ getObjectPropertyBool obj "enable-page-cache"

setSettingsEnablePageCache :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnablePageCache obj val = liftIO $ setObjectPropertyBool obj "enable-page-cache" val

constructSettingsEnablePageCache :: Bool -> IO ([Char], GValue)
constructSettingsEnablePageCache val = constructObjectPropertyBool "enable-page-cache" val

data SettingsEnablePageCachePropertyInfo
instance AttrInfo SettingsEnablePageCachePropertyInfo where
    type AttrAllowedOps SettingsEnablePageCachePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnablePageCachePropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnablePageCachePropertyInfo = SettingsK
    type AttrGetType SettingsEnablePageCachePropertyInfo = Bool
    type AttrLabel SettingsEnablePageCachePropertyInfo = "Settings::enable-page-cache"
    attrGet _ = getSettingsEnablePageCache
    attrSet _ = setSettingsEnablePageCache
    attrConstruct _ = constructSettingsEnablePageCache

-- VVV Prop "enable-plugins"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnablePlugins :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnablePlugins obj = liftIO $ getObjectPropertyBool obj "enable-plugins"

setSettingsEnablePlugins :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnablePlugins obj val = liftIO $ setObjectPropertyBool obj "enable-plugins" val

constructSettingsEnablePlugins :: Bool -> IO ([Char], GValue)
constructSettingsEnablePlugins val = constructObjectPropertyBool "enable-plugins" val

data SettingsEnablePluginsPropertyInfo
instance AttrInfo SettingsEnablePluginsPropertyInfo where
    type AttrAllowedOps SettingsEnablePluginsPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnablePluginsPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnablePluginsPropertyInfo = SettingsK
    type AttrGetType SettingsEnablePluginsPropertyInfo = Bool
    type AttrLabel SettingsEnablePluginsPropertyInfo = "Settings::enable-plugins"
    attrGet _ = getSettingsEnablePlugins
    attrSet _ = setSettingsEnablePlugins
    attrConstruct _ = constructSettingsEnablePlugins

-- VVV Prop "enable-private-browsing"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnablePrivateBrowsing :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnablePrivateBrowsing obj = liftIO $ getObjectPropertyBool obj "enable-private-browsing"

setSettingsEnablePrivateBrowsing :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnablePrivateBrowsing obj val = liftIO $ setObjectPropertyBool obj "enable-private-browsing" val

constructSettingsEnablePrivateBrowsing :: Bool -> IO ([Char], GValue)
constructSettingsEnablePrivateBrowsing val = constructObjectPropertyBool "enable-private-browsing" val

data SettingsEnablePrivateBrowsingPropertyInfo
instance AttrInfo SettingsEnablePrivateBrowsingPropertyInfo where
    type AttrAllowedOps SettingsEnablePrivateBrowsingPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnablePrivateBrowsingPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnablePrivateBrowsingPropertyInfo = SettingsK
    type AttrGetType SettingsEnablePrivateBrowsingPropertyInfo = Bool
    type AttrLabel SettingsEnablePrivateBrowsingPropertyInfo = "Settings::enable-private-browsing"
    attrGet _ = getSettingsEnablePrivateBrowsing
    attrSet _ = setSettingsEnablePrivateBrowsing
    attrConstruct _ = constructSettingsEnablePrivateBrowsing

-- VVV Prop "enable-resizable-text-areas"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableResizableTextAreas :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableResizableTextAreas obj = liftIO $ getObjectPropertyBool obj "enable-resizable-text-areas"

setSettingsEnableResizableTextAreas :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableResizableTextAreas obj val = liftIO $ setObjectPropertyBool obj "enable-resizable-text-areas" val

constructSettingsEnableResizableTextAreas :: Bool -> IO ([Char], GValue)
constructSettingsEnableResizableTextAreas val = constructObjectPropertyBool "enable-resizable-text-areas" val

data SettingsEnableResizableTextAreasPropertyInfo
instance AttrInfo SettingsEnableResizableTextAreasPropertyInfo where
    type AttrAllowedOps SettingsEnableResizableTextAreasPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableResizableTextAreasPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableResizableTextAreasPropertyInfo = SettingsK
    type AttrGetType SettingsEnableResizableTextAreasPropertyInfo = Bool
    type AttrLabel SettingsEnableResizableTextAreasPropertyInfo = "Settings::enable-resizable-text-areas"
    attrGet _ = getSettingsEnableResizableTextAreas
    attrSet _ = setSettingsEnableResizableTextAreas
    attrConstruct _ = constructSettingsEnableResizableTextAreas

-- VVV Prop "enable-site-specific-quirks"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableSiteSpecificQuirks :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableSiteSpecificQuirks obj = liftIO $ getObjectPropertyBool obj "enable-site-specific-quirks"

setSettingsEnableSiteSpecificQuirks :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableSiteSpecificQuirks obj val = liftIO $ setObjectPropertyBool obj "enable-site-specific-quirks" val

constructSettingsEnableSiteSpecificQuirks :: Bool -> IO ([Char], GValue)
constructSettingsEnableSiteSpecificQuirks val = constructObjectPropertyBool "enable-site-specific-quirks" val

data SettingsEnableSiteSpecificQuirksPropertyInfo
instance AttrInfo SettingsEnableSiteSpecificQuirksPropertyInfo where
    type AttrAllowedOps SettingsEnableSiteSpecificQuirksPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableSiteSpecificQuirksPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableSiteSpecificQuirksPropertyInfo = SettingsK
    type AttrGetType SettingsEnableSiteSpecificQuirksPropertyInfo = Bool
    type AttrLabel SettingsEnableSiteSpecificQuirksPropertyInfo = "Settings::enable-site-specific-quirks"
    attrGet _ = getSettingsEnableSiteSpecificQuirks
    attrSet _ = setSettingsEnableSiteSpecificQuirks
    attrConstruct _ = constructSettingsEnableSiteSpecificQuirks

-- VVV Prop "enable-smooth-scrolling"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableSmoothScrolling :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableSmoothScrolling obj = liftIO $ getObjectPropertyBool obj "enable-smooth-scrolling"

setSettingsEnableSmoothScrolling :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableSmoothScrolling obj val = liftIO $ setObjectPropertyBool obj "enable-smooth-scrolling" val

constructSettingsEnableSmoothScrolling :: Bool -> IO ([Char], GValue)
constructSettingsEnableSmoothScrolling val = constructObjectPropertyBool "enable-smooth-scrolling" val

data SettingsEnableSmoothScrollingPropertyInfo
instance AttrInfo SettingsEnableSmoothScrollingPropertyInfo where
    type AttrAllowedOps SettingsEnableSmoothScrollingPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableSmoothScrollingPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableSmoothScrollingPropertyInfo = SettingsK
    type AttrGetType SettingsEnableSmoothScrollingPropertyInfo = Bool
    type AttrLabel SettingsEnableSmoothScrollingPropertyInfo = "Settings::enable-smooth-scrolling"
    attrGet _ = getSettingsEnableSmoothScrolling
    attrSet _ = setSettingsEnableSmoothScrolling
    attrConstruct _ = constructSettingsEnableSmoothScrolling

-- VVV Prop "enable-spatial-navigation"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableSpatialNavigation :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableSpatialNavigation obj = liftIO $ getObjectPropertyBool obj "enable-spatial-navigation"

setSettingsEnableSpatialNavigation :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableSpatialNavigation obj val = liftIO $ setObjectPropertyBool obj "enable-spatial-navigation" val

constructSettingsEnableSpatialNavigation :: Bool -> IO ([Char], GValue)
constructSettingsEnableSpatialNavigation val = constructObjectPropertyBool "enable-spatial-navigation" val

data SettingsEnableSpatialNavigationPropertyInfo
instance AttrInfo SettingsEnableSpatialNavigationPropertyInfo where
    type AttrAllowedOps SettingsEnableSpatialNavigationPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableSpatialNavigationPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableSpatialNavigationPropertyInfo = SettingsK
    type AttrGetType SettingsEnableSpatialNavigationPropertyInfo = Bool
    type AttrLabel SettingsEnableSpatialNavigationPropertyInfo = "Settings::enable-spatial-navigation"
    attrGet _ = getSettingsEnableSpatialNavigation
    attrSet _ = setSettingsEnableSpatialNavigation
    attrConstruct _ = constructSettingsEnableSpatialNavigation

-- VVV Prop "enable-tabs-to-links"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableTabsToLinks :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableTabsToLinks obj = liftIO $ getObjectPropertyBool obj "enable-tabs-to-links"

setSettingsEnableTabsToLinks :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableTabsToLinks obj val = liftIO $ setObjectPropertyBool obj "enable-tabs-to-links" val

constructSettingsEnableTabsToLinks :: Bool -> IO ([Char], GValue)
constructSettingsEnableTabsToLinks val = constructObjectPropertyBool "enable-tabs-to-links" val

data SettingsEnableTabsToLinksPropertyInfo
instance AttrInfo SettingsEnableTabsToLinksPropertyInfo where
    type AttrAllowedOps SettingsEnableTabsToLinksPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableTabsToLinksPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableTabsToLinksPropertyInfo = SettingsK
    type AttrGetType SettingsEnableTabsToLinksPropertyInfo = Bool
    type AttrLabel SettingsEnableTabsToLinksPropertyInfo = "Settings::enable-tabs-to-links"
    attrGet _ = getSettingsEnableTabsToLinks
    attrSet _ = setSettingsEnableTabsToLinks
    attrConstruct _ = constructSettingsEnableTabsToLinks

-- VVV Prop "enable-webaudio"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableWebaudio :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableWebaudio obj = liftIO $ getObjectPropertyBool obj "enable-webaudio"

setSettingsEnableWebaudio :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableWebaudio obj val = liftIO $ setObjectPropertyBool obj "enable-webaudio" val

constructSettingsEnableWebaudio :: Bool -> IO ([Char], GValue)
constructSettingsEnableWebaudio val = constructObjectPropertyBool "enable-webaudio" val

data SettingsEnableWebaudioPropertyInfo
instance AttrInfo SettingsEnableWebaudioPropertyInfo where
    type AttrAllowedOps SettingsEnableWebaudioPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableWebaudioPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableWebaudioPropertyInfo = SettingsK
    type AttrGetType SettingsEnableWebaudioPropertyInfo = Bool
    type AttrLabel SettingsEnableWebaudioPropertyInfo = "Settings::enable-webaudio"
    attrGet _ = getSettingsEnableWebaudio
    attrSet _ = setSettingsEnableWebaudio
    attrConstruct _ = constructSettingsEnableWebaudio

-- VVV Prop "enable-webgl"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableWebgl :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableWebgl obj = liftIO $ getObjectPropertyBool obj "enable-webgl"

setSettingsEnableWebgl :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableWebgl obj val = liftIO $ setObjectPropertyBool obj "enable-webgl" val

constructSettingsEnableWebgl :: Bool -> IO ([Char], GValue)
constructSettingsEnableWebgl val = constructObjectPropertyBool "enable-webgl" val

data SettingsEnableWebglPropertyInfo
instance AttrInfo SettingsEnableWebglPropertyInfo where
    type AttrAllowedOps SettingsEnableWebglPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableWebglPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableWebglPropertyInfo = SettingsK
    type AttrGetType SettingsEnableWebglPropertyInfo = Bool
    type AttrLabel SettingsEnableWebglPropertyInfo = "Settings::enable-webgl"
    attrGet _ = getSettingsEnableWebgl
    attrSet _ = setSettingsEnableWebgl
    attrConstruct _ = constructSettingsEnableWebgl

-- VVV Prop "enable-write-console-messages-to-stdout"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableWriteConsoleMessagesToStdout :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableWriteConsoleMessagesToStdout obj = liftIO $ getObjectPropertyBool obj "enable-write-console-messages-to-stdout"

setSettingsEnableWriteConsoleMessagesToStdout :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableWriteConsoleMessagesToStdout obj val = liftIO $ setObjectPropertyBool obj "enable-write-console-messages-to-stdout" val

constructSettingsEnableWriteConsoleMessagesToStdout :: Bool -> IO ([Char], GValue)
constructSettingsEnableWriteConsoleMessagesToStdout val = constructObjectPropertyBool "enable-write-console-messages-to-stdout" val

data SettingsEnableWriteConsoleMessagesToStdoutPropertyInfo
instance AttrInfo SettingsEnableWriteConsoleMessagesToStdoutPropertyInfo where
    type AttrAllowedOps SettingsEnableWriteConsoleMessagesToStdoutPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableWriteConsoleMessagesToStdoutPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableWriteConsoleMessagesToStdoutPropertyInfo = SettingsK
    type AttrGetType SettingsEnableWriteConsoleMessagesToStdoutPropertyInfo = Bool
    type AttrLabel SettingsEnableWriteConsoleMessagesToStdoutPropertyInfo = "Settings::enable-write-console-messages-to-stdout"
    attrGet _ = getSettingsEnableWriteConsoleMessagesToStdout
    attrSet _ = setSettingsEnableWriteConsoleMessagesToStdout
    attrConstruct _ = constructSettingsEnableWriteConsoleMessagesToStdout

-- VVV Prop "enable-xss-auditor"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsEnableXssAuditor :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsEnableXssAuditor obj = liftIO $ getObjectPropertyBool obj "enable-xss-auditor"

setSettingsEnableXssAuditor :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsEnableXssAuditor obj val = liftIO $ setObjectPropertyBool obj "enable-xss-auditor" val

constructSettingsEnableXssAuditor :: Bool -> IO ([Char], GValue)
constructSettingsEnableXssAuditor val = constructObjectPropertyBool "enable-xss-auditor" val

data SettingsEnableXssAuditorPropertyInfo
instance AttrInfo SettingsEnableXssAuditorPropertyInfo where
    type AttrAllowedOps SettingsEnableXssAuditorPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsEnableXssAuditorPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsEnableXssAuditorPropertyInfo = SettingsK
    type AttrGetType SettingsEnableXssAuditorPropertyInfo = Bool
    type AttrLabel SettingsEnableXssAuditorPropertyInfo = "Settings::enable-xss-auditor"
    attrGet _ = getSettingsEnableXssAuditor
    attrSet _ = setSettingsEnableXssAuditor
    attrConstruct _ = constructSettingsEnableXssAuditor

-- VVV Prop "fantasy-font-family"
   -- Type: TBasicType TUTF8
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsFantasyFontFamily :: (MonadIO m, SettingsK o) => o -> m T.Text
getSettingsFantasyFontFamily obj = liftIO $ getObjectPropertyString obj "fantasy-font-family"

setSettingsFantasyFontFamily :: (MonadIO m, SettingsK o) => o -> T.Text -> m ()
setSettingsFantasyFontFamily obj val = liftIO $ setObjectPropertyString obj "fantasy-font-family" val

constructSettingsFantasyFontFamily :: T.Text -> IO ([Char], GValue)
constructSettingsFantasyFontFamily val = constructObjectPropertyString "fantasy-font-family" val

data SettingsFantasyFontFamilyPropertyInfo
instance AttrInfo SettingsFantasyFontFamilyPropertyInfo where
    type AttrAllowedOps SettingsFantasyFontFamilyPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsFantasyFontFamilyPropertyInfo = (~) T.Text
    type AttrBaseTypeConstraint SettingsFantasyFontFamilyPropertyInfo = SettingsK
    type AttrGetType SettingsFantasyFontFamilyPropertyInfo = T.Text
    type AttrLabel SettingsFantasyFontFamilyPropertyInfo = "Settings::fantasy-font-family"
    attrGet _ = getSettingsFantasyFontFamily
    attrSet _ = setSettingsFantasyFontFamily
    attrConstruct _ = constructSettingsFantasyFontFamily

-- VVV Prop "javascript-can-access-clipboard"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsJavascriptCanAccessClipboard :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsJavascriptCanAccessClipboard obj = liftIO $ getObjectPropertyBool obj "javascript-can-access-clipboard"

setSettingsJavascriptCanAccessClipboard :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsJavascriptCanAccessClipboard obj val = liftIO $ setObjectPropertyBool obj "javascript-can-access-clipboard" val

constructSettingsJavascriptCanAccessClipboard :: Bool -> IO ([Char], GValue)
constructSettingsJavascriptCanAccessClipboard val = constructObjectPropertyBool "javascript-can-access-clipboard" val

data SettingsJavascriptCanAccessClipboardPropertyInfo
instance AttrInfo SettingsJavascriptCanAccessClipboardPropertyInfo where
    type AttrAllowedOps SettingsJavascriptCanAccessClipboardPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsJavascriptCanAccessClipboardPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsJavascriptCanAccessClipboardPropertyInfo = SettingsK
    type AttrGetType SettingsJavascriptCanAccessClipboardPropertyInfo = Bool
    type AttrLabel SettingsJavascriptCanAccessClipboardPropertyInfo = "Settings::javascript-can-access-clipboard"
    attrGet _ = getSettingsJavascriptCanAccessClipboard
    attrSet _ = setSettingsJavascriptCanAccessClipboard
    attrConstruct _ = constructSettingsJavascriptCanAccessClipboard

-- VVV Prop "javascript-can-open-windows-automatically"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsJavascriptCanOpenWindowsAutomatically :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsJavascriptCanOpenWindowsAutomatically obj = liftIO $ getObjectPropertyBool obj "javascript-can-open-windows-automatically"

setSettingsJavascriptCanOpenWindowsAutomatically :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsJavascriptCanOpenWindowsAutomatically obj val = liftIO $ setObjectPropertyBool obj "javascript-can-open-windows-automatically" val

constructSettingsJavascriptCanOpenWindowsAutomatically :: Bool -> IO ([Char], GValue)
constructSettingsJavascriptCanOpenWindowsAutomatically val = constructObjectPropertyBool "javascript-can-open-windows-automatically" val

data SettingsJavascriptCanOpenWindowsAutomaticallyPropertyInfo
instance AttrInfo SettingsJavascriptCanOpenWindowsAutomaticallyPropertyInfo where
    type AttrAllowedOps SettingsJavascriptCanOpenWindowsAutomaticallyPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsJavascriptCanOpenWindowsAutomaticallyPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsJavascriptCanOpenWindowsAutomaticallyPropertyInfo = SettingsK
    type AttrGetType SettingsJavascriptCanOpenWindowsAutomaticallyPropertyInfo = Bool
    type AttrLabel SettingsJavascriptCanOpenWindowsAutomaticallyPropertyInfo = "Settings::javascript-can-open-windows-automatically"
    attrGet _ = getSettingsJavascriptCanOpenWindowsAutomatically
    attrSet _ = setSettingsJavascriptCanOpenWindowsAutomatically
    attrConstruct _ = constructSettingsJavascriptCanOpenWindowsAutomatically

-- VVV Prop "load-icons-ignoring-image-load-setting"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsLoadIconsIgnoringImageLoadSetting :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsLoadIconsIgnoringImageLoadSetting obj = liftIO $ getObjectPropertyBool obj "load-icons-ignoring-image-load-setting"

setSettingsLoadIconsIgnoringImageLoadSetting :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsLoadIconsIgnoringImageLoadSetting obj val = liftIO $ setObjectPropertyBool obj "load-icons-ignoring-image-load-setting" val

constructSettingsLoadIconsIgnoringImageLoadSetting :: Bool -> IO ([Char], GValue)
constructSettingsLoadIconsIgnoringImageLoadSetting val = constructObjectPropertyBool "load-icons-ignoring-image-load-setting" val

data SettingsLoadIconsIgnoringImageLoadSettingPropertyInfo
instance AttrInfo SettingsLoadIconsIgnoringImageLoadSettingPropertyInfo where
    type AttrAllowedOps SettingsLoadIconsIgnoringImageLoadSettingPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsLoadIconsIgnoringImageLoadSettingPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsLoadIconsIgnoringImageLoadSettingPropertyInfo = SettingsK
    type AttrGetType SettingsLoadIconsIgnoringImageLoadSettingPropertyInfo = Bool
    type AttrLabel SettingsLoadIconsIgnoringImageLoadSettingPropertyInfo = "Settings::load-icons-ignoring-image-load-setting"
    attrGet _ = getSettingsLoadIconsIgnoringImageLoadSetting
    attrSet _ = setSettingsLoadIconsIgnoringImageLoadSetting
    attrConstruct _ = constructSettingsLoadIconsIgnoringImageLoadSetting

-- VVV Prop "media-playback-allows-inline"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsMediaPlaybackAllowsInline :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsMediaPlaybackAllowsInline obj = liftIO $ getObjectPropertyBool obj "media-playback-allows-inline"

setSettingsMediaPlaybackAllowsInline :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsMediaPlaybackAllowsInline obj val = liftIO $ setObjectPropertyBool obj "media-playback-allows-inline" val

constructSettingsMediaPlaybackAllowsInline :: Bool -> IO ([Char], GValue)
constructSettingsMediaPlaybackAllowsInline val = constructObjectPropertyBool "media-playback-allows-inline" val

data SettingsMediaPlaybackAllowsInlinePropertyInfo
instance AttrInfo SettingsMediaPlaybackAllowsInlinePropertyInfo where
    type AttrAllowedOps SettingsMediaPlaybackAllowsInlinePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsMediaPlaybackAllowsInlinePropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsMediaPlaybackAllowsInlinePropertyInfo = SettingsK
    type AttrGetType SettingsMediaPlaybackAllowsInlinePropertyInfo = Bool
    type AttrLabel SettingsMediaPlaybackAllowsInlinePropertyInfo = "Settings::media-playback-allows-inline"
    attrGet _ = getSettingsMediaPlaybackAllowsInline
    attrSet _ = setSettingsMediaPlaybackAllowsInline
    attrConstruct _ = constructSettingsMediaPlaybackAllowsInline

-- VVV Prop "media-playback-requires-user-gesture"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsMediaPlaybackRequiresUserGesture :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsMediaPlaybackRequiresUserGesture obj = liftIO $ getObjectPropertyBool obj "media-playback-requires-user-gesture"

setSettingsMediaPlaybackRequiresUserGesture :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsMediaPlaybackRequiresUserGesture obj val = liftIO $ setObjectPropertyBool obj "media-playback-requires-user-gesture" val

constructSettingsMediaPlaybackRequiresUserGesture :: Bool -> IO ([Char], GValue)
constructSettingsMediaPlaybackRequiresUserGesture val = constructObjectPropertyBool "media-playback-requires-user-gesture" val

data SettingsMediaPlaybackRequiresUserGesturePropertyInfo
instance AttrInfo SettingsMediaPlaybackRequiresUserGesturePropertyInfo where
    type AttrAllowedOps SettingsMediaPlaybackRequiresUserGesturePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsMediaPlaybackRequiresUserGesturePropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsMediaPlaybackRequiresUserGesturePropertyInfo = SettingsK
    type AttrGetType SettingsMediaPlaybackRequiresUserGesturePropertyInfo = Bool
    type AttrLabel SettingsMediaPlaybackRequiresUserGesturePropertyInfo = "Settings::media-playback-requires-user-gesture"
    attrGet _ = getSettingsMediaPlaybackRequiresUserGesture
    attrSet _ = setSettingsMediaPlaybackRequiresUserGesture
    attrConstruct _ = constructSettingsMediaPlaybackRequiresUserGesture

-- VVV Prop "minimum-font-size"
   -- Type: TBasicType TUInt32
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsMinimumFontSize :: (MonadIO m, SettingsK o) => o -> m Word32
getSettingsMinimumFontSize obj = liftIO $ getObjectPropertyCUInt obj "minimum-font-size"

setSettingsMinimumFontSize :: (MonadIO m, SettingsK o) => o -> Word32 -> m ()
setSettingsMinimumFontSize obj val = liftIO $ setObjectPropertyCUInt obj "minimum-font-size" val

constructSettingsMinimumFontSize :: Word32 -> IO ([Char], GValue)
constructSettingsMinimumFontSize val = constructObjectPropertyCUInt "minimum-font-size" val

data SettingsMinimumFontSizePropertyInfo
instance AttrInfo SettingsMinimumFontSizePropertyInfo where
    type AttrAllowedOps SettingsMinimumFontSizePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsMinimumFontSizePropertyInfo = (~) Word32
    type AttrBaseTypeConstraint SettingsMinimumFontSizePropertyInfo = SettingsK
    type AttrGetType SettingsMinimumFontSizePropertyInfo = Word32
    type AttrLabel SettingsMinimumFontSizePropertyInfo = "Settings::minimum-font-size"
    attrGet _ = getSettingsMinimumFontSize
    attrSet _ = setSettingsMinimumFontSize
    attrConstruct _ = constructSettingsMinimumFontSize

-- VVV Prop "monospace-font-family"
   -- Type: TBasicType TUTF8
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsMonospaceFontFamily :: (MonadIO m, SettingsK o) => o -> m T.Text
getSettingsMonospaceFontFamily obj = liftIO $ getObjectPropertyString obj "monospace-font-family"

setSettingsMonospaceFontFamily :: (MonadIO m, SettingsK o) => o -> T.Text -> m ()
setSettingsMonospaceFontFamily obj val = liftIO $ setObjectPropertyString obj "monospace-font-family" val

constructSettingsMonospaceFontFamily :: T.Text -> IO ([Char], GValue)
constructSettingsMonospaceFontFamily val = constructObjectPropertyString "monospace-font-family" val

data SettingsMonospaceFontFamilyPropertyInfo
instance AttrInfo SettingsMonospaceFontFamilyPropertyInfo where
    type AttrAllowedOps SettingsMonospaceFontFamilyPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsMonospaceFontFamilyPropertyInfo = (~) T.Text
    type AttrBaseTypeConstraint SettingsMonospaceFontFamilyPropertyInfo = SettingsK
    type AttrGetType SettingsMonospaceFontFamilyPropertyInfo = T.Text
    type AttrLabel SettingsMonospaceFontFamilyPropertyInfo = "Settings::monospace-font-family"
    attrGet _ = getSettingsMonospaceFontFamily
    attrSet _ = setSettingsMonospaceFontFamily
    attrConstruct _ = constructSettingsMonospaceFontFamily

-- VVV Prop "pictograph-font-family"
   -- Type: TBasicType TUTF8
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsPictographFontFamily :: (MonadIO m, SettingsK o) => o -> m T.Text
getSettingsPictographFontFamily obj = liftIO $ getObjectPropertyString obj "pictograph-font-family"

setSettingsPictographFontFamily :: (MonadIO m, SettingsK o) => o -> T.Text -> m ()
setSettingsPictographFontFamily obj val = liftIO $ setObjectPropertyString obj "pictograph-font-family" val

constructSettingsPictographFontFamily :: T.Text -> IO ([Char], GValue)
constructSettingsPictographFontFamily val = constructObjectPropertyString "pictograph-font-family" val

data SettingsPictographFontFamilyPropertyInfo
instance AttrInfo SettingsPictographFontFamilyPropertyInfo where
    type AttrAllowedOps SettingsPictographFontFamilyPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsPictographFontFamilyPropertyInfo = (~) T.Text
    type AttrBaseTypeConstraint SettingsPictographFontFamilyPropertyInfo = SettingsK
    type AttrGetType SettingsPictographFontFamilyPropertyInfo = T.Text
    type AttrLabel SettingsPictographFontFamilyPropertyInfo = "Settings::pictograph-font-family"
    attrGet _ = getSettingsPictographFontFamily
    attrSet _ = setSettingsPictographFontFamily
    attrConstruct _ = constructSettingsPictographFontFamily

-- VVV Prop "print-backgrounds"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsPrintBackgrounds :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsPrintBackgrounds obj = liftIO $ getObjectPropertyBool obj "print-backgrounds"

setSettingsPrintBackgrounds :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsPrintBackgrounds obj val = liftIO $ setObjectPropertyBool obj "print-backgrounds" val

constructSettingsPrintBackgrounds :: Bool -> IO ([Char], GValue)
constructSettingsPrintBackgrounds val = constructObjectPropertyBool "print-backgrounds" val

data SettingsPrintBackgroundsPropertyInfo
instance AttrInfo SettingsPrintBackgroundsPropertyInfo where
    type AttrAllowedOps SettingsPrintBackgroundsPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsPrintBackgroundsPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsPrintBackgroundsPropertyInfo = SettingsK
    type AttrGetType SettingsPrintBackgroundsPropertyInfo = Bool
    type AttrLabel SettingsPrintBackgroundsPropertyInfo = "Settings::print-backgrounds"
    attrGet _ = getSettingsPrintBackgrounds
    attrSet _ = setSettingsPrintBackgrounds
    attrConstruct _ = constructSettingsPrintBackgrounds

-- VVV Prop "sans-serif-font-family"
   -- Type: TBasicType TUTF8
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsSansSerifFontFamily :: (MonadIO m, SettingsK o) => o -> m T.Text
getSettingsSansSerifFontFamily obj = liftIO $ getObjectPropertyString obj "sans-serif-font-family"

setSettingsSansSerifFontFamily :: (MonadIO m, SettingsK o) => o -> T.Text -> m ()
setSettingsSansSerifFontFamily obj val = liftIO $ setObjectPropertyString obj "sans-serif-font-family" val

constructSettingsSansSerifFontFamily :: T.Text -> IO ([Char], GValue)
constructSettingsSansSerifFontFamily val = constructObjectPropertyString "sans-serif-font-family" val

data SettingsSansSerifFontFamilyPropertyInfo
instance AttrInfo SettingsSansSerifFontFamilyPropertyInfo where
    type AttrAllowedOps SettingsSansSerifFontFamilyPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsSansSerifFontFamilyPropertyInfo = (~) T.Text
    type AttrBaseTypeConstraint SettingsSansSerifFontFamilyPropertyInfo = SettingsK
    type AttrGetType SettingsSansSerifFontFamilyPropertyInfo = T.Text
    type AttrLabel SettingsSansSerifFontFamilyPropertyInfo = "Settings::sans-serif-font-family"
    attrGet _ = getSettingsSansSerifFontFamily
    attrSet _ = setSettingsSansSerifFontFamily
    attrConstruct _ = constructSettingsSansSerifFontFamily

-- VVV Prop "serif-font-family"
   -- Type: TBasicType TUTF8
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsSerifFontFamily :: (MonadIO m, SettingsK o) => o -> m T.Text
getSettingsSerifFontFamily obj = liftIO $ getObjectPropertyString obj "serif-font-family"

setSettingsSerifFontFamily :: (MonadIO m, SettingsK o) => o -> T.Text -> m ()
setSettingsSerifFontFamily obj val = liftIO $ setObjectPropertyString obj "serif-font-family" val

constructSettingsSerifFontFamily :: T.Text -> IO ([Char], GValue)
constructSettingsSerifFontFamily val = constructObjectPropertyString "serif-font-family" val

data SettingsSerifFontFamilyPropertyInfo
instance AttrInfo SettingsSerifFontFamilyPropertyInfo where
    type AttrAllowedOps SettingsSerifFontFamilyPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsSerifFontFamilyPropertyInfo = (~) T.Text
    type AttrBaseTypeConstraint SettingsSerifFontFamilyPropertyInfo = SettingsK
    type AttrGetType SettingsSerifFontFamilyPropertyInfo = T.Text
    type AttrLabel SettingsSerifFontFamilyPropertyInfo = "Settings::serif-font-family"
    attrGet _ = getSettingsSerifFontFamily
    attrSet _ = setSettingsSerifFontFamily
    attrConstruct _ = constructSettingsSerifFontFamily

-- VVV Prop "user-agent"
   -- Type: TBasicType TUTF8
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsUserAgent :: (MonadIO m, SettingsK o) => o -> m T.Text
getSettingsUserAgent obj = liftIO $ getObjectPropertyString obj "user-agent"

setSettingsUserAgent :: (MonadIO m, SettingsK o) => o -> T.Text -> m ()
setSettingsUserAgent obj val = liftIO $ setObjectPropertyString obj "user-agent" val

constructSettingsUserAgent :: T.Text -> IO ([Char], GValue)
constructSettingsUserAgent val = constructObjectPropertyString "user-agent" val

data SettingsUserAgentPropertyInfo
instance AttrInfo SettingsUserAgentPropertyInfo where
    type AttrAllowedOps SettingsUserAgentPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsUserAgentPropertyInfo = (~) T.Text
    type AttrBaseTypeConstraint SettingsUserAgentPropertyInfo = SettingsK
    type AttrGetType SettingsUserAgentPropertyInfo = T.Text
    type AttrLabel SettingsUserAgentPropertyInfo = "Settings::user-agent"
    attrGet _ = getSettingsUserAgent
    attrSet _ = setSettingsUserAgent
    attrConstruct _ = constructSettingsUserAgent

-- VVV Prop "zoom-text-only"
   -- Type: TBasicType TBoolean
   -- Flags: [PropertyReadable,PropertyWritable,PropertyConstruct]

getSettingsZoomTextOnly :: (MonadIO m, SettingsK o) => o -> m Bool
getSettingsZoomTextOnly obj = liftIO $ getObjectPropertyBool obj "zoom-text-only"

setSettingsZoomTextOnly :: (MonadIO m, SettingsK o) => o -> Bool -> m ()
setSettingsZoomTextOnly obj val = liftIO $ setObjectPropertyBool obj "zoom-text-only" val

constructSettingsZoomTextOnly :: Bool -> IO ([Char], GValue)
constructSettingsZoomTextOnly val = constructObjectPropertyBool "zoom-text-only" val

data SettingsZoomTextOnlyPropertyInfo
instance AttrInfo SettingsZoomTextOnlyPropertyInfo where
    type AttrAllowedOps SettingsZoomTextOnlyPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrSetTypeConstraint SettingsZoomTextOnlyPropertyInfo = (~) Bool
    type AttrBaseTypeConstraint SettingsZoomTextOnlyPropertyInfo = SettingsK
    type AttrGetType SettingsZoomTextOnlyPropertyInfo = Bool
    type AttrLabel SettingsZoomTextOnlyPropertyInfo = "Settings::zoom-text-only"
    attrGet _ = getSettingsZoomTextOnly
    attrSet _ = setSettingsZoomTextOnly
    attrConstruct _ = constructSettingsZoomTextOnly

type instance AttributeList Settings = SettingsAttributeList
type SettingsAttributeList = ('[ '("allow-file-access-from-file-urls", SettingsAllowFileAccessFromFileUrlsPropertyInfo), '("allow-modal-dialogs", SettingsAllowModalDialogsPropertyInfo), '("auto-load-images", SettingsAutoLoadImagesPropertyInfo), '("cursive-font-family", SettingsCursiveFontFamilyPropertyInfo), '("default-charset", SettingsDefaultCharsetPropertyInfo), '("default-font-family", SettingsDefaultFontFamilyPropertyInfo), '("default-font-size", SettingsDefaultFontSizePropertyInfo), '("default-monospace-font-size", SettingsDefaultMonospaceFontSizePropertyInfo), '("draw-compositing-indicators", SettingsDrawCompositingIndicatorsPropertyInfo), '("enable-accelerated-2d-canvas", SettingsEnableAccelerated2dCanvasPropertyInfo), '("enable-caret-browsing", SettingsEnableCaretBrowsingPropertyInfo), '("enable-developer-extras", SettingsEnableDeveloperExtrasPropertyInfo), '("enable-dns-prefetching", SettingsEnableDnsPrefetchingPropertyInfo), '("enable-frame-flattening", SettingsEnableFrameFlatteningPropertyInfo), '("enable-fullscreen", SettingsEnableFullscreenPropertyInfo), '("enable-html5-database", SettingsEnableHtml5DatabasePropertyInfo), '("enable-html5-local-storage", SettingsEnableHtml5LocalStoragePropertyInfo), '("enable-hyperlink-auditing", SettingsEnableHyperlinkAuditingPropertyInfo), '("enable-java", SettingsEnableJavaPropertyInfo), '("enable-javascript", SettingsEnableJavascriptPropertyInfo), '("enable-media-stream", SettingsEnableMediaStreamPropertyInfo), '("enable-mediasource", SettingsEnableMediasourcePropertyInfo), '("enable-offline-web-application-cache", SettingsEnableOfflineWebApplicationCachePropertyInfo), '("enable-page-cache", SettingsEnablePageCachePropertyInfo), '("enable-plugins", SettingsEnablePluginsPropertyInfo), '("enable-private-browsing", SettingsEnablePrivateBrowsingPropertyInfo), '("enable-resizable-text-areas", SettingsEnableResizableTextAreasPropertyInfo), '("enable-site-specific-quirks", SettingsEnableSiteSpecificQuirksPropertyInfo), '("enable-smooth-scrolling", SettingsEnableSmoothScrollingPropertyInfo), '("enable-spatial-navigation", SettingsEnableSpatialNavigationPropertyInfo), '("enable-tabs-to-links", SettingsEnableTabsToLinksPropertyInfo), '("enable-webaudio", SettingsEnableWebaudioPropertyInfo), '("enable-webgl", SettingsEnableWebglPropertyInfo), '("enable-write-console-messages-to-stdout", SettingsEnableWriteConsoleMessagesToStdoutPropertyInfo), '("enable-xss-auditor", SettingsEnableXssAuditorPropertyInfo), '("fantasy-font-family", SettingsFantasyFontFamilyPropertyInfo), '("javascript-can-access-clipboard", SettingsJavascriptCanAccessClipboardPropertyInfo), '("javascript-can-open-windows-automatically", SettingsJavascriptCanOpenWindowsAutomaticallyPropertyInfo), '("load-icons-ignoring-image-load-setting", SettingsLoadIconsIgnoringImageLoadSettingPropertyInfo), '("media-playback-allows-inline", SettingsMediaPlaybackAllowsInlinePropertyInfo), '("media-playback-requires-user-gesture", SettingsMediaPlaybackRequiresUserGesturePropertyInfo), '("minimum-font-size", SettingsMinimumFontSizePropertyInfo), '("monospace-font-family", SettingsMonospaceFontFamilyPropertyInfo), '("pictograph-font-family", SettingsPictographFontFamilyPropertyInfo), '("print-backgrounds", SettingsPrintBackgroundsPropertyInfo), '("sans-serif-font-family", SettingsSansSerifFontFamilyPropertyInfo), '("serif-font-family", SettingsSerifFontFamilyPropertyInfo), '("user-agent", SettingsUserAgentPropertyInfo), '("zoom-text-only", SettingsZoomTextOnlyPropertyInfo)] :: [(Symbol, *)])

type instance SignalList Settings = SettingsSignalList
type SettingsSignalList = ('[ '("notify", GObject.ObjectNotifySignalInfo), '("notify::[property]", GObjectNotifySignalInfo)] :: [(Symbol, *)])

-- method Settings::new
-- method type : Constructor
-- Args : []
-- Lengths : []
-- hInArgs : []
-- returnType : TInterface "WebKit2" "Settings"
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_new" webkit_settings_new :: 
    IO (Ptr Settings)


settingsNew ::
    (MonadIO m) =>
    m Settings
settingsNew  = liftIO $ do
    result <- webkit_settings_new
    checkUnexpectedReturnNULL "webkit_settings_new" result
    result' <- (wrapObject Settings) result
    return result'

-- method Settings::get_allow_file_access_from_file_urls
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_allow_file_access_from_file_urls" webkit_settings_get_allow_file_access_from_file_urls :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetAllowFileAccessFromFileUrls ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetAllowFileAccessFromFileUrls _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_allow_file_access_from_file_urls _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_allow_modal_dialogs
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_allow_modal_dialogs" webkit_settings_get_allow_modal_dialogs :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetAllowModalDialogs ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetAllowModalDialogs _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_allow_modal_dialogs _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_auto_load_images
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_auto_load_images" webkit_settings_get_auto_load_images :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetAutoLoadImages ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetAutoLoadImages _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_auto_load_images _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_cursive_font_family
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TUTF8
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_cursive_font_family" webkit_settings_get_cursive_font_family :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CString


settingsGetCursiveFontFamily ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m T.Text
settingsGetCursiveFontFamily _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_cursive_font_family _obj'
    checkUnexpectedReturnNULL "webkit_settings_get_cursive_font_family" result
    result' <- cstringToText result
    touchManagedPtr _obj
    return result'

-- method Settings::get_default_charset
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TUTF8
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_default_charset" webkit_settings_get_default_charset :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CString


settingsGetDefaultCharset ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m T.Text
settingsGetDefaultCharset _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_default_charset _obj'
    checkUnexpectedReturnNULL "webkit_settings_get_default_charset" result
    result' <- cstringToText result
    touchManagedPtr _obj
    return result'

-- method Settings::get_default_font_family
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TUTF8
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_default_font_family" webkit_settings_get_default_font_family :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CString


settingsGetDefaultFontFamily ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m T.Text
settingsGetDefaultFontFamily _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_default_font_family _obj'
    checkUnexpectedReturnNULL "webkit_settings_get_default_font_family" result
    result' <- cstringToText result
    touchManagedPtr _obj
    return result'

-- method Settings::get_default_font_size
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TUInt32
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_default_font_size" webkit_settings_get_default_font_size :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO Word32


settingsGetDefaultFontSize ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Word32
settingsGetDefaultFontSize _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_default_font_size _obj'
    touchManagedPtr _obj
    return result

-- method Settings::get_default_monospace_font_size
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TUInt32
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_default_monospace_font_size" webkit_settings_get_default_monospace_font_size :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO Word32


settingsGetDefaultMonospaceFontSize ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Word32
settingsGetDefaultMonospaceFontSize _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_default_monospace_font_size _obj'
    touchManagedPtr _obj
    return result

-- method Settings::get_draw_compositing_indicators
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_draw_compositing_indicators" webkit_settings_get_draw_compositing_indicators :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetDrawCompositingIndicators ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetDrawCompositingIndicators _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_draw_compositing_indicators _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_accelerated_2d_canvas
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_accelerated_2d_canvas" webkit_settings_get_enable_accelerated_2d_canvas :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableAccelerated2dCanvas ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableAccelerated2dCanvas _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_accelerated_2d_canvas _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_caret_browsing
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_caret_browsing" webkit_settings_get_enable_caret_browsing :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableCaretBrowsing ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableCaretBrowsing _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_caret_browsing _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_developer_extras
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_developer_extras" webkit_settings_get_enable_developer_extras :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableDeveloperExtras ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableDeveloperExtras _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_developer_extras _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_dns_prefetching
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_dns_prefetching" webkit_settings_get_enable_dns_prefetching :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableDnsPrefetching ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableDnsPrefetching _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_dns_prefetching _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_frame_flattening
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_frame_flattening" webkit_settings_get_enable_frame_flattening :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableFrameFlattening ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableFrameFlattening _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_frame_flattening _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_fullscreen
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_fullscreen" webkit_settings_get_enable_fullscreen :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableFullscreen ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableFullscreen _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_fullscreen _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_html5_database
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_html5_database" webkit_settings_get_enable_html5_database :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableHtml5Database ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableHtml5Database _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_html5_database _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_html5_local_storage
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_html5_local_storage" webkit_settings_get_enable_html5_local_storage :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableHtml5LocalStorage ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableHtml5LocalStorage _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_html5_local_storage _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_hyperlink_auditing
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_hyperlink_auditing" webkit_settings_get_enable_hyperlink_auditing :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableHyperlinkAuditing ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableHyperlinkAuditing _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_hyperlink_auditing _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_java
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_java" webkit_settings_get_enable_java :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableJava ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableJava _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_java _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_javascript
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_javascript" webkit_settings_get_enable_javascript :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableJavascript ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableJavascript _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_javascript _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_media_stream
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_media_stream" webkit_settings_get_enable_media_stream :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableMediaStream ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableMediaStream _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_media_stream _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_mediasource
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_mediasource" webkit_settings_get_enable_mediasource :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableMediasource ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableMediasource _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_mediasource _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_offline_web_application_cache
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_offline_web_application_cache" webkit_settings_get_enable_offline_web_application_cache :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableOfflineWebApplicationCache ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableOfflineWebApplicationCache _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_offline_web_application_cache _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_page_cache
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_page_cache" webkit_settings_get_enable_page_cache :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnablePageCache ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnablePageCache _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_page_cache _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_plugins
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_plugins" webkit_settings_get_enable_plugins :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnablePlugins ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnablePlugins _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_plugins _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_private_browsing
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_private_browsing" webkit_settings_get_enable_private_browsing :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnablePrivateBrowsing ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnablePrivateBrowsing _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_private_browsing _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_resizable_text_areas
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_resizable_text_areas" webkit_settings_get_enable_resizable_text_areas :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableResizableTextAreas ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableResizableTextAreas _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_resizable_text_areas _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_site_specific_quirks
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_site_specific_quirks" webkit_settings_get_enable_site_specific_quirks :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableSiteSpecificQuirks ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableSiteSpecificQuirks _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_site_specific_quirks _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_smooth_scrolling
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_smooth_scrolling" webkit_settings_get_enable_smooth_scrolling :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableSmoothScrolling ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableSmoothScrolling _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_smooth_scrolling _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_spatial_navigation
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_spatial_navigation" webkit_settings_get_enable_spatial_navigation :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableSpatialNavigation ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableSpatialNavigation _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_spatial_navigation _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_tabs_to_links
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_tabs_to_links" webkit_settings_get_enable_tabs_to_links :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableTabsToLinks ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableTabsToLinks _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_tabs_to_links _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_webaudio
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_webaudio" webkit_settings_get_enable_webaudio :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableWebaudio ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableWebaudio _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_webaudio _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_webgl
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_webgl" webkit_settings_get_enable_webgl :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableWebgl ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableWebgl _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_webgl _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_write_console_messages_to_stdout
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_write_console_messages_to_stdout" webkit_settings_get_enable_write_console_messages_to_stdout :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableWriteConsoleMessagesToStdout ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableWriteConsoleMessagesToStdout _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_write_console_messages_to_stdout _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_enable_xss_auditor
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_enable_xss_auditor" webkit_settings_get_enable_xss_auditor :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetEnableXssAuditor ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetEnableXssAuditor _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_enable_xss_auditor _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_fantasy_font_family
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TUTF8
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_fantasy_font_family" webkit_settings_get_fantasy_font_family :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CString


settingsGetFantasyFontFamily ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m T.Text
settingsGetFantasyFontFamily _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_fantasy_font_family _obj'
    checkUnexpectedReturnNULL "webkit_settings_get_fantasy_font_family" result
    result' <- cstringToText result
    touchManagedPtr _obj
    return result'

-- method Settings::get_javascript_can_access_clipboard
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_javascript_can_access_clipboard" webkit_settings_get_javascript_can_access_clipboard :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetJavascriptCanAccessClipboard ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetJavascriptCanAccessClipboard _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_javascript_can_access_clipboard _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_javascript_can_open_windows_automatically
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_javascript_can_open_windows_automatically" webkit_settings_get_javascript_can_open_windows_automatically :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetJavascriptCanOpenWindowsAutomatically ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetJavascriptCanOpenWindowsAutomatically _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_javascript_can_open_windows_automatically _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_load_icons_ignoring_image_load_setting
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_load_icons_ignoring_image_load_setting" webkit_settings_get_load_icons_ignoring_image_load_setting :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetLoadIconsIgnoringImageLoadSetting ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetLoadIconsIgnoringImageLoadSetting _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_load_icons_ignoring_image_load_setting _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_media_playback_allows_inline
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_media_playback_allows_inline" webkit_settings_get_media_playback_allows_inline :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetMediaPlaybackAllowsInline ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetMediaPlaybackAllowsInline _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_media_playback_allows_inline _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_media_playback_requires_user_gesture
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_media_playback_requires_user_gesture" webkit_settings_get_media_playback_requires_user_gesture :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetMediaPlaybackRequiresUserGesture ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetMediaPlaybackRequiresUserGesture _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_media_playback_requires_user_gesture _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_minimum_font_size
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TUInt32
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_minimum_font_size" webkit_settings_get_minimum_font_size :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO Word32


settingsGetMinimumFontSize ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Word32
settingsGetMinimumFontSize _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_minimum_font_size _obj'
    touchManagedPtr _obj
    return result

-- method Settings::get_monospace_font_family
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TUTF8
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_monospace_font_family" webkit_settings_get_monospace_font_family :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CString


settingsGetMonospaceFontFamily ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m T.Text
settingsGetMonospaceFontFamily _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_monospace_font_family _obj'
    checkUnexpectedReturnNULL "webkit_settings_get_monospace_font_family" result
    result' <- cstringToText result
    touchManagedPtr _obj
    return result'

-- method Settings::get_pictograph_font_family
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TUTF8
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_pictograph_font_family" webkit_settings_get_pictograph_font_family :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CString


settingsGetPictographFontFamily ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m T.Text
settingsGetPictographFontFamily _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_pictograph_font_family _obj'
    checkUnexpectedReturnNULL "webkit_settings_get_pictograph_font_family" result
    result' <- cstringToText result
    touchManagedPtr _obj
    return result'

-- method Settings::get_print_backgrounds
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_print_backgrounds" webkit_settings_get_print_backgrounds :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetPrintBackgrounds ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetPrintBackgrounds _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_print_backgrounds _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::get_sans_serif_font_family
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TUTF8
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_sans_serif_font_family" webkit_settings_get_sans_serif_font_family :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CString


settingsGetSansSerifFontFamily ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m T.Text
settingsGetSansSerifFontFamily _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_sans_serif_font_family _obj'
    checkUnexpectedReturnNULL "webkit_settings_get_sans_serif_font_family" result
    result' <- cstringToText result
    touchManagedPtr _obj
    return result'

-- method Settings::get_serif_font_family
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TUTF8
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_serif_font_family" webkit_settings_get_serif_font_family :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CString


settingsGetSerifFontFamily ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m T.Text
settingsGetSerifFontFamily _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_serif_font_family _obj'
    checkUnexpectedReturnNULL "webkit_settings_get_serif_font_family" result
    result' <- cstringToText result
    touchManagedPtr _obj
    return result'

-- method Settings::get_user_agent
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TUTF8
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_user_agent" webkit_settings_get_user_agent :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CString


settingsGetUserAgent ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m T.Text
settingsGetUserAgent _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_user_agent _obj'
    checkUnexpectedReturnNULL "webkit_settings_get_user_agent" result
    result' <- cstringToText result
    touchManagedPtr _obj
    return result'

-- method Settings::get_zoom_text_only
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TBoolean
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_get_zoom_text_only" webkit_settings_get_zoom_text_only :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    IO CInt


settingsGetZoomTextOnly ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    m Bool
settingsGetZoomTextOnly _obj = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    result <- webkit_settings_get_zoom_text_only _obj'
    let result' = (/= 0) result
    touchManagedPtr _obj
    return result'

-- method Settings::set_allow_file_access_from_file_urls
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "allowed", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "allowed", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_allow_file_access_from_file_urls" webkit_settings_set_allow_file_access_from_file_urls :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- allowed : TBasicType TBoolean
    IO ()


settingsSetAllowFileAccessFromFileUrls ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- allowed
    m ()
settingsSetAllowFileAccessFromFileUrls _obj allowed = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let allowed' = (fromIntegral . fromEnum) allowed
    webkit_settings_set_allow_file_access_from_file_urls _obj' allowed'
    touchManagedPtr _obj
    return ()

-- method Settings::set_allow_modal_dialogs
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "allowed", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "allowed", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_allow_modal_dialogs" webkit_settings_set_allow_modal_dialogs :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- allowed : TBasicType TBoolean
    IO ()


settingsSetAllowModalDialogs ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- allowed
    m ()
settingsSetAllowModalDialogs _obj allowed = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let allowed' = (fromIntegral . fromEnum) allowed
    webkit_settings_set_allow_modal_dialogs _obj' allowed'
    touchManagedPtr _obj
    return ()

-- method Settings::set_auto_load_images
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_auto_load_images" webkit_settings_set_auto_load_images :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetAutoLoadImages ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetAutoLoadImages _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_auto_load_images _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_cursive_font_family
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "cursive_font_family", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "cursive_font_family", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_cursive_font_family" webkit_settings_set_cursive_font_family :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CString ->                              -- cursive_font_family : TBasicType TUTF8
    IO ()


settingsSetCursiveFontFamily ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    T.Text ->                               -- cursive_font_family
    m ()
settingsSetCursiveFontFamily _obj cursive_font_family = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    cursive_font_family' <- textToCString cursive_font_family
    webkit_settings_set_cursive_font_family _obj' cursive_font_family'
    touchManagedPtr _obj
    freeMem cursive_font_family'
    return ()

-- method Settings::set_default_charset
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "default_charset", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "default_charset", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_default_charset" webkit_settings_set_default_charset :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CString ->                              -- default_charset : TBasicType TUTF8
    IO ()


settingsSetDefaultCharset ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    T.Text ->                               -- default_charset
    m ()
settingsSetDefaultCharset _obj default_charset = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    default_charset' <- textToCString default_charset
    webkit_settings_set_default_charset _obj' default_charset'
    touchManagedPtr _obj
    freeMem default_charset'
    return ()

-- method Settings::set_default_font_family
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "default_font_family", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "default_font_family", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_default_font_family" webkit_settings_set_default_font_family :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CString ->                              -- default_font_family : TBasicType TUTF8
    IO ()


settingsSetDefaultFontFamily ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    T.Text ->                               -- default_font_family
    m ()
settingsSetDefaultFontFamily _obj default_font_family = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    default_font_family' <- textToCString default_font_family
    webkit_settings_set_default_font_family _obj' default_font_family'
    touchManagedPtr _obj
    freeMem default_font_family'
    return ()

-- method Settings::set_default_font_size
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "font_size", argType = TBasicType TUInt32, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "font_size", argType = TBasicType TUInt32, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_default_font_size" webkit_settings_set_default_font_size :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    Word32 ->                               -- font_size : TBasicType TUInt32
    IO ()


settingsSetDefaultFontSize ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Word32 ->                               -- font_size
    m ()
settingsSetDefaultFontSize _obj font_size = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    webkit_settings_set_default_font_size _obj' font_size
    touchManagedPtr _obj
    return ()

-- method Settings::set_default_monospace_font_size
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "font_size", argType = TBasicType TUInt32, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "font_size", argType = TBasicType TUInt32, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_default_monospace_font_size" webkit_settings_set_default_monospace_font_size :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    Word32 ->                               -- font_size : TBasicType TUInt32
    IO ()


settingsSetDefaultMonospaceFontSize ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Word32 ->                               -- font_size
    m ()
settingsSetDefaultMonospaceFontSize _obj font_size = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    webkit_settings_set_default_monospace_font_size _obj' font_size
    touchManagedPtr _obj
    return ()

-- method Settings::set_draw_compositing_indicators
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_draw_compositing_indicators" webkit_settings_set_draw_compositing_indicators :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetDrawCompositingIndicators ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetDrawCompositingIndicators _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_draw_compositing_indicators _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_accelerated_2d_canvas
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_accelerated_2d_canvas" webkit_settings_set_enable_accelerated_2d_canvas :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableAccelerated2dCanvas ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableAccelerated2dCanvas _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_accelerated_2d_canvas _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_caret_browsing
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_caret_browsing" webkit_settings_set_enable_caret_browsing :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableCaretBrowsing ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableCaretBrowsing _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_caret_browsing _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_developer_extras
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_developer_extras" webkit_settings_set_enable_developer_extras :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableDeveloperExtras ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableDeveloperExtras _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_developer_extras _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_dns_prefetching
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_dns_prefetching" webkit_settings_set_enable_dns_prefetching :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableDnsPrefetching ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableDnsPrefetching _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_dns_prefetching _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_frame_flattening
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_frame_flattening" webkit_settings_set_enable_frame_flattening :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableFrameFlattening ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableFrameFlattening _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_frame_flattening _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_fullscreen
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_fullscreen" webkit_settings_set_enable_fullscreen :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableFullscreen ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableFullscreen _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_fullscreen _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_html5_database
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_html5_database" webkit_settings_set_enable_html5_database :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableHtml5Database ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableHtml5Database _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_html5_database _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_html5_local_storage
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_html5_local_storage" webkit_settings_set_enable_html5_local_storage :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableHtml5LocalStorage ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableHtml5LocalStorage _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_html5_local_storage _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_hyperlink_auditing
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_hyperlink_auditing" webkit_settings_set_enable_hyperlink_auditing :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableHyperlinkAuditing ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableHyperlinkAuditing _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_hyperlink_auditing _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_java
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_java" webkit_settings_set_enable_java :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableJava ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableJava _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_java _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_javascript
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_javascript" webkit_settings_set_enable_javascript :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableJavascript ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableJavascript _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_javascript _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_media_stream
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_media_stream" webkit_settings_set_enable_media_stream :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableMediaStream ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableMediaStream _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_media_stream _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_mediasource
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_mediasource" webkit_settings_set_enable_mediasource :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableMediasource ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableMediasource _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_mediasource _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_offline_web_application_cache
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_offline_web_application_cache" webkit_settings_set_enable_offline_web_application_cache :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableOfflineWebApplicationCache ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableOfflineWebApplicationCache _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_offline_web_application_cache _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_page_cache
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_page_cache" webkit_settings_set_enable_page_cache :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnablePageCache ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnablePageCache _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_page_cache _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_plugins
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_plugins" webkit_settings_set_enable_plugins :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnablePlugins ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnablePlugins _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_plugins _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_private_browsing
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_private_browsing" webkit_settings_set_enable_private_browsing :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnablePrivateBrowsing ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnablePrivateBrowsing _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_private_browsing _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_resizable_text_areas
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_resizable_text_areas" webkit_settings_set_enable_resizable_text_areas :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableResizableTextAreas ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableResizableTextAreas _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_resizable_text_areas _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_site_specific_quirks
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_site_specific_quirks" webkit_settings_set_enable_site_specific_quirks :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableSiteSpecificQuirks ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableSiteSpecificQuirks _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_site_specific_quirks _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_smooth_scrolling
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_smooth_scrolling" webkit_settings_set_enable_smooth_scrolling :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableSmoothScrolling ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableSmoothScrolling _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_smooth_scrolling _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_spatial_navigation
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_spatial_navigation" webkit_settings_set_enable_spatial_navigation :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableSpatialNavigation ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableSpatialNavigation _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_spatial_navigation _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_tabs_to_links
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_tabs_to_links" webkit_settings_set_enable_tabs_to_links :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableTabsToLinks ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableTabsToLinks _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_tabs_to_links _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_webaudio
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_webaudio" webkit_settings_set_enable_webaudio :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableWebaudio ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableWebaudio _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_webaudio _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_webgl
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_webgl" webkit_settings_set_enable_webgl :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableWebgl ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableWebgl _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_webgl _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_write_console_messages_to_stdout
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_write_console_messages_to_stdout" webkit_settings_set_enable_write_console_messages_to_stdout :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableWriteConsoleMessagesToStdout ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableWriteConsoleMessagesToStdout _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_write_console_messages_to_stdout _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_enable_xss_auditor
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_enable_xss_auditor" webkit_settings_set_enable_xss_auditor :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetEnableXssAuditor ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetEnableXssAuditor _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_enable_xss_auditor _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_fantasy_font_family
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "fantasy_font_family", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "fantasy_font_family", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_fantasy_font_family" webkit_settings_set_fantasy_font_family :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CString ->                              -- fantasy_font_family : TBasicType TUTF8
    IO ()


settingsSetFantasyFontFamily ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    T.Text ->                               -- fantasy_font_family
    m ()
settingsSetFantasyFontFamily _obj fantasy_font_family = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    fantasy_font_family' <- textToCString fantasy_font_family
    webkit_settings_set_fantasy_font_family _obj' fantasy_font_family'
    touchManagedPtr _obj
    freeMem fantasy_font_family'
    return ()

-- method Settings::set_javascript_can_access_clipboard
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_javascript_can_access_clipboard" webkit_settings_set_javascript_can_access_clipboard :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetJavascriptCanAccessClipboard ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetJavascriptCanAccessClipboard _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_javascript_can_access_clipboard _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_javascript_can_open_windows_automatically
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_javascript_can_open_windows_automatically" webkit_settings_set_javascript_can_open_windows_automatically :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetJavascriptCanOpenWindowsAutomatically ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetJavascriptCanOpenWindowsAutomatically _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_javascript_can_open_windows_automatically _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_load_icons_ignoring_image_load_setting
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_load_icons_ignoring_image_load_setting" webkit_settings_set_load_icons_ignoring_image_load_setting :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetLoadIconsIgnoringImageLoadSetting ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetLoadIconsIgnoringImageLoadSetting _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_load_icons_ignoring_image_load_setting _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_media_playback_allows_inline
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_media_playback_allows_inline" webkit_settings_set_media_playback_allows_inline :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetMediaPlaybackAllowsInline ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetMediaPlaybackAllowsInline _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_media_playback_allows_inline _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_media_playback_requires_user_gesture
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "enabled", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_media_playback_requires_user_gesture" webkit_settings_set_media_playback_requires_user_gesture :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- enabled : TBasicType TBoolean
    IO ()


settingsSetMediaPlaybackRequiresUserGesture ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- enabled
    m ()
settingsSetMediaPlaybackRequiresUserGesture _obj enabled = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let enabled' = (fromIntegral . fromEnum) enabled
    webkit_settings_set_media_playback_requires_user_gesture _obj' enabled'
    touchManagedPtr _obj
    return ()

-- method Settings::set_minimum_font_size
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "font_size", argType = TBasicType TUInt32, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "font_size", argType = TBasicType TUInt32, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_minimum_font_size" webkit_settings_set_minimum_font_size :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    Word32 ->                               -- font_size : TBasicType TUInt32
    IO ()


settingsSetMinimumFontSize ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Word32 ->                               -- font_size
    m ()
settingsSetMinimumFontSize _obj font_size = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    webkit_settings_set_minimum_font_size _obj' font_size
    touchManagedPtr _obj
    return ()

-- method Settings::set_monospace_font_family
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "monospace_font_family", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "monospace_font_family", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_monospace_font_family" webkit_settings_set_monospace_font_family :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CString ->                              -- monospace_font_family : TBasicType TUTF8
    IO ()


settingsSetMonospaceFontFamily ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    T.Text ->                               -- monospace_font_family
    m ()
settingsSetMonospaceFontFamily _obj monospace_font_family = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    monospace_font_family' <- textToCString monospace_font_family
    webkit_settings_set_monospace_font_family _obj' monospace_font_family'
    touchManagedPtr _obj
    freeMem monospace_font_family'
    return ()

-- method Settings::set_pictograph_font_family
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "pictograph_font_family", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "pictograph_font_family", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_pictograph_font_family" webkit_settings_set_pictograph_font_family :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CString ->                              -- pictograph_font_family : TBasicType TUTF8
    IO ()


settingsSetPictographFontFamily ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    T.Text ->                               -- pictograph_font_family
    m ()
settingsSetPictographFontFamily _obj pictograph_font_family = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    pictograph_font_family' <- textToCString pictograph_font_family
    webkit_settings_set_pictograph_font_family _obj' pictograph_font_family'
    touchManagedPtr _obj
    freeMem pictograph_font_family'
    return ()

-- method Settings::set_print_backgrounds
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "print_backgrounds", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "print_backgrounds", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_print_backgrounds" webkit_settings_set_print_backgrounds :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- print_backgrounds : TBasicType TBoolean
    IO ()


settingsSetPrintBackgrounds ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- print_backgrounds
    m ()
settingsSetPrintBackgrounds _obj print_backgrounds = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let print_backgrounds' = (fromIntegral . fromEnum) print_backgrounds
    webkit_settings_set_print_backgrounds _obj' print_backgrounds'
    touchManagedPtr _obj
    return ()

-- method Settings::set_sans_serif_font_family
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "sans_serif_font_family", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "sans_serif_font_family", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_sans_serif_font_family" webkit_settings_set_sans_serif_font_family :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CString ->                              -- sans_serif_font_family : TBasicType TUTF8
    IO ()


settingsSetSansSerifFontFamily ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    T.Text ->                               -- sans_serif_font_family
    m ()
settingsSetSansSerifFontFamily _obj sans_serif_font_family = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    sans_serif_font_family' <- textToCString sans_serif_font_family
    webkit_settings_set_sans_serif_font_family _obj' sans_serif_font_family'
    touchManagedPtr _obj
    freeMem sans_serif_font_family'
    return ()

-- method Settings::set_serif_font_family
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "serif_font_family", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "serif_font_family", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_serif_font_family" webkit_settings_set_serif_font_family :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CString ->                              -- serif_font_family : TBasicType TUTF8
    IO ()


settingsSetSerifFontFamily ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    T.Text ->                               -- serif_font_family
    m ()
settingsSetSerifFontFamily _obj serif_font_family = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    serif_font_family' <- textToCString serif_font_family
    webkit_settings_set_serif_font_family _obj' serif_font_family'
    touchManagedPtr _obj
    freeMem serif_font_family'
    return ()

-- method Settings::set_user_agent
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "user_agent", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = True, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "user_agent", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = True, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_user_agent" webkit_settings_set_user_agent :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CString ->                              -- user_agent : TBasicType TUTF8
    IO ()


settingsSetUserAgent ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Maybe (T.Text) ->                       -- user_agent
    m ()
settingsSetUserAgent _obj user_agent = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    maybeUser_agent <- case user_agent of
        Nothing -> return nullPtr
        Just jUser_agent -> do
            jUser_agent' <- textToCString jUser_agent
            return jUser_agent'
    webkit_settings_set_user_agent _obj' maybeUser_agent
    touchManagedPtr _obj
    freeMem maybeUser_agent
    return ()

-- method Settings::set_user_agent_with_application_details
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "application_name", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = True, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "application_version", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = True, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "application_name", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = True, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "application_version", argType = TBasicType TUTF8, direction = DirectionIn, mayBeNull = True, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_user_agent_with_application_details" webkit_settings_set_user_agent_with_application_details :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CString ->                              -- application_name : TBasicType TUTF8
    CString ->                              -- application_version : TBasicType TUTF8
    IO ()


settingsSetUserAgentWithApplicationDetails ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Maybe (T.Text) ->                       -- application_name
    Maybe (T.Text) ->                       -- application_version
    m ()
settingsSetUserAgentWithApplicationDetails _obj application_name application_version = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    maybeApplication_name <- case application_name of
        Nothing -> return nullPtr
        Just jApplication_name -> do
            jApplication_name' <- textToCString jApplication_name
            return jApplication_name'
    maybeApplication_version <- case application_version of
        Nothing -> return nullPtr
        Just jApplication_version -> do
            jApplication_version' <- textToCString jApplication_version
            return jApplication_version'
    webkit_settings_set_user_agent_with_application_details _obj' maybeApplication_name maybeApplication_version
    touchManagedPtr _obj
    freeMem maybeApplication_name
    freeMem maybeApplication_version
    return ()

-- method Settings::set_zoom_text_only
-- method type : OrdinaryMethod
-- Args : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "zoom_text_only", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- Lengths : []
-- hInArgs : [Arg {argName = "_obj", argType = TInterface "WebKit2" "Settings", direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing},Arg {argName = "zoom_text_only", argType = TBasicType TBoolean, direction = DirectionIn, mayBeNull = False, argScope = ScopeTypeInvalid, argClosure = -1, argDestroy = -1, transfer = TransferNothing}]
-- returnType : TBasicType TVoid
-- throws : False
-- Skip return : False

foreign import ccall "webkit_settings_set_zoom_text_only" webkit_settings_set_zoom_text_only :: 
    Ptr Settings ->                         -- _obj : TInterface "WebKit2" "Settings"
    CInt ->                                 -- zoom_text_only : TBasicType TBoolean
    IO ()


settingsSetZoomTextOnly ::
    (MonadIO m, SettingsK a) =>
    a ->                                    -- _obj
    Bool ->                                 -- zoom_text_only
    m ()
settingsSetZoomTextOnly _obj zoom_text_only = liftIO $ do
    let _obj' = unsafeManagedPtrCastPtr _obj
    let zoom_text_only' = (fromIntegral . fromEnum) zoom_text_only
    webkit_settings_set_zoom_text_only _obj' zoom_text_only'
    touchManagedPtr _obj
    return ()