{-# LANGUAGE TypeApplications #-}


-- | Copyright  : Will Thompson and Iñaki García Etxebarria
-- License    : LGPL-2.1
-- Maintainer : Iñaki García Etxebarria
-- 
-- Controls security settings in a t'GI.WebKit2.Objects.WebContext.WebContext'.
-- 
-- The t'GI.WebKit2.Objects.SecurityManager.SecurityManager' defines security settings for URI
-- schemes in a t'GI.WebKit2.Objects.WebContext.WebContext'. Get it from the context with
-- 'GI.WebKit2.Objects.WebContext.webContextGetSecurityManager', and use it to register a
-- URI scheme with a certain security level, or to check if it already
-- has it.

#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif

module GI.WebKit2.Objects.SecurityManager
    ( 

-- * Exported types
    SecurityManager(..)                     ,
    IsSecurityManager                       ,
    toSecurityManager                       ,


 -- * Methods
-- | 
-- 
--  === __Click to display all available methods, including inherited ones__
-- ==== Methods
-- [bindProperty]("GI.GObject.Objects.Object#g:method:bindProperty"), [bindPropertyFull]("GI.GObject.Objects.Object#g:method:bindPropertyFull"), [forceFloating]("GI.GObject.Objects.Object#g:method:forceFloating"), [freezeNotify]("GI.GObject.Objects.Object#g:method:freezeNotify"), [getv]("GI.GObject.Objects.Object#g:method:getv"), [isFloating]("GI.GObject.Objects.Object#g:method:isFloating"), [notify]("GI.GObject.Objects.Object#g:method:notify"), [notifyByPspec]("GI.GObject.Objects.Object#g:method:notifyByPspec"), [ref]("GI.GObject.Objects.Object#g:method:ref"), [refSink]("GI.GObject.Objects.Object#g:method:refSink"), [registerUriSchemeAsCorsEnabled]("GI.WebKit2.Objects.SecurityManager#g:method:registerUriSchemeAsCorsEnabled"), [registerUriSchemeAsDisplayIsolated]("GI.WebKit2.Objects.SecurityManager#g:method:registerUriSchemeAsDisplayIsolated"), [registerUriSchemeAsEmptyDocument]("GI.WebKit2.Objects.SecurityManager#g:method:registerUriSchemeAsEmptyDocument"), [registerUriSchemeAsLocal]("GI.WebKit2.Objects.SecurityManager#g:method:registerUriSchemeAsLocal"), [registerUriSchemeAsNoAccess]("GI.WebKit2.Objects.SecurityManager#g:method:registerUriSchemeAsNoAccess"), [registerUriSchemeAsSecure]("GI.WebKit2.Objects.SecurityManager#g:method:registerUriSchemeAsSecure"), [runDispose]("GI.GObject.Objects.Object#g:method:runDispose"), [stealData]("GI.GObject.Objects.Object#g:method:stealData"), [stealQdata]("GI.GObject.Objects.Object#g:method:stealQdata"), [thawNotify]("GI.GObject.Objects.Object#g:method:thawNotify"), [unref]("GI.GObject.Objects.Object#g:method:unref"), [uriSchemeIsCorsEnabled]("GI.WebKit2.Objects.SecurityManager#g:method:uriSchemeIsCorsEnabled"), [uriSchemeIsDisplayIsolated]("GI.WebKit2.Objects.SecurityManager#g:method:uriSchemeIsDisplayIsolated"), [uriSchemeIsEmptyDocument]("GI.WebKit2.Objects.SecurityManager#g:method:uriSchemeIsEmptyDocument"), [uriSchemeIsLocal]("GI.WebKit2.Objects.SecurityManager#g:method:uriSchemeIsLocal"), [uriSchemeIsNoAccess]("GI.WebKit2.Objects.SecurityManager#g:method:uriSchemeIsNoAccess"), [uriSchemeIsSecure]("GI.WebKit2.Objects.SecurityManager#g:method:uriSchemeIsSecure"), [watchClosure]("GI.GObject.Objects.Object#g:method:watchClosure").
-- 
-- ==== Getters
-- [getData]("GI.GObject.Objects.Object#g:method:getData"), [getProperty]("GI.GObject.Objects.Object#g:method:getProperty"), [getQdata]("GI.GObject.Objects.Object#g:method:getQdata").
-- 
-- ==== Setters
-- [setData]("GI.GObject.Objects.Object#g:method:setData"), [setDataFull]("GI.GObject.Objects.Object#g:method:setDataFull"), [setProperty]("GI.GObject.Objects.Object#g:method:setProperty").

#if defined(ENABLE_OVERLOADING)
    ResolveSecurityManagerMethod            ,
#endif

-- ** registerUriSchemeAsCorsEnabled #method:registerUriSchemeAsCorsEnabled#

#if defined(ENABLE_OVERLOADING)
    SecurityManagerRegisterUriSchemeAsCorsEnabledMethodInfo,
#endif
    securityManagerRegisterUriSchemeAsCorsEnabled,


-- ** registerUriSchemeAsDisplayIsolated #method:registerUriSchemeAsDisplayIsolated#

#if defined(ENABLE_OVERLOADING)
    SecurityManagerRegisterUriSchemeAsDisplayIsolatedMethodInfo,
#endif
    securityManagerRegisterUriSchemeAsDisplayIsolated,


-- ** registerUriSchemeAsEmptyDocument #method:registerUriSchemeAsEmptyDocument#

#if defined(ENABLE_OVERLOADING)
    SecurityManagerRegisterUriSchemeAsEmptyDocumentMethodInfo,
#endif
    securityManagerRegisterUriSchemeAsEmptyDocument,


-- ** registerUriSchemeAsLocal #method:registerUriSchemeAsLocal#

#if defined(ENABLE_OVERLOADING)
    SecurityManagerRegisterUriSchemeAsLocalMethodInfo,
#endif
    securityManagerRegisterUriSchemeAsLocal ,


-- ** registerUriSchemeAsNoAccess #method:registerUriSchemeAsNoAccess#

#if defined(ENABLE_OVERLOADING)
    SecurityManagerRegisterUriSchemeAsNoAccessMethodInfo,
#endif
    securityManagerRegisterUriSchemeAsNoAccess,


-- ** registerUriSchemeAsSecure #method:registerUriSchemeAsSecure#

#if defined(ENABLE_OVERLOADING)
    SecurityManagerRegisterUriSchemeAsSecureMethodInfo,
#endif
    securityManagerRegisterUriSchemeAsSecure,


-- ** uriSchemeIsCorsEnabled #method:uriSchemeIsCorsEnabled#

#if defined(ENABLE_OVERLOADING)
    SecurityManagerUriSchemeIsCorsEnabledMethodInfo,
#endif
    securityManagerUriSchemeIsCorsEnabled   ,


-- ** uriSchemeIsDisplayIsolated #method:uriSchemeIsDisplayIsolated#

#if defined(ENABLE_OVERLOADING)
    SecurityManagerUriSchemeIsDisplayIsolatedMethodInfo,
#endif
    securityManagerUriSchemeIsDisplayIsolated,


-- ** uriSchemeIsEmptyDocument #method:uriSchemeIsEmptyDocument#

#if defined(ENABLE_OVERLOADING)
    SecurityManagerUriSchemeIsEmptyDocumentMethodInfo,
#endif
    securityManagerUriSchemeIsEmptyDocument ,


-- ** uriSchemeIsLocal #method:uriSchemeIsLocal#

#if defined(ENABLE_OVERLOADING)
    SecurityManagerUriSchemeIsLocalMethodInfo,
#endif
    securityManagerUriSchemeIsLocal         ,


-- ** uriSchemeIsNoAccess #method:uriSchemeIsNoAccess#

#if defined(ENABLE_OVERLOADING)
    SecurityManagerUriSchemeIsNoAccessMethodInfo,
#endif
    securityManagerUriSchemeIsNoAccess      ,


-- ** uriSchemeIsSecure #method:uriSchemeIsSecure#

#if defined(ENABLE_OVERLOADING)
    SecurityManagerUriSchemeIsSecureMethodInfo,
#endif
    securityManagerUriSchemeIsSecure        ,




    ) where

import Data.GI.Base.ShortPrelude
import qualified Data.GI.Base.ShortPrelude as SP
import qualified Data.GI.Base.Overloading as O
import qualified Prelude as P

import qualified Data.GI.Base.Attributes as GI.Attributes
import qualified Data.GI.Base.BasicTypes as B.Types
import qualified Data.GI.Base.ManagedPtr as B.ManagedPtr
import qualified Data.GI.Base.GArray as B.GArray
import qualified Data.GI.Base.GClosure as B.GClosure
import qualified Data.GI.Base.GError as B.GError
import qualified Data.GI.Base.GHashTable as B.GHT
import qualified Data.GI.Base.GVariant as B.GVariant
import qualified Data.GI.Base.GValue as B.GValue
import qualified Data.GI.Base.GParamSpec as B.GParamSpec
import qualified Data.GI.Base.CallStack as B.CallStack
import qualified Data.GI.Base.Properties as B.Properties
import qualified Data.GI.Base.Signals as B.Signals
import qualified Control.Monad.IO.Class as MIO
import qualified Data.Coerce as Coerce
import qualified Data.Text as T
import qualified Data.ByteString.Char8 as B
import qualified Data.Map as Map
import qualified Foreign.Ptr as FP
import qualified GHC.OverloadedLabels as OL
import qualified GHC.Records as R

import qualified GI.GObject.Objects.Object as GObject.Object

-- | Memory-managed wrapper type.
newtype SecurityManager = SecurityManager (SP.ManagedPtr SecurityManager)
    deriving (SecurityManager -> SecurityManager -> Bool
(SecurityManager -> SecurityManager -> Bool)
-> (SecurityManager -> SecurityManager -> Bool)
-> Eq SecurityManager
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SecurityManager -> SecurityManager -> Bool
== :: SecurityManager -> SecurityManager -> Bool
$c/= :: SecurityManager -> SecurityManager -> Bool
/= :: SecurityManager -> SecurityManager -> Bool
Eq)

instance SP.ManagedPtrNewtype SecurityManager where
    toManagedPtr :: SecurityManager -> ManagedPtr SecurityManager
toManagedPtr (SecurityManager ManagedPtr SecurityManager
p) = ManagedPtr SecurityManager
p

foreign import ccall "webkit_security_manager_get_type"
    c_webkit_security_manager_get_type :: IO B.Types.GType

instance B.Types.TypedObject SecurityManager where
    glibType :: IO GType
glibType = IO GType
c_webkit_security_manager_get_type

instance B.Types.GObject SecurityManager

-- | Type class for types which can be safely cast to `SecurityManager`, for instance with `toSecurityManager`.
class (SP.GObject o, O.IsDescendantOf SecurityManager o) => IsSecurityManager o
instance (SP.GObject o, O.IsDescendantOf SecurityManager o) => IsSecurityManager o

instance O.HasParentTypes SecurityManager
type instance O.ParentTypes SecurityManager = '[GObject.Object.Object]

-- | Cast to `SecurityManager`, for types for which this is known to be safe. For general casts, use `Data.GI.Base.ManagedPtr.castTo`.
toSecurityManager :: (MIO.MonadIO m, IsSecurityManager o) => o -> m SecurityManager
toSecurityManager :: forall (m :: * -> *) o.
(MonadIO m, IsSecurityManager o) =>
o -> m SecurityManager
toSecurityManager = IO SecurityManager -> m SecurityManager
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO SecurityManager -> m SecurityManager)
-> (o -> IO SecurityManager) -> o -> m SecurityManager
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ManagedPtr SecurityManager -> SecurityManager)
-> o -> IO SecurityManager
forall o o'.
(HasCallStack, ManagedPtrNewtype o, TypedObject o,
 ManagedPtrNewtype o', TypedObject o') =>
(ManagedPtr o' -> o') -> o -> IO o'
B.ManagedPtr.unsafeCastTo ManagedPtr SecurityManager -> SecurityManager
SecurityManager

-- | Convert 'SecurityManager' to and from 'Data.GI.Base.GValue.GValue'. See 'Data.GI.Base.GValue.toGValue' and 'Data.GI.Base.GValue.fromGValue'.
instance B.GValue.IsGValue (Maybe SecurityManager) where
    gvalueGType_ :: IO GType
gvalueGType_ = IO GType
c_webkit_security_manager_get_type
    gvalueSet_ :: Ptr GValue -> Maybe SecurityManager -> IO ()
gvalueSet_ Ptr GValue
gv Maybe SecurityManager
P.Nothing = Ptr GValue -> Ptr SecurityManager -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv (Ptr SecurityManager
forall a. Ptr a
FP.nullPtr :: FP.Ptr SecurityManager)
    gvalueSet_ Ptr GValue
gv (P.Just SecurityManager
obj) = SecurityManager -> (Ptr SecurityManager -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
B.ManagedPtr.withManagedPtr SecurityManager
obj (Ptr GValue -> Ptr SecurityManager -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv)
    gvalueGet_ :: Ptr GValue -> IO (Maybe SecurityManager)
gvalueGet_ Ptr GValue
gv = do
        Ptr SecurityManager
ptr <- Ptr GValue -> IO (Ptr SecurityManager)
forall a. GObject a => Ptr GValue -> IO (Ptr a)
B.GValue.get_object Ptr GValue
gv :: IO (FP.Ptr SecurityManager)
        if Ptr SecurityManager
ptr Ptr SecurityManager -> Ptr SecurityManager -> Bool
forall a. Eq a => a -> a -> Bool
/= Ptr SecurityManager
forall a. Ptr a
FP.nullPtr
        then SecurityManager -> Maybe SecurityManager
forall a. a -> Maybe a
P.Just (SecurityManager -> Maybe SecurityManager)
-> IO SecurityManager -> IO (Maybe SecurityManager)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (ManagedPtr SecurityManager -> SecurityManager)
-> Ptr SecurityManager -> IO SecurityManager
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
B.ManagedPtr.newObject ManagedPtr SecurityManager -> SecurityManager
SecurityManager Ptr SecurityManager
ptr
        else Maybe SecurityManager -> IO (Maybe SecurityManager)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe SecurityManager
forall a. Maybe a
P.Nothing
        
    

#if defined(ENABLE_OVERLOADING)
type family ResolveSecurityManagerMethod (t :: Symbol) (o :: *) :: * where
    ResolveSecurityManagerMethod "bindProperty" o = GObject.Object.ObjectBindPropertyMethodInfo
    ResolveSecurityManagerMethod "bindPropertyFull" o = GObject.Object.ObjectBindPropertyFullMethodInfo
    ResolveSecurityManagerMethod "forceFloating" o = GObject.Object.ObjectForceFloatingMethodInfo
    ResolveSecurityManagerMethod "freezeNotify" o = GObject.Object.ObjectFreezeNotifyMethodInfo
    ResolveSecurityManagerMethod "getv" o = GObject.Object.ObjectGetvMethodInfo
    ResolveSecurityManagerMethod "isFloating" o = GObject.Object.ObjectIsFloatingMethodInfo
    ResolveSecurityManagerMethod "notify" o = GObject.Object.ObjectNotifyMethodInfo
    ResolveSecurityManagerMethod "notifyByPspec" o = GObject.Object.ObjectNotifyByPspecMethodInfo
    ResolveSecurityManagerMethod "ref" o = GObject.Object.ObjectRefMethodInfo
    ResolveSecurityManagerMethod "refSink" o = GObject.Object.ObjectRefSinkMethodInfo
    ResolveSecurityManagerMethod "registerUriSchemeAsCorsEnabled" o = SecurityManagerRegisterUriSchemeAsCorsEnabledMethodInfo
    ResolveSecurityManagerMethod "registerUriSchemeAsDisplayIsolated" o = SecurityManagerRegisterUriSchemeAsDisplayIsolatedMethodInfo
    ResolveSecurityManagerMethod "registerUriSchemeAsEmptyDocument" o = SecurityManagerRegisterUriSchemeAsEmptyDocumentMethodInfo
    ResolveSecurityManagerMethod "registerUriSchemeAsLocal" o = SecurityManagerRegisterUriSchemeAsLocalMethodInfo
    ResolveSecurityManagerMethod "registerUriSchemeAsNoAccess" o = SecurityManagerRegisterUriSchemeAsNoAccessMethodInfo
    ResolveSecurityManagerMethod "registerUriSchemeAsSecure" o = SecurityManagerRegisterUriSchemeAsSecureMethodInfo
    ResolveSecurityManagerMethod "runDispose" o = GObject.Object.ObjectRunDisposeMethodInfo
    ResolveSecurityManagerMethod "stealData" o = GObject.Object.ObjectStealDataMethodInfo
    ResolveSecurityManagerMethod "stealQdata" o = GObject.Object.ObjectStealQdataMethodInfo
    ResolveSecurityManagerMethod "thawNotify" o = GObject.Object.ObjectThawNotifyMethodInfo
    ResolveSecurityManagerMethod "unref" o = GObject.Object.ObjectUnrefMethodInfo
    ResolveSecurityManagerMethod "uriSchemeIsCorsEnabled" o = SecurityManagerUriSchemeIsCorsEnabledMethodInfo
    ResolveSecurityManagerMethod "uriSchemeIsDisplayIsolated" o = SecurityManagerUriSchemeIsDisplayIsolatedMethodInfo
    ResolveSecurityManagerMethod "uriSchemeIsEmptyDocument" o = SecurityManagerUriSchemeIsEmptyDocumentMethodInfo
    ResolveSecurityManagerMethod "uriSchemeIsLocal" o = SecurityManagerUriSchemeIsLocalMethodInfo
    ResolveSecurityManagerMethod "uriSchemeIsNoAccess" o = SecurityManagerUriSchemeIsNoAccessMethodInfo
    ResolveSecurityManagerMethod "uriSchemeIsSecure" o = SecurityManagerUriSchemeIsSecureMethodInfo
    ResolveSecurityManagerMethod "watchClosure" o = GObject.Object.ObjectWatchClosureMethodInfo
    ResolveSecurityManagerMethod "getData" o = GObject.Object.ObjectGetDataMethodInfo
    ResolveSecurityManagerMethod "getProperty" o = GObject.Object.ObjectGetPropertyMethodInfo
    ResolveSecurityManagerMethod "getQdata" o = GObject.Object.ObjectGetQdataMethodInfo
    ResolveSecurityManagerMethod "setData" o = GObject.Object.ObjectSetDataMethodInfo
    ResolveSecurityManagerMethod "setDataFull" o = GObject.Object.ObjectSetDataFullMethodInfo
    ResolveSecurityManagerMethod "setProperty" o = GObject.Object.ObjectSetPropertyMethodInfo
    ResolveSecurityManagerMethod l o = O.MethodResolutionFailed l o

instance (info ~ ResolveSecurityManagerMethod t SecurityManager, O.OverloadedMethod info SecurityManager p) => OL.IsLabel t (SecurityManager -> p) where
#if MIN_VERSION_base(4,10,0)
    fromLabel = O.overloadedMethod @info
#else
    fromLabel _ = O.overloadedMethod @info
#endif

#if MIN_VERSION_base(4,13,0)
instance (info ~ ResolveSecurityManagerMethod t SecurityManager, O.OverloadedMethod info SecurityManager p, R.HasField t SecurityManager p) => R.HasField t SecurityManager p where
    getField = O.overloadedMethod @info

#endif

instance (info ~ ResolveSecurityManagerMethod t SecurityManager, O.OverloadedMethodInfo info SecurityManager) => OL.IsLabel t (O.MethodProxy info SecurityManager) where
#if MIN_VERSION_base(4,10,0)
    fromLabel = O.MethodProxy
#else
    fromLabel _ = O.MethodProxy
#endif

#endif

#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList SecurityManager
type instance O.AttributeList SecurityManager = SecurityManagerAttributeList
type SecurityManagerAttributeList = ('[ ] :: [(Symbol, *)])
#endif

#if defined(ENABLE_OVERLOADING)
#endif

#if defined(ENABLE_OVERLOADING)
type instance O.SignalList SecurityManager = SecurityManagerSignalList
type SecurityManagerSignalList = ('[ '("notify", GObject.Object.ObjectNotifySignalInfo)] :: [(Symbol, *)])

#endif

-- method SecurityManager::register_uri_scheme_as_cors_enabled
-- method type : OrdinaryMethod
-- Args: [ Arg
--           { argCName = "security_manager"
--           , argType =
--               TInterface
--                 Name { namespace = "WebKit2" , name = "SecurityManager" }
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a #WebKitSecurityManager"
--                 , sinceVersion = Nothing
--                 }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       , Arg
--           { argCName = "scheme"
--           , argType = TBasicType TUTF8
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a URI scheme" , sinceVersion = Nothing }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       ]
-- Lengths: []
-- returnType: Nothing
-- throws : False
-- Skip return : False

foreign import ccall "webkit_security_manager_register_uri_scheme_as_cors_enabled" webkit_security_manager_register_uri_scheme_as_cors_enabled :: 
    Ptr SecurityManager ->                  -- security_manager : TInterface (Name {namespace = "WebKit2", name = "SecurityManager"})
    CString ->                              -- scheme : TBasicType TUTF8
    IO ()

-- | Register /@scheme@/ as a CORS (Cross-origin resource sharing) enabled scheme.
-- 
-- This means that CORS requests are allowed. See W3C CORS specification
-- http:\/\/www.w3.org\/TR\/cors\/.
securityManagerRegisterUriSchemeAsCorsEnabled ::
    (B.CallStack.HasCallStack, MonadIO m, IsSecurityManager a) =>
    a
    -- ^ /@securityManager@/: a t'GI.WebKit2.Objects.SecurityManager.SecurityManager'
    -> T.Text
    -- ^ /@scheme@/: a URI scheme
    -> m ()
securityManagerRegisterUriSchemeAsCorsEnabled :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSecurityManager a) =>
a -> Text -> m ()
securityManagerRegisterUriSchemeAsCorsEnabled a
securityManager Text
scheme = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
    Ptr SecurityManager
securityManager' <- a -> IO (Ptr SecurityManager)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
securityManager
    CString
scheme' <- Text -> IO CString
textToCString Text
scheme
    Ptr SecurityManager -> CString -> IO ()
webkit_security_manager_register_uri_scheme_as_cors_enabled Ptr SecurityManager
securityManager' CString
scheme'
    a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
securityManager
    CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
scheme'
    () -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()

#if defined(ENABLE_OVERLOADING)
data SecurityManagerRegisterUriSchemeAsCorsEnabledMethodInfo
instance (signature ~ (T.Text -> m ()), MonadIO m, IsSecurityManager a) => O.OverloadedMethod SecurityManagerRegisterUriSchemeAsCorsEnabledMethodInfo a signature where
    overloadedMethod = securityManagerRegisterUriSchemeAsCorsEnabled

instance O.OverloadedMethodInfo SecurityManagerRegisterUriSchemeAsCorsEnabledMethodInfo a where
    overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.WebKit2.Objects.SecurityManager.securityManagerRegisterUriSchemeAsCorsEnabled",
        O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-webkit2-4.0.29/docs/GI-WebKit2-Objects-SecurityManager.html#v:securityManagerRegisterUriSchemeAsCorsEnabled"
        })


#endif

-- method SecurityManager::register_uri_scheme_as_display_isolated
-- method type : OrdinaryMethod
-- Args: [ Arg
--           { argCName = "security_manager"
--           , argType =
--               TInterface
--                 Name { namespace = "WebKit2" , name = "SecurityManager" }
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a #WebKitSecurityManager"
--                 , sinceVersion = Nothing
--                 }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       , Arg
--           { argCName = "scheme"
--           , argType = TBasicType TUTF8
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a URI scheme" , sinceVersion = Nothing }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       ]
-- Lengths: []
-- returnType: Nothing
-- throws : False
-- Skip return : False

foreign import ccall "webkit_security_manager_register_uri_scheme_as_display_isolated" webkit_security_manager_register_uri_scheme_as_display_isolated :: 
    Ptr SecurityManager ->                  -- security_manager : TInterface (Name {namespace = "WebKit2", name = "SecurityManager"})
    CString ->                              -- scheme : TBasicType TUTF8
    IO ()

-- | Register /@scheme@/ as a display isolated scheme.
-- 
-- This means that pages cannot
-- display these URIs unless they are from the same scheme.
securityManagerRegisterUriSchemeAsDisplayIsolated ::
    (B.CallStack.HasCallStack, MonadIO m, IsSecurityManager a) =>
    a
    -- ^ /@securityManager@/: a t'GI.WebKit2.Objects.SecurityManager.SecurityManager'
    -> T.Text
    -- ^ /@scheme@/: a URI scheme
    -> m ()
securityManagerRegisterUriSchemeAsDisplayIsolated :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSecurityManager a) =>
a -> Text -> m ()
securityManagerRegisterUriSchemeAsDisplayIsolated a
securityManager Text
scheme = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
    Ptr SecurityManager
securityManager' <- a -> IO (Ptr SecurityManager)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
securityManager
    CString
scheme' <- Text -> IO CString
textToCString Text
scheme
    Ptr SecurityManager -> CString -> IO ()
webkit_security_manager_register_uri_scheme_as_display_isolated Ptr SecurityManager
securityManager' CString
scheme'
    a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
securityManager
    CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
scheme'
    () -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()

#if defined(ENABLE_OVERLOADING)
data SecurityManagerRegisterUriSchemeAsDisplayIsolatedMethodInfo
instance (signature ~ (T.Text -> m ()), MonadIO m, IsSecurityManager a) => O.OverloadedMethod SecurityManagerRegisterUriSchemeAsDisplayIsolatedMethodInfo a signature where
    overloadedMethod = securityManagerRegisterUriSchemeAsDisplayIsolated

instance O.OverloadedMethodInfo SecurityManagerRegisterUriSchemeAsDisplayIsolatedMethodInfo a where
    overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.WebKit2.Objects.SecurityManager.securityManagerRegisterUriSchemeAsDisplayIsolated",
        O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-webkit2-4.0.29/docs/GI-WebKit2-Objects-SecurityManager.html#v:securityManagerRegisterUriSchemeAsDisplayIsolated"
        })


#endif

-- method SecurityManager::register_uri_scheme_as_empty_document
-- method type : OrdinaryMethod
-- Args: [ Arg
--           { argCName = "security_manager"
--           , argType =
--               TInterface
--                 Name { namespace = "WebKit2" , name = "SecurityManager" }
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a #WebKitSecurityManager"
--                 , sinceVersion = Nothing
--                 }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       , Arg
--           { argCName = "scheme"
--           , argType = TBasicType TUTF8
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a URI scheme" , sinceVersion = Nothing }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       ]
-- Lengths: []
-- returnType: Nothing
-- throws : False
-- Skip return : False

foreign import ccall "webkit_security_manager_register_uri_scheme_as_empty_document" webkit_security_manager_register_uri_scheme_as_empty_document :: 
    Ptr SecurityManager ->                  -- security_manager : TInterface (Name {namespace = "WebKit2", name = "SecurityManager"})
    CString ->                              -- scheme : TBasicType TUTF8
    IO ()

-- | Register /@scheme@/ as an empty document scheme.
-- 
-- This means that
-- they are allowed to commit synchronously.
securityManagerRegisterUriSchemeAsEmptyDocument ::
    (B.CallStack.HasCallStack, MonadIO m, IsSecurityManager a) =>
    a
    -- ^ /@securityManager@/: a t'GI.WebKit2.Objects.SecurityManager.SecurityManager'
    -> T.Text
    -- ^ /@scheme@/: a URI scheme
    -> m ()
securityManagerRegisterUriSchemeAsEmptyDocument :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSecurityManager a) =>
a -> Text -> m ()
securityManagerRegisterUriSchemeAsEmptyDocument a
securityManager Text
scheme = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
    Ptr SecurityManager
securityManager' <- a -> IO (Ptr SecurityManager)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
securityManager
    CString
scheme' <- Text -> IO CString
textToCString Text
scheme
    Ptr SecurityManager -> CString -> IO ()
webkit_security_manager_register_uri_scheme_as_empty_document Ptr SecurityManager
securityManager' CString
scheme'
    a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
securityManager
    CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
scheme'
    () -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()

#if defined(ENABLE_OVERLOADING)
data SecurityManagerRegisterUriSchemeAsEmptyDocumentMethodInfo
instance (signature ~ (T.Text -> m ()), MonadIO m, IsSecurityManager a) => O.OverloadedMethod SecurityManagerRegisterUriSchemeAsEmptyDocumentMethodInfo a signature where
    overloadedMethod = securityManagerRegisterUriSchemeAsEmptyDocument

instance O.OverloadedMethodInfo SecurityManagerRegisterUriSchemeAsEmptyDocumentMethodInfo a where
    overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.WebKit2.Objects.SecurityManager.securityManagerRegisterUriSchemeAsEmptyDocument",
        O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-webkit2-4.0.29/docs/GI-WebKit2-Objects-SecurityManager.html#v:securityManagerRegisterUriSchemeAsEmptyDocument"
        })


#endif

-- method SecurityManager::register_uri_scheme_as_local
-- method type : OrdinaryMethod
-- Args: [ Arg
--           { argCName = "security_manager"
--           , argType =
--               TInterface
--                 Name { namespace = "WebKit2" , name = "SecurityManager" }
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a #WebKitSecurityManager"
--                 , sinceVersion = Nothing
--                 }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       , Arg
--           { argCName = "scheme"
--           , argType = TBasicType TUTF8
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a URI scheme" , sinceVersion = Nothing }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       ]
-- Lengths: []
-- returnType: Nothing
-- throws : False
-- Skip return : False

foreign import ccall "webkit_security_manager_register_uri_scheme_as_local" webkit_security_manager_register_uri_scheme_as_local :: 
    Ptr SecurityManager ->                  -- security_manager : TInterface (Name {namespace = "WebKit2", name = "SecurityManager"})
    CString ->                              -- scheme : TBasicType TUTF8
    IO ()

-- | Register /@scheme@/ as a local scheme.
-- 
-- This means that other non-local pages
-- cannot link to or access URIs of this scheme.
securityManagerRegisterUriSchemeAsLocal ::
    (B.CallStack.HasCallStack, MonadIO m, IsSecurityManager a) =>
    a
    -- ^ /@securityManager@/: a t'GI.WebKit2.Objects.SecurityManager.SecurityManager'
    -> T.Text
    -- ^ /@scheme@/: a URI scheme
    -> m ()
securityManagerRegisterUriSchemeAsLocal :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSecurityManager a) =>
a -> Text -> m ()
securityManagerRegisterUriSchemeAsLocal a
securityManager Text
scheme = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
    Ptr SecurityManager
securityManager' <- a -> IO (Ptr SecurityManager)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
securityManager
    CString
scheme' <- Text -> IO CString
textToCString Text
scheme
    Ptr SecurityManager -> CString -> IO ()
webkit_security_manager_register_uri_scheme_as_local Ptr SecurityManager
securityManager' CString
scheme'
    a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
securityManager
    CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
scheme'
    () -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()

#if defined(ENABLE_OVERLOADING)
data SecurityManagerRegisterUriSchemeAsLocalMethodInfo
instance (signature ~ (T.Text -> m ()), MonadIO m, IsSecurityManager a) => O.OverloadedMethod SecurityManagerRegisterUriSchemeAsLocalMethodInfo a signature where
    overloadedMethod = securityManagerRegisterUriSchemeAsLocal

instance O.OverloadedMethodInfo SecurityManagerRegisterUriSchemeAsLocalMethodInfo a where
    overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.WebKit2.Objects.SecurityManager.securityManagerRegisterUriSchemeAsLocal",
        O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-webkit2-4.0.29/docs/GI-WebKit2-Objects-SecurityManager.html#v:securityManagerRegisterUriSchemeAsLocal"
        })


#endif

-- method SecurityManager::register_uri_scheme_as_no_access
-- method type : OrdinaryMethod
-- Args: [ Arg
--           { argCName = "security_manager"
--           , argType =
--               TInterface
--                 Name { namespace = "WebKit2" , name = "SecurityManager" }
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a #WebKitSecurityManager"
--                 , sinceVersion = Nothing
--                 }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       , Arg
--           { argCName = "scheme"
--           , argType = TBasicType TUTF8
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a URI scheme" , sinceVersion = Nothing }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       ]
-- Lengths: []
-- returnType: Nothing
-- throws : False
-- Skip return : False

foreign import ccall "webkit_security_manager_register_uri_scheme_as_no_access" webkit_security_manager_register_uri_scheme_as_no_access :: 
    Ptr SecurityManager ->                  -- security_manager : TInterface (Name {namespace = "WebKit2", name = "SecurityManager"})
    CString ->                              -- scheme : TBasicType TUTF8
    IO ()

-- | Register /@scheme@/ as a no-access scheme.
-- 
-- This means that pages loaded
-- with this URI scheme cannot access pages loaded with any other URI scheme.
securityManagerRegisterUriSchemeAsNoAccess ::
    (B.CallStack.HasCallStack, MonadIO m, IsSecurityManager a) =>
    a
    -- ^ /@securityManager@/: a t'GI.WebKit2.Objects.SecurityManager.SecurityManager'
    -> T.Text
    -- ^ /@scheme@/: a URI scheme
    -> m ()
securityManagerRegisterUriSchemeAsNoAccess :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSecurityManager a) =>
a -> Text -> m ()
securityManagerRegisterUriSchemeAsNoAccess a
securityManager Text
scheme = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
    Ptr SecurityManager
securityManager' <- a -> IO (Ptr SecurityManager)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
securityManager
    CString
scheme' <- Text -> IO CString
textToCString Text
scheme
    Ptr SecurityManager -> CString -> IO ()
webkit_security_manager_register_uri_scheme_as_no_access Ptr SecurityManager
securityManager' CString
scheme'
    a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
securityManager
    CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
scheme'
    () -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()

#if defined(ENABLE_OVERLOADING)
data SecurityManagerRegisterUriSchemeAsNoAccessMethodInfo
instance (signature ~ (T.Text -> m ()), MonadIO m, IsSecurityManager a) => O.OverloadedMethod SecurityManagerRegisterUriSchemeAsNoAccessMethodInfo a signature where
    overloadedMethod = securityManagerRegisterUriSchemeAsNoAccess

instance O.OverloadedMethodInfo SecurityManagerRegisterUriSchemeAsNoAccessMethodInfo a where
    overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.WebKit2.Objects.SecurityManager.securityManagerRegisterUriSchemeAsNoAccess",
        O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-webkit2-4.0.29/docs/GI-WebKit2-Objects-SecurityManager.html#v:securityManagerRegisterUriSchemeAsNoAccess"
        })


#endif

-- method SecurityManager::register_uri_scheme_as_secure
-- method type : OrdinaryMethod
-- Args: [ Arg
--           { argCName = "security_manager"
--           , argType =
--               TInterface
--                 Name { namespace = "WebKit2" , name = "SecurityManager" }
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a #WebKitSecurityManager"
--                 , sinceVersion = Nothing
--                 }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       , Arg
--           { argCName = "scheme"
--           , argType = TBasicType TUTF8
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a URI scheme" , sinceVersion = Nothing }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       ]
-- Lengths: []
-- returnType: Nothing
-- throws : False
-- Skip return : False

foreign import ccall "webkit_security_manager_register_uri_scheme_as_secure" webkit_security_manager_register_uri_scheme_as_secure :: 
    Ptr SecurityManager ->                  -- security_manager : TInterface (Name {namespace = "WebKit2", name = "SecurityManager"})
    CString ->                              -- scheme : TBasicType TUTF8
    IO ()

-- | Register /@scheme@/ as a secure scheme.
-- 
-- This means that mixed
-- content warnings won\'t be generated for this scheme when
-- included by an HTTPS page.
securityManagerRegisterUriSchemeAsSecure ::
    (B.CallStack.HasCallStack, MonadIO m, IsSecurityManager a) =>
    a
    -- ^ /@securityManager@/: a t'GI.WebKit2.Objects.SecurityManager.SecurityManager'
    -> T.Text
    -- ^ /@scheme@/: a URI scheme
    -> m ()
securityManagerRegisterUriSchemeAsSecure :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSecurityManager a) =>
a -> Text -> m ()
securityManagerRegisterUriSchemeAsSecure a
securityManager Text
scheme = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
    Ptr SecurityManager
securityManager' <- a -> IO (Ptr SecurityManager)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
securityManager
    CString
scheme' <- Text -> IO CString
textToCString Text
scheme
    Ptr SecurityManager -> CString -> IO ()
webkit_security_manager_register_uri_scheme_as_secure Ptr SecurityManager
securityManager' CString
scheme'
    a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
securityManager
    CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
scheme'
    () -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()

#if defined(ENABLE_OVERLOADING)
data SecurityManagerRegisterUriSchemeAsSecureMethodInfo
instance (signature ~ (T.Text -> m ()), MonadIO m, IsSecurityManager a) => O.OverloadedMethod SecurityManagerRegisterUriSchemeAsSecureMethodInfo a signature where
    overloadedMethod = securityManagerRegisterUriSchemeAsSecure

instance O.OverloadedMethodInfo SecurityManagerRegisterUriSchemeAsSecureMethodInfo a where
    overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.WebKit2.Objects.SecurityManager.securityManagerRegisterUriSchemeAsSecure",
        O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-webkit2-4.0.29/docs/GI-WebKit2-Objects-SecurityManager.html#v:securityManagerRegisterUriSchemeAsSecure"
        })


#endif

-- method SecurityManager::uri_scheme_is_cors_enabled
-- method type : OrdinaryMethod
-- Args: [ Arg
--           { argCName = "security_manager"
--           , argType =
--               TInterface
--                 Name { namespace = "WebKit2" , name = "SecurityManager" }
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a #WebKitSecurityManager"
--                 , sinceVersion = Nothing
--                 }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       , Arg
--           { argCName = "scheme"
--           , argType = TBasicType TUTF8
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a URI scheme" , sinceVersion = Nothing }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       ]
-- Lengths: []
-- returnType: Just (TBasicType TBoolean)
-- throws : False
-- Skip return : False

foreign import ccall "webkit_security_manager_uri_scheme_is_cors_enabled" webkit_security_manager_uri_scheme_is_cors_enabled :: 
    Ptr SecurityManager ->                  -- security_manager : TInterface (Name {namespace = "WebKit2", name = "SecurityManager"})
    CString ->                              -- scheme : TBasicType TUTF8
    IO CInt

-- | Whether /@scheme@/ is considered as a CORS enabled scheme.
-- 
-- See also 'GI.WebKit2.Objects.SecurityManager.securityManagerRegisterUriSchemeAsCorsEnabled'.
securityManagerUriSchemeIsCorsEnabled ::
    (B.CallStack.HasCallStack, MonadIO m, IsSecurityManager a) =>
    a
    -- ^ /@securityManager@/: a t'GI.WebKit2.Objects.SecurityManager.SecurityManager'
    -> T.Text
    -- ^ /@scheme@/: a URI scheme
    -> m Bool
    -- ^ __Returns:__ 'P.True' if /@scheme@/ is a CORS enabled scheme or 'P.False' otherwise.
securityManagerUriSchemeIsCorsEnabled :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSecurityManager a) =>
a -> Text -> m Bool
securityManagerUriSchemeIsCorsEnabled a
securityManager Text
scheme = IO Bool -> m Bool
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Bool -> m Bool) -> IO Bool -> m Bool
forall a b. (a -> b) -> a -> b
$ do
    Ptr SecurityManager
securityManager' <- a -> IO (Ptr SecurityManager)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
securityManager
    CString
scheme' <- Text -> IO CString
textToCString Text
scheme
    CInt
result <- Ptr SecurityManager -> CString -> IO CInt
webkit_security_manager_uri_scheme_is_cors_enabled Ptr SecurityManager
securityManager' CString
scheme'
    let result' :: Bool
result' = (CInt -> CInt -> Bool
forall a. Eq a => a -> a -> Bool
/= CInt
0) CInt
result
    a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
securityManager
    CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
scheme'
    Bool -> IO Bool
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
result'

#if defined(ENABLE_OVERLOADING)
data SecurityManagerUriSchemeIsCorsEnabledMethodInfo
instance (signature ~ (T.Text -> m Bool), MonadIO m, IsSecurityManager a) => O.OverloadedMethod SecurityManagerUriSchemeIsCorsEnabledMethodInfo a signature where
    overloadedMethod = securityManagerUriSchemeIsCorsEnabled

instance O.OverloadedMethodInfo SecurityManagerUriSchemeIsCorsEnabledMethodInfo a where
    overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.WebKit2.Objects.SecurityManager.securityManagerUriSchemeIsCorsEnabled",
        O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-webkit2-4.0.29/docs/GI-WebKit2-Objects-SecurityManager.html#v:securityManagerUriSchemeIsCorsEnabled"
        })


#endif

-- method SecurityManager::uri_scheme_is_display_isolated
-- method type : OrdinaryMethod
-- Args: [ Arg
--           { argCName = "security_manager"
--           , argType =
--               TInterface
--                 Name { namespace = "WebKit2" , name = "SecurityManager" }
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a #WebKitSecurityManager"
--                 , sinceVersion = Nothing
--                 }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       , Arg
--           { argCName = "scheme"
--           , argType = TBasicType TUTF8
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a URI scheme" , sinceVersion = Nothing }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       ]
-- Lengths: []
-- returnType: Just (TBasicType TBoolean)
-- throws : False
-- Skip return : False

foreign import ccall "webkit_security_manager_uri_scheme_is_display_isolated" webkit_security_manager_uri_scheme_is_display_isolated :: 
    Ptr SecurityManager ->                  -- security_manager : TInterface (Name {namespace = "WebKit2", name = "SecurityManager"})
    CString ->                              -- scheme : TBasicType TUTF8
    IO CInt

-- | Whether /@scheme@/ is considered as a display isolated scheme.
-- 
-- See also 'GI.WebKit2.Objects.SecurityManager.securityManagerRegisterUriSchemeAsDisplayIsolated'.
securityManagerUriSchemeIsDisplayIsolated ::
    (B.CallStack.HasCallStack, MonadIO m, IsSecurityManager a) =>
    a
    -- ^ /@securityManager@/: a t'GI.WebKit2.Objects.SecurityManager.SecurityManager'
    -> T.Text
    -- ^ /@scheme@/: a URI scheme
    -> m Bool
    -- ^ __Returns:__ 'P.True' if /@scheme@/ is a display isolated scheme or 'P.False' otherwise.
securityManagerUriSchemeIsDisplayIsolated :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSecurityManager a) =>
a -> Text -> m Bool
securityManagerUriSchemeIsDisplayIsolated a
securityManager Text
scheme = IO Bool -> m Bool
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Bool -> m Bool) -> IO Bool -> m Bool
forall a b. (a -> b) -> a -> b
$ do
    Ptr SecurityManager
securityManager' <- a -> IO (Ptr SecurityManager)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
securityManager
    CString
scheme' <- Text -> IO CString
textToCString Text
scheme
    CInt
result <- Ptr SecurityManager -> CString -> IO CInt
webkit_security_manager_uri_scheme_is_display_isolated Ptr SecurityManager
securityManager' CString
scheme'
    let result' :: Bool
result' = (CInt -> CInt -> Bool
forall a. Eq a => a -> a -> Bool
/= CInt
0) CInt
result
    a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
securityManager
    CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
scheme'
    Bool -> IO Bool
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
result'

#if defined(ENABLE_OVERLOADING)
data SecurityManagerUriSchemeIsDisplayIsolatedMethodInfo
instance (signature ~ (T.Text -> m Bool), MonadIO m, IsSecurityManager a) => O.OverloadedMethod SecurityManagerUriSchemeIsDisplayIsolatedMethodInfo a signature where
    overloadedMethod = securityManagerUriSchemeIsDisplayIsolated

instance O.OverloadedMethodInfo SecurityManagerUriSchemeIsDisplayIsolatedMethodInfo a where
    overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.WebKit2.Objects.SecurityManager.securityManagerUriSchemeIsDisplayIsolated",
        O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-webkit2-4.0.29/docs/GI-WebKit2-Objects-SecurityManager.html#v:securityManagerUriSchemeIsDisplayIsolated"
        })


#endif

-- method SecurityManager::uri_scheme_is_empty_document
-- method type : OrdinaryMethod
-- Args: [ Arg
--           { argCName = "security_manager"
--           , argType =
--               TInterface
--                 Name { namespace = "WebKit2" , name = "SecurityManager" }
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a #WebKitSecurityManager"
--                 , sinceVersion = Nothing
--                 }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       , Arg
--           { argCName = "scheme"
--           , argType = TBasicType TUTF8
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a URI scheme" , sinceVersion = Nothing }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       ]
-- Lengths: []
-- returnType: Just (TBasicType TBoolean)
-- throws : False
-- Skip return : False

foreign import ccall "webkit_security_manager_uri_scheme_is_empty_document" webkit_security_manager_uri_scheme_is_empty_document :: 
    Ptr SecurityManager ->                  -- security_manager : TInterface (Name {namespace = "WebKit2", name = "SecurityManager"})
    CString ->                              -- scheme : TBasicType TUTF8
    IO CInt

-- | Whether /@scheme@/ is considered as an empty document scheme.
-- 
-- See also 'GI.WebKit2.Objects.SecurityManager.securityManagerRegisterUriSchemeAsEmptyDocument'.
securityManagerUriSchemeIsEmptyDocument ::
    (B.CallStack.HasCallStack, MonadIO m, IsSecurityManager a) =>
    a
    -- ^ /@securityManager@/: a t'GI.WebKit2.Objects.SecurityManager.SecurityManager'
    -> T.Text
    -- ^ /@scheme@/: a URI scheme
    -> m Bool
    -- ^ __Returns:__ 'P.True' if /@scheme@/ is an empty document scheme or 'P.False' otherwise.
securityManagerUriSchemeIsEmptyDocument :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSecurityManager a) =>
a -> Text -> m Bool
securityManagerUriSchemeIsEmptyDocument a
securityManager Text
scheme = IO Bool -> m Bool
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Bool -> m Bool) -> IO Bool -> m Bool
forall a b. (a -> b) -> a -> b
$ do
    Ptr SecurityManager
securityManager' <- a -> IO (Ptr SecurityManager)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
securityManager
    CString
scheme' <- Text -> IO CString
textToCString Text
scheme
    CInt
result <- Ptr SecurityManager -> CString -> IO CInt
webkit_security_manager_uri_scheme_is_empty_document Ptr SecurityManager
securityManager' CString
scheme'
    let result' :: Bool
result' = (CInt -> CInt -> Bool
forall a. Eq a => a -> a -> Bool
/= CInt
0) CInt
result
    a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
securityManager
    CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
scheme'
    Bool -> IO Bool
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
result'

#if defined(ENABLE_OVERLOADING)
data SecurityManagerUriSchemeIsEmptyDocumentMethodInfo
instance (signature ~ (T.Text -> m Bool), MonadIO m, IsSecurityManager a) => O.OverloadedMethod SecurityManagerUriSchemeIsEmptyDocumentMethodInfo a signature where
    overloadedMethod = securityManagerUriSchemeIsEmptyDocument

instance O.OverloadedMethodInfo SecurityManagerUriSchemeIsEmptyDocumentMethodInfo a where
    overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.WebKit2.Objects.SecurityManager.securityManagerUriSchemeIsEmptyDocument",
        O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-webkit2-4.0.29/docs/GI-WebKit2-Objects-SecurityManager.html#v:securityManagerUriSchemeIsEmptyDocument"
        })


#endif

-- method SecurityManager::uri_scheme_is_local
-- method type : OrdinaryMethod
-- Args: [ Arg
--           { argCName = "security_manager"
--           , argType =
--               TInterface
--                 Name { namespace = "WebKit2" , name = "SecurityManager" }
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a #WebKitSecurityManager"
--                 , sinceVersion = Nothing
--                 }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       , Arg
--           { argCName = "scheme"
--           , argType = TBasicType TUTF8
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a URI scheme" , sinceVersion = Nothing }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       ]
-- Lengths: []
-- returnType: Just (TBasicType TBoolean)
-- throws : False
-- Skip return : False

foreign import ccall "webkit_security_manager_uri_scheme_is_local" webkit_security_manager_uri_scheme_is_local :: 
    Ptr SecurityManager ->                  -- security_manager : TInterface (Name {namespace = "WebKit2", name = "SecurityManager"})
    CString ->                              -- scheme : TBasicType TUTF8
    IO CInt

-- | Whether /@scheme@/ is considered as a local scheme.
-- 
-- See also 'GI.WebKit2.Objects.SecurityManager.securityManagerRegisterUriSchemeAsLocal'.
securityManagerUriSchemeIsLocal ::
    (B.CallStack.HasCallStack, MonadIO m, IsSecurityManager a) =>
    a
    -- ^ /@securityManager@/: a t'GI.WebKit2.Objects.SecurityManager.SecurityManager'
    -> T.Text
    -- ^ /@scheme@/: a URI scheme
    -> m Bool
    -- ^ __Returns:__ 'P.True' if /@scheme@/ is a local scheme or 'P.False' otherwise.
securityManagerUriSchemeIsLocal :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSecurityManager a) =>
a -> Text -> m Bool
securityManagerUriSchemeIsLocal a
securityManager Text
scheme = IO Bool -> m Bool
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Bool -> m Bool) -> IO Bool -> m Bool
forall a b. (a -> b) -> a -> b
$ do
    Ptr SecurityManager
securityManager' <- a -> IO (Ptr SecurityManager)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
securityManager
    CString
scheme' <- Text -> IO CString
textToCString Text
scheme
    CInt
result <- Ptr SecurityManager -> CString -> IO CInt
webkit_security_manager_uri_scheme_is_local Ptr SecurityManager
securityManager' CString
scheme'
    let result' :: Bool
result' = (CInt -> CInt -> Bool
forall a. Eq a => a -> a -> Bool
/= CInt
0) CInt
result
    a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
securityManager
    CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
scheme'
    Bool -> IO Bool
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
result'

#if defined(ENABLE_OVERLOADING)
data SecurityManagerUriSchemeIsLocalMethodInfo
instance (signature ~ (T.Text -> m Bool), MonadIO m, IsSecurityManager a) => O.OverloadedMethod SecurityManagerUriSchemeIsLocalMethodInfo a signature where
    overloadedMethod = securityManagerUriSchemeIsLocal

instance O.OverloadedMethodInfo SecurityManagerUriSchemeIsLocalMethodInfo a where
    overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.WebKit2.Objects.SecurityManager.securityManagerUriSchemeIsLocal",
        O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-webkit2-4.0.29/docs/GI-WebKit2-Objects-SecurityManager.html#v:securityManagerUriSchemeIsLocal"
        })


#endif

-- method SecurityManager::uri_scheme_is_no_access
-- method type : OrdinaryMethod
-- Args: [ Arg
--           { argCName = "security_manager"
--           , argType =
--               TInterface
--                 Name { namespace = "WebKit2" , name = "SecurityManager" }
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a #WebKitSecurityManager"
--                 , sinceVersion = Nothing
--                 }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       , Arg
--           { argCName = "scheme"
--           , argType = TBasicType TUTF8
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a URI scheme" , sinceVersion = Nothing }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       ]
-- Lengths: []
-- returnType: Just (TBasicType TBoolean)
-- throws : False
-- Skip return : False

foreign import ccall "webkit_security_manager_uri_scheme_is_no_access" webkit_security_manager_uri_scheme_is_no_access :: 
    Ptr SecurityManager ->                  -- security_manager : TInterface (Name {namespace = "WebKit2", name = "SecurityManager"})
    CString ->                              -- scheme : TBasicType TUTF8
    IO CInt

-- | Whether /@scheme@/ is considered as a no-access scheme.
-- 
-- See also 'GI.WebKit2.Objects.SecurityManager.securityManagerRegisterUriSchemeAsNoAccess'.
securityManagerUriSchemeIsNoAccess ::
    (B.CallStack.HasCallStack, MonadIO m, IsSecurityManager a) =>
    a
    -- ^ /@securityManager@/: a t'GI.WebKit2.Objects.SecurityManager.SecurityManager'
    -> T.Text
    -- ^ /@scheme@/: a URI scheme
    -> m Bool
    -- ^ __Returns:__ 'P.True' if /@scheme@/ is a no-access scheme or 'P.False' otherwise.
securityManagerUriSchemeIsNoAccess :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSecurityManager a) =>
a -> Text -> m Bool
securityManagerUriSchemeIsNoAccess a
securityManager Text
scheme = IO Bool -> m Bool
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Bool -> m Bool) -> IO Bool -> m Bool
forall a b. (a -> b) -> a -> b
$ do
    Ptr SecurityManager
securityManager' <- a -> IO (Ptr SecurityManager)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
securityManager
    CString
scheme' <- Text -> IO CString
textToCString Text
scheme
    CInt
result <- Ptr SecurityManager -> CString -> IO CInt
webkit_security_manager_uri_scheme_is_no_access Ptr SecurityManager
securityManager' CString
scheme'
    let result' :: Bool
result' = (CInt -> CInt -> Bool
forall a. Eq a => a -> a -> Bool
/= CInt
0) CInt
result
    a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
securityManager
    CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
scheme'
    Bool -> IO Bool
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
result'

#if defined(ENABLE_OVERLOADING)
data SecurityManagerUriSchemeIsNoAccessMethodInfo
instance (signature ~ (T.Text -> m Bool), MonadIO m, IsSecurityManager a) => O.OverloadedMethod SecurityManagerUriSchemeIsNoAccessMethodInfo a signature where
    overloadedMethod = securityManagerUriSchemeIsNoAccess

instance O.OverloadedMethodInfo SecurityManagerUriSchemeIsNoAccessMethodInfo a where
    overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.WebKit2.Objects.SecurityManager.securityManagerUriSchemeIsNoAccess",
        O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-webkit2-4.0.29/docs/GI-WebKit2-Objects-SecurityManager.html#v:securityManagerUriSchemeIsNoAccess"
        })


#endif

-- method SecurityManager::uri_scheme_is_secure
-- method type : OrdinaryMethod
-- Args: [ Arg
--           { argCName = "security_manager"
--           , argType =
--               TInterface
--                 Name { namespace = "WebKit2" , name = "SecurityManager" }
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a #WebKitSecurityManager"
--                 , sinceVersion = Nothing
--                 }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       , Arg
--           { argCName = "scheme"
--           , argType = TBasicType TUTF8
--           , direction = DirectionIn
--           , mayBeNull = False
--           , argDoc =
--               Documentation
--                 { rawDocText = Just "a URI scheme" , sinceVersion = Nothing }
--           , argScope = ScopeTypeInvalid
--           , argClosure = -1
--           , argDestroy = -1
--           , argCallerAllocates = False
--           , transfer = TransferNothing
--           }
--       ]
-- Lengths: []
-- returnType: Just (TBasicType TBoolean)
-- throws : False
-- Skip return : False

foreign import ccall "webkit_security_manager_uri_scheme_is_secure" webkit_security_manager_uri_scheme_is_secure :: 
    Ptr SecurityManager ->                  -- security_manager : TInterface (Name {namespace = "WebKit2", name = "SecurityManager"})
    CString ->                              -- scheme : TBasicType TUTF8
    IO CInt

-- | Whether /@scheme@/ is considered as a secure scheme.
-- 
-- See also 'GI.WebKit2.Objects.SecurityManager.securityManagerRegisterUriSchemeAsSecure'.
securityManagerUriSchemeIsSecure ::
    (B.CallStack.HasCallStack, MonadIO m, IsSecurityManager a) =>
    a
    -- ^ /@securityManager@/: a t'GI.WebKit2.Objects.SecurityManager.SecurityManager'
    -> T.Text
    -- ^ /@scheme@/: a URI scheme
    -> m Bool
    -- ^ __Returns:__ 'P.True' if /@scheme@/ is a secure scheme or 'P.False' otherwise.
securityManagerUriSchemeIsSecure :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSecurityManager a) =>
a -> Text -> m Bool
securityManagerUriSchemeIsSecure a
securityManager Text
scheme = IO Bool -> m Bool
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Bool -> m Bool) -> IO Bool -> m Bool
forall a b. (a -> b) -> a -> b
$ do
    Ptr SecurityManager
securityManager' <- a -> IO (Ptr SecurityManager)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
securityManager
    CString
scheme' <- Text -> IO CString
textToCString Text
scheme
    CInt
result <- Ptr SecurityManager -> CString -> IO CInt
webkit_security_manager_uri_scheme_is_secure Ptr SecurityManager
securityManager' CString
scheme'
    let result' :: Bool
result' = (CInt -> CInt -> Bool
forall a. Eq a => a -> a -> Bool
/= CInt
0) CInt
result
    a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
securityManager
    CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
scheme'
    Bool -> IO Bool
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
result'

#if defined(ENABLE_OVERLOADING)
data SecurityManagerUriSchemeIsSecureMethodInfo
instance (signature ~ (T.Text -> m Bool), MonadIO m, IsSecurityManager a) => O.OverloadedMethod SecurityManagerUriSchemeIsSecureMethodInfo a signature where
    overloadedMethod = securityManagerUriSchemeIsSecure

instance O.OverloadedMethodInfo SecurityManagerUriSchemeIsSecureMethodInfo a where
    overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.WebKit2.Objects.SecurityManager.securityManagerUriSchemeIsSecure",
        O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-webkit2-4.0.29/docs/GI-WebKit2-Objects-SecurityManager.html#v:securityManagerUriSchemeIsSecure"
        })


#endif