{-# LANGUAGE ImplicitParams, RankNTypes, TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.Dazzle.Objects.PreferencesSwitch
(
PreferencesSwitch(..) ,
IsPreferencesSwitch ,
toPreferencesSwitch ,
#if defined(ENABLE_OVERLOADING)
ResolvePreferencesSwitchMethod ,
#endif
#if defined(ENABLE_OVERLOADING)
PreferencesSwitchIsRadioPropertyInfo ,
#endif
constructPreferencesSwitchIsRadio ,
getPreferencesSwitchIsRadio ,
#if defined(ENABLE_OVERLOADING)
preferencesSwitchIsRadio ,
#endif
#if defined(ENABLE_OVERLOADING)
PreferencesSwitchKeyPropertyInfo ,
#endif
constructPreferencesSwitchKey ,
getPreferencesSwitchKey ,
#if defined(ENABLE_OVERLOADING)
preferencesSwitchKey ,
#endif
#if defined(ENABLE_OVERLOADING)
PreferencesSwitchSubtitlePropertyInfo ,
#endif
clearPreferencesSwitchSubtitle ,
constructPreferencesSwitchSubtitle ,
getPreferencesSwitchSubtitle ,
#if defined(ENABLE_OVERLOADING)
preferencesSwitchSubtitle ,
#endif
setPreferencesSwitchSubtitle ,
#if defined(ENABLE_OVERLOADING)
PreferencesSwitchTargetPropertyInfo ,
#endif
constructPreferencesSwitchTarget ,
getPreferencesSwitchTarget ,
#if defined(ENABLE_OVERLOADING)
preferencesSwitchTarget ,
#endif
#if defined(ENABLE_OVERLOADING)
PreferencesSwitchTitlePropertyInfo ,
#endif
clearPreferencesSwitchTitle ,
constructPreferencesSwitchTitle ,
getPreferencesSwitchTitle ,
#if defined(ENABLE_OVERLOADING)
preferencesSwitchTitle ,
#endif
setPreferencesSwitchTitle ,
PreferencesSwitchActivatedCallback ,
#if defined(ENABLE_OVERLOADING)
PreferencesSwitchActivatedSignalInfo ,
#endif
afterPreferencesSwitchActivated ,
onPreferencesSwitchActivated ,
) 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.Kind as DK
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 Data.Word as DW
import qualified Data.Int as DI
import qualified System.Posix.Types as SPT
import qualified Foreign.C.Types as FCT
#if MIN_VERSION_base(4,18,0)
import qualified GI.Atk.Interfaces.ImplementorIface as Atk.ImplementorIface
import {-# SOURCE #-} qualified GI.Dazzle.Objects.PreferencesBin as Dazzle.PreferencesBin
import qualified GI.GObject.Objects.Object as GObject.Object
import qualified GI.Gtk.Interfaces.Buildable as Gtk.Buildable
import qualified GI.Gtk.Objects.Bin as Gtk.Bin
import qualified GI.Gtk.Objects.Container as Gtk.Container
import qualified GI.Gtk.Objects.Widget as Gtk.Widget
#else
import qualified GI.Atk.Interfaces.ImplementorIface as Atk.ImplementorIface
import {-# SOURCE #-} qualified GI.Dazzle.Objects.PreferencesBin as Dazzle.PreferencesBin
import qualified GI.GObject.Objects.Object as GObject.Object
import qualified GI.Gtk.Interfaces.Buildable as Gtk.Buildable
import qualified GI.Gtk.Objects.Bin as Gtk.Bin
import qualified GI.Gtk.Objects.Container as Gtk.Container
import qualified GI.Gtk.Objects.Widget as Gtk.Widget
#endif
newtype PreferencesSwitch = PreferencesSwitch (SP.ManagedPtr PreferencesSwitch)
deriving (PreferencesSwitch -> PreferencesSwitch -> Bool
(PreferencesSwitch -> PreferencesSwitch -> Bool)
-> (PreferencesSwitch -> PreferencesSwitch -> Bool)
-> Eq PreferencesSwitch
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: PreferencesSwitch -> PreferencesSwitch -> Bool
== :: PreferencesSwitch -> PreferencesSwitch -> Bool
$c/= :: PreferencesSwitch -> PreferencesSwitch -> Bool
/= :: PreferencesSwitch -> PreferencesSwitch -> Bool
Eq)
instance SP.ManagedPtrNewtype PreferencesSwitch where
toManagedPtr :: PreferencesSwitch -> ManagedPtr PreferencesSwitch
toManagedPtr (PreferencesSwitch ManagedPtr PreferencesSwitch
p) = ManagedPtr PreferencesSwitch
p
foreign import ccall "dzl_preferences_switch_get_type"
c_dzl_preferences_switch_get_type :: IO B.Types.GType
instance B.Types.TypedObject PreferencesSwitch where
glibType :: IO GType
glibType = IO GType
c_dzl_preferences_switch_get_type
instance B.Types.GObject PreferencesSwitch
class (SP.GObject o, O.IsDescendantOf PreferencesSwitch o) => IsPreferencesSwitch o
instance (SP.GObject o, O.IsDescendantOf PreferencesSwitch o) => IsPreferencesSwitch o
instance O.HasParentTypes PreferencesSwitch
type instance O.ParentTypes PreferencesSwitch = '[Dazzle.PreferencesBin.PreferencesBin, Gtk.Bin.Bin, Gtk.Container.Container, Gtk.Widget.Widget, GObject.Object.Object, Atk.ImplementorIface.ImplementorIface, Gtk.Buildable.Buildable]
toPreferencesSwitch :: (MIO.MonadIO m, IsPreferencesSwitch o) => o -> m PreferencesSwitch
toPreferencesSwitch :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesSwitch o) =>
o -> m PreferencesSwitch
toPreferencesSwitch = IO PreferencesSwitch -> m PreferencesSwitch
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO PreferencesSwitch -> m PreferencesSwitch)
-> (o -> IO PreferencesSwitch) -> o -> m PreferencesSwitch
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ManagedPtr PreferencesSwitch -> PreferencesSwitch)
-> o -> IO PreferencesSwitch
forall o o'.
(HasCallStack, ManagedPtrNewtype o, TypedObject o,
ManagedPtrNewtype o', TypedObject o') =>
(ManagedPtr o' -> o') -> o -> IO o'
B.ManagedPtr.unsafeCastTo ManagedPtr PreferencesSwitch -> PreferencesSwitch
PreferencesSwitch
instance B.GValue.IsGValue (Maybe PreferencesSwitch) where
gvalueGType_ :: IO GType
gvalueGType_ = IO GType
c_dzl_preferences_switch_get_type
gvalueSet_ :: Ptr GValue -> Maybe PreferencesSwitch -> IO ()
gvalueSet_ Ptr GValue
gv Maybe PreferencesSwitch
P.Nothing = Ptr GValue -> Ptr PreferencesSwitch -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv (Ptr PreferencesSwitch
forall a. Ptr a
FP.nullPtr :: FP.Ptr PreferencesSwitch)
gvalueSet_ Ptr GValue
gv (P.Just PreferencesSwitch
obj) = PreferencesSwitch -> (Ptr PreferencesSwitch -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
B.ManagedPtr.withManagedPtr PreferencesSwitch
obj (Ptr GValue -> Ptr PreferencesSwitch -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv)
gvalueGet_ :: Ptr GValue -> IO (Maybe PreferencesSwitch)
gvalueGet_ Ptr GValue
gv = do
Ptr PreferencesSwitch
ptr <- Ptr GValue -> IO (Ptr PreferencesSwitch)
forall a. GObject a => Ptr GValue -> IO (Ptr a)
B.GValue.get_object Ptr GValue
gv :: IO (FP.Ptr PreferencesSwitch)
if Ptr PreferencesSwitch
ptr Ptr PreferencesSwitch -> Ptr PreferencesSwitch -> Bool
forall a. Eq a => a -> a -> Bool
/= Ptr PreferencesSwitch
forall a. Ptr a
FP.nullPtr
then PreferencesSwitch -> Maybe PreferencesSwitch
forall a. a -> Maybe a
P.Just (PreferencesSwitch -> Maybe PreferencesSwitch)
-> IO PreferencesSwitch -> IO (Maybe PreferencesSwitch)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (ManagedPtr PreferencesSwitch -> PreferencesSwitch)
-> Ptr PreferencesSwitch -> IO PreferencesSwitch
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
B.ManagedPtr.newObject ManagedPtr PreferencesSwitch -> PreferencesSwitch
PreferencesSwitch Ptr PreferencesSwitch
ptr
else Maybe PreferencesSwitch -> IO (Maybe PreferencesSwitch)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe PreferencesSwitch
forall a. Maybe a
P.Nothing
#if defined(ENABLE_OVERLOADING)
type family ResolvePreferencesSwitchMethod (t :: Symbol) (o :: DK.Type) :: DK.Type where
ResolvePreferencesSwitchMethod "activate" o = Gtk.Widget.WidgetActivateMethodInfo
ResolvePreferencesSwitchMethod "add" o = Gtk.Container.ContainerAddMethodInfo
ResolvePreferencesSwitchMethod "addAccelerator" o = Gtk.Widget.WidgetAddAcceleratorMethodInfo
ResolvePreferencesSwitchMethod "addChild" o = Gtk.Buildable.BuildableAddChildMethodInfo
ResolvePreferencesSwitchMethod "addDeviceEvents" o = Gtk.Widget.WidgetAddDeviceEventsMethodInfo
ResolvePreferencesSwitchMethod "addEvents" o = Gtk.Widget.WidgetAddEventsMethodInfo
ResolvePreferencesSwitchMethod "addMnemonicLabel" o = Gtk.Widget.WidgetAddMnemonicLabelMethodInfo
ResolvePreferencesSwitchMethod "addTickCallback" o = Gtk.Widget.WidgetAddTickCallbackMethodInfo
ResolvePreferencesSwitchMethod "bindProperty" o = GObject.Object.ObjectBindPropertyMethodInfo
ResolvePreferencesSwitchMethod "bindPropertyFull" o = GObject.Object.ObjectBindPropertyFullMethodInfo
ResolvePreferencesSwitchMethod "canActivateAccel" o = Gtk.Widget.WidgetCanActivateAccelMethodInfo
ResolvePreferencesSwitchMethod "checkResize" o = Gtk.Container.ContainerCheckResizeMethodInfo
ResolvePreferencesSwitchMethod "childFocus" o = Gtk.Widget.WidgetChildFocusMethodInfo
ResolvePreferencesSwitchMethod "childGetProperty" o = Gtk.Container.ContainerChildGetPropertyMethodInfo
ResolvePreferencesSwitchMethod "childNotify" o = Gtk.Container.ContainerChildNotifyMethodInfo
ResolvePreferencesSwitchMethod "childNotifyByPspec" o = Gtk.Container.ContainerChildNotifyByPspecMethodInfo
ResolvePreferencesSwitchMethod "childSetProperty" o = Gtk.Container.ContainerChildSetPropertyMethodInfo
ResolvePreferencesSwitchMethod "childType" o = Gtk.Container.ContainerChildTypeMethodInfo
ResolvePreferencesSwitchMethod "classPath" o = Gtk.Widget.WidgetClassPathMethodInfo
ResolvePreferencesSwitchMethod "computeExpand" o = Gtk.Widget.WidgetComputeExpandMethodInfo
ResolvePreferencesSwitchMethod "constructChild" o = Gtk.Buildable.BuildableConstructChildMethodInfo
ResolvePreferencesSwitchMethod "createPangoContext" o = Gtk.Widget.WidgetCreatePangoContextMethodInfo
ResolvePreferencesSwitchMethod "createPangoLayout" o = Gtk.Widget.WidgetCreatePangoLayoutMethodInfo
ResolvePreferencesSwitchMethod "customFinished" o = Gtk.Buildable.BuildableCustomFinishedMethodInfo
ResolvePreferencesSwitchMethod "customTagEnd" o = Gtk.Buildable.BuildableCustomTagEndMethodInfo
ResolvePreferencesSwitchMethod "customTagStart" o = Gtk.Buildable.BuildableCustomTagStartMethodInfo
ResolvePreferencesSwitchMethod "destroy" o = Gtk.Widget.WidgetDestroyMethodInfo
ResolvePreferencesSwitchMethod "destroyed" o = Gtk.Widget.WidgetDestroyedMethodInfo
ResolvePreferencesSwitchMethod "deviceIsShadowed" o = Gtk.Widget.WidgetDeviceIsShadowedMethodInfo
ResolvePreferencesSwitchMethod "dragBegin" o = Gtk.Widget.WidgetDragBeginMethodInfo
ResolvePreferencesSwitchMethod "dragBeginWithCoordinates" o = Gtk.Widget.WidgetDragBeginWithCoordinatesMethodInfo
ResolvePreferencesSwitchMethod "dragCheckThreshold" o = Gtk.Widget.WidgetDragCheckThresholdMethodInfo
ResolvePreferencesSwitchMethod "dragDestAddImageTargets" o = Gtk.Widget.WidgetDragDestAddImageTargetsMethodInfo
ResolvePreferencesSwitchMethod "dragDestAddTextTargets" o = Gtk.Widget.WidgetDragDestAddTextTargetsMethodInfo
ResolvePreferencesSwitchMethod "dragDestAddUriTargets" o = Gtk.Widget.WidgetDragDestAddUriTargetsMethodInfo
ResolvePreferencesSwitchMethod "dragDestFindTarget" o = Gtk.Widget.WidgetDragDestFindTargetMethodInfo
ResolvePreferencesSwitchMethod "dragDestGetTargetList" o = Gtk.Widget.WidgetDragDestGetTargetListMethodInfo
ResolvePreferencesSwitchMethod "dragDestGetTrackMotion" o = Gtk.Widget.WidgetDragDestGetTrackMotionMethodInfo
ResolvePreferencesSwitchMethod "dragDestSet" o = Gtk.Widget.WidgetDragDestSetMethodInfo
ResolvePreferencesSwitchMethod "dragDestSetProxy" o = Gtk.Widget.WidgetDragDestSetProxyMethodInfo
ResolvePreferencesSwitchMethod "dragDestSetTargetList" o = Gtk.Widget.WidgetDragDestSetTargetListMethodInfo
ResolvePreferencesSwitchMethod "dragDestSetTrackMotion" o = Gtk.Widget.WidgetDragDestSetTrackMotionMethodInfo
ResolvePreferencesSwitchMethod "dragDestUnset" o = Gtk.Widget.WidgetDragDestUnsetMethodInfo
ResolvePreferencesSwitchMethod "dragGetData" o = Gtk.Widget.WidgetDragGetDataMethodInfo
ResolvePreferencesSwitchMethod "dragHighlight" o = Gtk.Widget.WidgetDragHighlightMethodInfo
ResolvePreferencesSwitchMethod "dragSourceAddImageTargets" o = Gtk.Widget.WidgetDragSourceAddImageTargetsMethodInfo
ResolvePreferencesSwitchMethod "dragSourceAddTextTargets" o = Gtk.Widget.WidgetDragSourceAddTextTargetsMethodInfo
ResolvePreferencesSwitchMethod "dragSourceAddUriTargets" o = Gtk.Widget.WidgetDragSourceAddUriTargetsMethodInfo
ResolvePreferencesSwitchMethod "dragSourceGetTargetList" o = Gtk.Widget.WidgetDragSourceGetTargetListMethodInfo
ResolvePreferencesSwitchMethod "dragSourceSet" o = Gtk.Widget.WidgetDragSourceSetMethodInfo
ResolvePreferencesSwitchMethod "dragSourceSetIconGicon" o = Gtk.Widget.WidgetDragSourceSetIconGiconMethodInfo
ResolvePreferencesSwitchMethod "dragSourceSetIconName" o = Gtk.Widget.WidgetDragSourceSetIconNameMethodInfo
ResolvePreferencesSwitchMethod "dragSourceSetIconPixbuf" o = Gtk.Widget.WidgetDragSourceSetIconPixbufMethodInfo
ResolvePreferencesSwitchMethod "dragSourceSetIconStock" o = Gtk.Widget.WidgetDragSourceSetIconStockMethodInfo
ResolvePreferencesSwitchMethod "dragSourceSetTargetList" o = Gtk.Widget.WidgetDragSourceSetTargetListMethodInfo
ResolvePreferencesSwitchMethod "dragSourceUnset" o = Gtk.Widget.WidgetDragSourceUnsetMethodInfo
ResolvePreferencesSwitchMethod "dragUnhighlight" o = Gtk.Widget.WidgetDragUnhighlightMethodInfo
ResolvePreferencesSwitchMethod "draw" o = Gtk.Widget.WidgetDrawMethodInfo
ResolvePreferencesSwitchMethod "ensureStyle" o = Gtk.Widget.WidgetEnsureStyleMethodInfo
ResolvePreferencesSwitchMethod "errorBell" o = Gtk.Widget.WidgetErrorBellMethodInfo
ResolvePreferencesSwitchMethod "event" o = Gtk.Widget.WidgetEventMethodInfo
ResolvePreferencesSwitchMethod "forall" o = Gtk.Container.ContainerForallMethodInfo
ResolvePreferencesSwitchMethod "forceFloating" o = GObject.Object.ObjectForceFloatingMethodInfo
ResolvePreferencesSwitchMethod "foreach" o = Gtk.Container.ContainerForeachMethodInfo
ResolvePreferencesSwitchMethod "freezeChildNotify" o = Gtk.Widget.WidgetFreezeChildNotifyMethodInfo
ResolvePreferencesSwitchMethod "freezeNotify" o = GObject.Object.ObjectFreezeNotifyMethodInfo
ResolvePreferencesSwitchMethod "getv" o = GObject.Object.ObjectGetvMethodInfo
ResolvePreferencesSwitchMethod "grabAdd" o = Gtk.Widget.WidgetGrabAddMethodInfo
ResolvePreferencesSwitchMethod "grabDefault" o = Gtk.Widget.WidgetGrabDefaultMethodInfo
ResolvePreferencesSwitchMethod "grabFocus" o = Gtk.Widget.WidgetGrabFocusMethodInfo
ResolvePreferencesSwitchMethod "grabRemove" o = Gtk.Widget.WidgetGrabRemoveMethodInfo
ResolvePreferencesSwitchMethod "hasDefault" o = Gtk.Widget.WidgetHasDefaultMethodInfo
ResolvePreferencesSwitchMethod "hasFocus" o = Gtk.Widget.WidgetHasFocusMethodInfo
ResolvePreferencesSwitchMethod "hasGrab" o = Gtk.Widget.WidgetHasGrabMethodInfo
ResolvePreferencesSwitchMethod "hasRcStyle" o = Gtk.Widget.WidgetHasRcStyleMethodInfo
ResolvePreferencesSwitchMethod "hasScreen" o = Gtk.Widget.WidgetHasScreenMethodInfo
ResolvePreferencesSwitchMethod "hasVisibleFocus" o = Gtk.Widget.WidgetHasVisibleFocusMethodInfo
ResolvePreferencesSwitchMethod "hide" o = Gtk.Widget.WidgetHideMethodInfo
ResolvePreferencesSwitchMethod "hideOnDelete" o = Gtk.Widget.WidgetHideOnDeleteMethodInfo
ResolvePreferencesSwitchMethod "inDestruction" o = Gtk.Widget.WidgetInDestructionMethodInfo
ResolvePreferencesSwitchMethod "initTemplate" o = Gtk.Widget.WidgetInitTemplateMethodInfo
ResolvePreferencesSwitchMethod "inputShapeCombineRegion" o = Gtk.Widget.WidgetInputShapeCombineRegionMethodInfo
ResolvePreferencesSwitchMethod "insertActionGroup" o = Gtk.Widget.WidgetInsertActionGroupMethodInfo
ResolvePreferencesSwitchMethod "intersect" o = Gtk.Widget.WidgetIntersectMethodInfo
ResolvePreferencesSwitchMethod "isAncestor" o = Gtk.Widget.WidgetIsAncestorMethodInfo
ResolvePreferencesSwitchMethod "isComposited" o = Gtk.Widget.WidgetIsCompositedMethodInfo
ResolvePreferencesSwitchMethod "isDrawable" o = Gtk.Widget.WidgetIsDrawableMethodInfo
ResolvePreferencesSwitchMethod "isFloating" o = GObject.Object.ObjectIsFloatingMethodInfo
ResolvePreferencesSwitchMethod "isFocus" o = Gtk.Widget.WidgetIsFocusMethodInfo
ResolvePreferencesSwitchMethod "isSensitive" o = Gtk.Widget.WidgetIsSensitiveMethodInfo
ResolvePreferencesSwitchMethod "isToplevel" o = Gtk.Widget.WidgetIsToplevelMethodInfo
ResolvePreferencesSwitchMethod "isVisible" o = Gtk.Widget.WidgetIsVisibleMethodInfo
ResolvePreferencesSwitchMethod "keynavFailed" o = Gtk.Widget.WidgetKeynavFailedMethodInfo
ResolvePreferencesSwitchMethod "listAccelClosures" o = Gtk.Widget.WidgetListAccelClosuresMethodInfo
ResolvePreferencesSwitchMethod "listActionPrefixes" o = Gtk.Widget.WidgetListActionPrefixesMethodInfo
ResolvePreferencesSwitchMethod "listMnemonicLabels" o = Gtk.Widget.WidgetListMnemonicLabelsMethodInfo
ResolvePreferencesSwitchMethod "map" o = Gtk.Widget.WidgetMapMethodInfo
ResolvePreferencesSwitchMethod "mnemonicActivate" o = Gtk.Widget.WidgetMnemonicActivateMethodInfo
ResolvePreferencesSwitchMethod "modifyBase" o = Gtk.Widget.WidgetModifyBaseMethodInfo
ResolvePreferencesSwitchMethod "modifyBg" o = Gtk.Widget.WidgetModifyBgMethodInfo
ResolvePreferencesSwitchMethod "modifyCursor" o = Gtk.Widget.WidgetModifyCursorMethodInfo
ResolvePreferencesSwitchMethod "modifyFg" o = Gtk.Widget.WidgetModifyFgMethodInfo
ResolvePreferencesSwitchMethod "modifyFont" o = Gtk.Widget.WidgetModifyFontMethodInfo
ResolvePreferencesSwitchMethod "modifyStyle" o = Gtk.Widget.WidgetModifyStyleMethodInfo
ResolvePreferencesSwitchMethod "modifyText" o = Gtk.Widget.WidgetModifyTextMethodInfo
ResolvePreferencesSwitchMethod "notify" o = GObject.Object.ObjectNotifyMethodInfo
ResolvePreferencesSwitchMethod "notifyByPspec" o = GObject.Object.ObjectNotifyByPspecMethodInfo
ResolvePreferencesSwitchMethod "overrideBackgroundColor" o = Gtk.Widget.WidgetOverrideBackgroundColorMethodInfo
ResolvePreferencesSwitchMethod "overrideColor" o = Gtk.Widget.WidgetOverrideColorMethodInfo
ResolvePreferencesSwitchMethod "overrideCursor" o = Gtk.Widget.WidgetOverrideCursorMethodInfo
ResolvePreferencesSwitchMethod "overrideFont" o = Gtk.Widget.WidgetOverrideFontMethodInfo
ResolvePreferencesSwitchMethod "overrideSymbolicColor" o = Gtk.Widget.WidgetOverrideSymbolicColorMethodInfo
ResolvePreferencesSwitchMethod "parserFinished" o = Gtk.Buildable.BuildableParserFinishedMethodInfo
ResolvePreferencesSwitchMethod "path" o = Gtk.Widget.WidgetPathMethodInfo
ResolvePreferencesSwitchMethod "propagateDraw" o = Gtk.Container.ContainerPropagateDrawMethodInfo
ResolvePreferencesSwitchMethod "queueAllocate" o = Gtk.Widget.WidgetQueueAllocateMethodInfo
ResolvePreferencesSwitchMethod "queueComputeExpand" o = Gtk.Widget.WidgetQueueComputeExpandMethodInfo
ResolvePreferencesSwitchMethod "queueDraw" o = Gtk.Widget.WidgetQueueDrawMethodInfo
ResolvePreferencesSwitchMethod "queueDrawArea" o = Gtk.Widget.WidgetQueueDrawAreaMethodInfo
ResolvePreferencesSwitchMethod "queueDrawRegion" o = Gtk.Widget.WidgetQueueDrawRegionMethodInfo
ResolvePreferencesSwitchMethod "queueResize" o = Gtk.Widget.WidgetQueueResizeMethodInfo
ResolvePreferencesSwitchMethod "queueResizeNoRedraw" o = Gtk.Widget.WidgetQueueResizeNoRedrawMethodInfo
ResolvePreferencesSwitchMethod "realize" o = Gtk.Widget.WidgetRealizeMethodInfo
ResolvePreferencesSwitchMethod "ref" o = GObject.Object.ObjectRefMethodInfo
ResolvePreferencesSwitchMethod "refSink" o = GObject.Object.ObjectRefSinkMethodInfo
ResolvePreferencesSwitchMethod "regionIntersect" o = Gtk.Widget.WidgetRegionIntersectMethodInfo
ResolvePreferencesSwitchMethod "registerWindow" o = Gtk.Widget.WidgetRegisterWindowMethodInfo
ResolvePreferencesSwitchMethod "remove" o = Gtk.Container.ContainerRemoveMethodInfo
ResolvePreferencesSwitchMethod "removeAccelerator" o = Gtk.Widget.WidgetRemoveAcceleratorMethodInfo
ResolvePreferencesSwitchMethod "removeMnemonicLabel" o = Gtk.Widget.WidgetRemoveMnemonicLabelMethodInfo
ResolvePreferencesSwitchMethod "removeTickCallback" o = Gtk.Widget.WidgetRemoveTickCallbackMethodInfo
ResolvePreferencesSwitchMethod "renderIcon" o = Gtk.Widget.WidgetRenderIconMethodInfo
ResolvePreferencesSwitchMethod "renderIconPixbuf" o = Gtk.Widget.WidgetRenderIconPixbufMethodInfo
ResolvePreferencesSwitchMethod "reparent" o = Gtk.Widget.WidgetReparentMethodInfo
ResolvePreferencesSwitchMethod "resetRcStyles" o = Gtk.Widget.WidgetResetRcStylesMethodInfo
ResolvePreferencesSwitchMethod "resetStyle" o = Gtk.Widget.WidgetResetStyleMethodInfo
ResolvePreferencesSwitchMethod "resizeChildren" o = Gtk.Container.ContainerResizeChildrenMethodInfo
ResolvePreferencesSwitchMethod "runDispose" o = GObject.Object.ObjectRunDisposeMethodInfo
ResolvePreferencesSwitchMethod "sendExpose" o = Gtk.Widget.WidgetSendExposeMethodInfo
ResolvePreferencesSwitchMethod "sendFocusChange" o = Gtk.Widget.WidgetSendFocusChangeMethodInfo
ResolvePreferencesSwitchMethod "shapeCombineRegion" o = Gtk.Widget.WidgetShapeCombineRegionMethodInfo
ResolvePreferencesSwitchMethod "show" o = Gtk.Widget.WidgetShowMethodInfo
ResolvePreferencesSwitchMethod "showAll" o = Gtk.Widget.WidgetShowAllMethodInfo
ResolvePreferencesSwitchMethod "showNow" o = Gtk.Widget.WidgetShowNowMethodInfo
ResolvePreferencesSwitchMethod "sizeAllocate" o = Gtk.Widget.WidgetSizeAllocateMethodInfo
ResolvePreferencesSwitchMethod "sizeAllocateWithBaseline" o = Gtk.Widget.WidgetSizeAllocateWithBaselineMethodInfo
ResolvePreferencesSwitchMethod "sizeRequest" o = Gtk.Widget.WidgetSizeRequestMethodInfo
ResolvePreferencesSwitchMethod "stealData" o = GObject.Object.ObjectStealDataMethodInfo
ResolvePreferencesSwitchMethod "stealQdata" o = GObject.Object.ObjectStealQdataMethodInfo
ResolvePreferencesSwitchMethod "styleAttach" o = Gtk.Widget.WidgetStyleAttachMethodInfo
ResolvePreferencesSwitchMethod "styleGetProperty" o = Gtk.Widget.WidgetStyleGetPropertyMethodInfo
ResolvePreferencesSwitchMethod "thawChildNotify" o = Gtk.Widget.WidgetThawChildNotifyMethodInfo
ResolvePreferencesSwitchMethod "thawNotify" o = GObject.Object.ObjectThawNotifyMethodInfo
ResolvePreferencesSwitchMethod "translateCoordinates" o = Gtk.Widget.WidgetTranslateCoordinatesMethodInfo
ResolvePreferencesSwitchMethod "triggerTooltipQuery" o = Gtk.Widget.WidgetTriggerTooltipQueryMethodInfo
ResolvePreferencesSwitchMethod "unmap" o = Gtk.Widget.WidgetUnmapMethodInfo
ResolvePreferencesSwitchMethod "unparent" o = Gtk.Widget.WidgetUnparentMethodInfo
ResolvePreferencesSwitchMethod "unrealize" o = Gtk.Widget.WidgetUnrealizeMethodInfo
ResolvePreferencesSwitchMethod "unref" o = GObject.Object.ObjectUnrefMethodInfo
ResolvePreferencesSwitchMethod "unregisterWindow" o = Gtk.Widget.WidgetUnregisterWindowMethodInfo
ResolvePreferencesSwitchMethod "unsetFocusChain" o = Gtk.Container.ContainerUnsetFocusChainMethodInfo
ResolvePreferencesSwitchMethod "unsetStateFlags" o = Gtk.Widget.WidgetUnsetStateFlagsMethodInfo
ResolvePreferencesSwitchMethod "watchClosure" o = GObject.Object.ObjectWatchClosureMethodInfo
ResolvePreferencesSwitchMethod "getAccessible" o = Gtk.Widget.WidgetGetAccessibleMethodInfo
ResolvePreferencesSwitchMethod "getActionGroup" o = Gtk.Widget.WidgetGetActionGroupMethodInfo
ResolvePreferencesSwitchMethod "getAllocatedBaseline" o = Gtk.Widget.WidgetGetAllocatedBaselineMethodInfo
ResolvePreferencesSwitchMethod "getAllocatedHeight" o = Gtk.Widget.WidgetGetAllocatedHeightMethodInfo
ResolvePreferencesSwitchMethod "getAllocatedSize" o = Gtk.Widget.WidgetGetAllocatedSizeMethodInfo
ResolvePreferencesSwitchMethod "getAllocatedWidth" o = Gtk.Widget.WidgetGetAllocatedWidthMethodInfo
ResolvePreferencesSwitchMethod "getAllocation" o = Gtk.Widget.WidgetGetAllocationMethodInfo
ResolvePreferencesSwitchMethod "getAncestor" o = Gtk.Widget.WidgetGetAncestorMethodInfo
ResolvePreferencesSwitchMethod "getAppPaintable" o = Gtk.Widget.WidgetGetAppPaintableMethodInfo
ResolvePreferencesSwitchMethod "getBorderWidth" o = Gtk.Container.ContainerGetBorderWidthMethodInfo
ResolvePreferencesSwitchMethod "getCanDefault" o = Gtk.Widget.WidgetGetCanDefaultMethodInfo
ResolvePreferencesSwitchMethod "getCanFocus" o = Gtk.Widget.WidgetGetCanFocusMethodInfo
ResolvePreferencesSwitchMethod "getChild" o = Gtk.Bin.BinGetChildMethodInfo
ResolvePreferencesSwitchMethod "getChildRequisition" o = Gtk.Widget.WidgetGetChildRequisitionMethodInfo
ResolvePreferencesSwitchMethod "getChildVisible" o = Gtk.Widget.WidgetGetChildVisibleMethodInfo
ResolvePreferencesSwitchMethod "getChildren" o = Gtk.Container.ContainerGetChildrenMethodInfo
ResolvePreferencesSwitchMethod "getClip" o = Gtk.Widget.WidgetGetClipMethodInfo
ResolvePreferencesSwitchMethod "getClipboard" o = Gtk.Widget.WidgetGetClipboardMethodInfo
ResolvePreferencesSwitchMethod "getCompositeName" o = Gtk.Widget.WidgetGetCompositeNameMethodInfo
ResolvePreferencesSwitchMethod "getData" o = GObject.Object.ObjectGetDataMethodInfo
ResolvePreferencesSwitchMethod "getDeviceEnabled" o = Gtk.Widget.WidgetGetDeviceEnabledMethodInfo
ResolvePreferencesSwitchMethod "getDeviceEvents" o = Gtk.Widget.WidgetGetDeviceEventsMethodInfo
ResolvePreferencesSwitchMethod "getDirection" o = Gtk.Widget.WidgetGetDirectionMethodInfo
ResolvePreferencesSwitchMethod "getDisplay" o = Gtk.Widget.WidgetGetDisplayMethodInfo
ResolvePreferencesSwitchMethod "getDoubleBuffered" o = Gtk.Widget.WidgetGetDoubleBufferedMethodInfo
ResolvePreferencesSwitchMethod "getEvents" o = Gtk.Widget.WidgetGetEventsMethodInfo
ResolvePreferencesSwitchMethod "getFocusChain" o = Gtk.Container.ContainerGetFocusChainMethodInfo
ResolvePreferencesSwitchMethod "getFocusChild" o = Gtk.Container.ContainerGetFocusChildMethodInfo
ResolvePreferencesSwitchMethod "getFocusHadjustment" o = Gtk.Container.ContainerGetFocusHadjustmentMethodInfo
ResolvePreferencesSwitchMethod "getFocusOnClick" o = Gtk.Widget.WidgetGetFocusOnClickMethodInfo
ResolvePreferencesSwitchMethod "getFocusVadjustment" o = Gtk.Container.ContainerGetFocusVadjustmentMethodInfo
ResolvePreferencesSwitchMethod "getFontMap" o = Gtk.Widget.WidgetGetFontMapMethodInfo
ResolvePreferencesSwitchMethod "getFontOptions" o = Gtk.Widget.WidgetGetFontOptionsMethodInfo
ResolvePreferencesSwitchMethod "getFrameClock" o = Gtk.Widget.WidgetGetFrameClockMethodInfo
ResolvePreferencesSwitchMethod "getHalign" o = Gtk.Widget.WidgetGetHalignMethodInfo
ResolvePreferencesSwitchMethod "getHasTooltip" o = Gtk.Widget.WidgetGetHasTooltipMethodInfo
ResolvePreferencesSwitchMethod "getHasWindow" o = Gtk.Widget.WidgetGetHasWindowMethodInfo
ResolvePreferencesSwitchMethod "getHexpand" o = Gtk.Widget.WidgetGetHexpandMethodInfo
ResolvePreferencesSwitchMethod "getHexpandSet" o = Gtk.Widget.WidgetGetHexpandSetMethodInfo
ResolvePreferencesSwitchMethod "getInternalChild" o = Gtk.Buildable.BuildableGetInternalChildMethodInfo
ResolvePreferencesSwitchMethod "getMapped" o = Gtk.Widget.WidgetGetMappedMethodInfo
ResolvePreferencesSwitchMethod "getMarginBottom" o = Gtk.Widget.WidgetGetMarginBottomMethodInfo
ResolvePreferencesSwitchMethod "getMarginEnd" o = Gtk.Widget.WidgetGetMarginEndMethodInfo
ResolvePreferencesSwitchMethod "getMarginLeft" o = Gtk.Widget.WidgetGetMarginLeftMethodInfo
ResolvePreferencesSwitchMethod "getMarginRight" o = Gtk.Widget.WidgetGetMarginRightMethodInfo
ResolvePreferencesSwitchMethod "getMarginStart" o = Gtk.Widget.WidgetGetMarginStartMethodInfo
ResolvePreferencesSwitchMethod "getMarginTop" o = Gtk.Widget.WidgetGetMarginTopMethodInfo
ResolvePreferencesSwitchMethod "getModifierMask" o = Gtk.Widget.WidgetGetModifierMaskMethodInfo
ResolvePreferencesSwitchMethod "getModifierStyle" o = Gtk.Widget.WidgetGetModifierStyleMethodInfo
ResolvePreferencesSwitchMethod "getName" o = Gtk.Widget.WidgetGetNameMethodInfo
ResolvePreferencesSwitchMethod "getNoShowAll" o = Gtk.Widget.WidgetGetNoShowAllMethodInfo
ResolvePreferencesSwitchMethod "getOpacity" o = Gtk.Widget.WidgetGetOpacityMethodInfo
ResolvePreferencesSwitchMethod "getPangoContext" o = Gtk.Widget.WidgetGetPangoContextMethodInfo
ResolvePreferencesSwitchMethod "getParent" o = Gtk.Widget.WidgetGetParentMethodInfo
ResolvePreferencesSwitchMethod "getParentWindow" o = Gtk.Widget.WidgetGetParentWindowMethodInfo
ResolvePreferencesSwitchMethod "getPath" o = Gtk.Widget.WidgetGetPathMethodInfo
ResolvePreferencesSwitchMethod "getPathForChild" o = Gtk.Container.ContainerGetPathForChildMethodInfo
ResolvePreferencesSwitchMethod "getPointer" o = Gtk.Widget.WidgetGetPointerMethodInfo
ResolvePreferencesSwitchMethod "getPreferredHeight" o = Gtk.Widget.WidgetGetPreferredHeightMethodInfo
ResolvePreferencesSwitchMethod "getPreferredHeightAndBaselineForWidth" o = Gtk.Widget.WidgetGetPreferredHeightAndBaselineForWidthMethodInfo
ResolvePreferencesSwitchMethod "getPreferredHeightForWidth" o = Gtk.Widget.WidgetGetPreferredHeightForWidthMethodInfo
ResolvePreferencesSwitchMethod "getPreferredSize" o = Gtk.Widget.WidgetGetPreferredSizeMethodInfo
ResolvePreferencesSwitchMethod "getPreferredWidth" o = Gtk.Widget.WidgetGetPreferredWidthMethodInfo
ResolvePreferencesSwitchMethod "getPreferredWidthForHeight" o = Gtk.Widget.WidgetGetPreferredWidthForHeightMethodInfo
ResolvePreferencesSwitchMethod "getProperty" o = GObject.Object.ObjectGetPropertyMethodInfo
ResolvePreferencesSwitchMethod "getQdata" o = GObject.Object.ObjectGetQdataMethodInfo
ResolvePreferencesSwitchMethod "getRealized" o = Gtk.Widget.WidgetGetRealizedMethodInfo
ResolvePreferencesSwitchMethod "getReceivesDefault" o = Gtk.Widget.WidgetGetReceivesDefaultMethodInfo
ResolvePreferencesSwitchMethod "getRequestMode" o = Gtk.Widget.WidgetGetRequestModeMethodInfo
ResolvePreferencesSwitchMethod "getRequisition" o = Gtk.Widget.WidgetGetRequisitionMethodInfo
ResolvePreferencesSwitchMethod "getResizeMode" o = Gtk.Container.ContainerGetResizeModeMethodInfo
ResolvePreferencesSwitchMethod "getRootWindow" o = Gtk.Widget.WidgetGetRootWindowMethodInfo
ResolvePreferencesSwitchMethod "getScaleFactor" o = Gtk.Widget.WidgetGetScaleFactorMethodInfo
ResolvePreferencesSwitchMethod "getScreen" o = Gtk.Widget.WidgetGetScreenMethodInfo
ResolvePreferencesSwitchMethod "getSensitive" o = Gtk.Widget.WidgetGetSensitiveMethodInfo
ResolvePreferencesSwitchMethod "getSettings" o = Gtk.Widget.WidgetGetSettingsMethodInfo
ResolvePreferencesSwitchMethod "getSizeRequest" o = Gtk.Widget.WidgetGetSizeRequestMethodInfo
ResolvePreferencesSwitchMethod "getState" o = Gtk.Widget.WidgetGetStateMethodInfo
ResolvePreferencesSwitchMethod "getStateFlags" o = Gtk.Widget.WidgetGetStateFlagsMethodInfo
ResolvePreferencesSwitchMethod "getStyle" o = Gtk.Widget.WidgetGetStyleMethodInfo
ResolvePreferencesSwitchMethod "getStyleContext" o = Gtk.Widget.WidgetGetStyleContextMethodInfo
ResolvePreferencesSwitchMethod "getSupportMultidevice" o = Gtk.Widget.WidgetGetSupportMultideviceMethodInfo
ResolvePreferencesSwitchMethod "getTemplateChild" o = Gtk.Widget.WidgetGetTemplateChildMethodInfo
ResolvePreferencesSwitchMethod "getTooltipMarkup" o = Gtk.Widget.WidgetGetTooltipMarkupMethodInfo
ResolvePreferencesSwitchMethod "getTooltipText" o = Gtk.Widget.WidgetGetTooltipTextMethodInfo
ResolvePreferencesSwitchMethod "getTooltipWindow" o = Gtk.Widget.WidgetGetTooltipWindowMethodInfo
ResolvePreferencesSwitchMethod "getToplevel" o = Gtk.Widget.WidgetGetToplevelMethodInfo
ResolvePreferencesSwitchMethod "getValign" o = Gtk.Widget.WidgetGetValignMethodInfo
ResolvePreferencesSwitchMethod "getValignWithBaseline" o = Gtk.Widget.WidgetGetValignWithBaselineMethodInfo
ResolvePreferencesSwitchMethod "getVexpand" o = Gtk.Widget.WidgetGetVexpandMethodInfo
ResolvePreferencesSwitchMethod "getVexpandSet" o = Gtk.Widget.WidgetGetVexpandSetMethodInfo
ResolvePreferencesSwitchMethod "getVisible" o = Gtk.Widget.WidgetGetVisibleMethodInfo
ResolvePreferencesSwitchMethod "getVisual" o = Gtk.Widget.WidgetGetVisualMethodInfo
ResolvePreferencesSwitchMethod "getWindow" o = Gtk.Widget.WidgetGetWindowMethodInfo
ResolvePreferencesSwitchMethod "setAccelPath" o = Gtk.Widget.WidgetSetAccelPathMethodInfo
ResolvePreferencesSwitchMethod "setAllocation" o = Gtk.Widget.WidgetSetAllocationMethodInfo
ResolvePreferencesSwitchMethod "setAppPaintable" o = Gtk.Widget.WidgetSetAppPaintableMethodInfo
ResolvePreferencesSwitchMethod "setBorderWidth" o = Gtk.Container.ContainerSetBorderWidthMethodInfo
ResolvePreferencesSwitchMethod "setBuildableProperty" o = Gtk.Buildable.BuildableSetBuildablePropertyMethodInfo
ResolvePreferencesSwitchMethod "setCanDefault" o = Gtk.Widget.WidgetSetCanDefaultMethodInfo
ResolvePreferencesSwitchMethod "setCanFocus" o = Gtk.Widget.WidgetSetCanFocusMethodInfo
ResolvePreferencesSwitchMethod "setChildVisible" o = Gtk.Widget.WidgetSetChildVisibleMethodInfo
ResolvePreferencesSwitchMethod "setClip" o = Gtk.Widget.WidgetSetClipMethodInfo
ResolvePreferencesSwitchMethod "setCompositeName" o = Gtk.Widget.WidgetSetCompositeNameMethodInfo
ResolvePreferencesSwitchMethod "setData" o = GObject.Object.ObjectSetDataMethodInfo
ResolvePreferencesSwitchMethod "setDataFull" o = GObject.Object.ObjectSetDataFullMethodInfo
ResolvePreferencesSwitchMethod "setDeviceEnabled" o = Gtk.Widget.WidgetSetDeviceEnabledMethodInfo
ResolvePreferencesSwitchMethod "setDeviceEvents" o = Gtk.Widget.WidgetSetDeviceEventsMethodInfo
ResolvePreferencesSwitchMethod "setDirection" o = Gtk.Widget.WidgetSetDirectionMethodInfo
ResolvePreferencesSwitchMethod "setDoubleBuffered" o = Gtk.Widget.WidgetSetDoubleBufferedMethodInfo
ResolvePreferencesSwitchMethod "setEvents" o = Gtk.Widget.WidgetSetEventsMethodInfo
ResolvePreferencesSwitchMethod "setFocusChain" o = Gtk.Container.ContainerSetFocusChainMethodInfo
ResolvePreferencesSwitchMethod "setFocusChild" o = Gtk.Container.ContainerSetFocusChildMethodInfo
ResolvePreferencesSwitchMethod "setFocusHadjustment" o = Gtk.Container.ContainerSetFocusHadjustmentMethodInfo
ResolvePreferencesSwitchMethod "setFocusOnClick" o = Gtk.Widget.WidgetSetFocusOnClickMethodInfo
ResolvePreferencesSwitchMethod "setFocusVadjustment" o = Gtk.Container.ContainerSetFocusVadjustmentMethodInfo
ResolvePreferencesSwitchMethod "setFontMap" o = Gtk.Widget.WidgetSetFontMapMethodInfo
ResolvePreferencesSwitchMethod "setFontOptions" o = Gtk.Widget.WidgetSetFontOptionsMethodInfo
ResolvePreferencesSwitchMethod "setHalign" o = Gtk.Widget.WidgetSetHalignMethodInfo
ResolvePreferencesSwitchMethod "setHasTooltip" o = Gtk.Widget.WidgetSetHasTooltipMethodInfo
ResolvePreferencesSwitchMethod "setHasWindow" o = Gtk.Widget.WidgetSetHasWindowMethodInfo
ResolvePreferencesSwitchMethod "setHexpand" o = Gtk.Widget.WidgetSetHexpandMethodInfo
ResolvePreferencesSwitchMethod "setHexpandSet" o = Gtk.Widget.WidgetSetHexpandSetMethodInfo
ResolvePreferencesSwitchMethod "setMapped" o = Gtk.Widget.WidgetSetMappedMethodInfo
ResolvePreferencesSwitchMethod "setMarginBottom" o = Gtk.Widget.WidgetSetMarginBottomMethodInfo
ResolvePreferencesSwitchMethod "setMarginEnd" o = Gtk.Widget.WidgetSetMarginEndMethodInfo
ResolvePreferencesSwitchMethod "setMarginLeft" o = Gtk.Widget.WidgetSetMarginLeftMethodInfo
ResolvePreferencesSwitchMethod "setMarginRight" o = Gtk.Widget.WidgetSetMarginRightMethodInfo
ResolvePreferencesSwitchMethod "setMarginStart" o = Gtk.Widget.WidgetSetMarginStartMethodInfo
ResolvePreferencesSwitchMethod "setMarginTop" o = Gtk.Widget.WidgetSetMarginTopMethodInfo
ResolvePreferencesSwitchMethod "setName" o = Gtk.Widget.WidgetSetNameMethodInfo
ResolvePreferencesSwitchMethod "setNoShowAll" o = Gtk.Widget.WidgetSetNoShowAllMethodInfo
ResolvePreferencesSwitchMethod "setOpacity" o = Gtk.Widget.WidgetSetOpacityMethodInfo
ResolvePreferencesSwitchMethod "setParent" o = Gtk.Widget.WidgetSetParentMethodInfo
ResolvePreferencesSwitchMethod "setParentWindow" o = Gtk.Widget.WidgetSetParentWindowMethodInfo
ResolvePreferencesSwitchMethod "setProperty" o = GObject.Object.ObjectSetPropertyMethodInfo
ResolvePreferencesSwitchMethod "setRealized" o = Gtk.Widget.WidgetSetRealizedMethodInfo
ResolvePreferencesSwitchMethod "setReallocateRedraws" o = Gtk.Container.ContainerSetReallocateRedrawsMethodInfo
ResolvePreferencesSwitchMethod "setReceivesDefault" o = Gtk.Widget.WidgetSetReceivesDefaultMethodInfo
ResolvePreferencesSwitchMethod "setRedrawOnAllocate" o = Gtk.Widget.WidgetSetRedrawOnAllocateMethodInfo
ResolvePreferencesSwitchMethod "setResizeMode" o = Gtk.Container.ContainerSetResizeModeMethodInfo
ResolvePreferencesSwitchMethod "setSensitive" o = Gtk.Widget.WidgetSetSensitiveMethodInfo
ResolvePreferencesSwitchMethod "setSizeRequest" o = Gtk.Widget.WidgetSetSizeRequestMethodInfo
ResolvePreferencesSwitchMethod "setState" o = Gtk.Widget.WidgetSetStateMethodInfo
ResolvePreferencesSwitchMethod "setStateFlags" o = Gtk.Widget.WidgetSetStateFlagsMethodInfo
ResolvePreferencesSwitchMethod "setStyle" o = Gtk.Widget.WidgetSetStyleMethodInfo
ResolvePreferencesSwitchMethod "setSupportMultidevice" o = Gtk.Widget.WidgetSetSupportMultideviceMethodInfo
ResolvePreferencesSwitchMethod "setTooltipMarkup" o = Gtk.Widget.WidgetSetTooltipMarkupMethodInfo
ResolvePreferencesSwitchMethod "setTooltipText" o = Gtk.Widget.WidgetSetTooltipTextMethodInfo
ResolvePreferencesSwitchMethod "setTooltipWindow" o = Gtk.Widget.WidgetSetTooltipWindowMethodInfo
ResolvePreferencesSwitchMethod "setValign" o = Gtk.Widget.WidgetSetValignMethodInfo
ResolvePreferencesSwitchMethod "setVexpand" o = Gtk.Widget.WidgetSetVexpandMethodInfo
ResolvePreferencesSwitchMethod "setVexpandSet" o = Gtk.Widget.WidgetSetVexpandSetMethodInfo
ResolvePreferencesSwitchMethod "setVisible" o = Gtk.Widget.WidgetSetVisibleMethodInfo
ResolvePreferencesSwitchMethod "setVisual" o = Gtk.Widget.WidgetSetVisualMethodInfo
ResolvePreferencesSwitchMethod "setWindow" o = Gtk.Widget.WidgetSetWindowMethodInfo
ResolvePreferencesSwitchMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolvePreferencesSwitchMethod t PreferencesSwitch, O.OverloadedMethod info PreferencesSwitch p) => OL.IsLabel t (PreferencesSwitch -> 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 ~ ResolvePreferencesSwitchMethod t PreferencesSwitch, O.OverloadedMethod info PreferencesSwitch p, R.HasField t PreferencesSwitch p) => R.HasField t PreferencesSwitch p where
getField = O.overloadedMethod @info
#endif
instance (info ~ ResolvePreferencesSwitchMethod t PreferencesSwitch, O.OverloadedMethodInfo info PreferencesSwitch) => OL.IsLabel t (O.MethodProxy info PreferencesSwitch) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.MethodProxy
#else
fromLabel _ = O.MethodProxy
#endif
#endif
type PreferencesSwitchActivatedCallback =
IO ()
type C_PreferencesSwitchActivatedCallback =
Ptr PreferencesSwitch ->
Ptr () ->
IO ()
foreign import ccall "wrapper"
mk_PreferencesSwitchActivatedCallback :: C_PreferencesSwitchActivatedCallback -> IO (FunPtr C_PreferencesSwitchActivatedCallback)
wrap_PreferencesSwitchActivatedCallback ::
GObject a => (a -> PreferencesSwitchActivatedCallback) ->
C_PreferencesSwitchActivatedCallback
wrap_PreferencesSwitchActivatedCallback :: forall a.
GObject a =>
(a -> IO ()) -> C_PreferencesSwitchActivatedCallback
wrap_PreferencesSwitchActivatedCallback a -> IO ()
gi'cb Ptr PreferencesSwitch
gi'selfPtr Ptr ()
_ = do
Ptr PreferencesSwitch -> (PreferencesSwitch -> IO ()) -> IO ()
forall o b.
(HasCallStack, GObject o) =>
Ptr o -> (o -> IO b) -> IO b
B.ManagedPtr.withNewObject Ptr PreferencesSwitch
gi'selfPtr ((PreferencesSwitch -> IO ()) -> IO ())
-> (PreferencesSwitch -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \PreferencesSwitch
gi'self -> a -> IO ()
gi'cb (PreferencesSwitch -> a
forall a b. Coercible a b => a -> b
Coerce.coerce PreferencesSwitch
gi'self)
onPreferencesSwitchActivated :: (IsPreferencesSwitch a, MonadIO m) => a -> ((?self :: a) => PreferencesSwitchActivatedCallback) -> m SignalHandlerId
onPreferencesSwitchActivated :: forall a (m :: * -> *).
(IsPreferencesSwitch a, MonadIO m) =>
a -> ((?self::a) => IO ()) -> m SignalHandlerId
onPreferencesSwitchActivated a
obj (?self::a) => IO ()
cb = IO SignalHandlerId -> m SignalHandlerId
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO SignalHandlerId -> m SignalHandlerId)
-> IO SignalHandlerId -> m SignalHandlerId
forall a b. (a -> b) -> a -> b
$ do
let wrapped :: a -> IO ()
wrapped a
self = let ?self = a
?self::a
self in IO ()
(?self::a) => IO ()
cb
let wrapped' :: C_PreferencesSwitchActivatedCallback
wrapped' = (a -> IO ()) -> C_PreferencesSwitchActivatedCallback
forall a.
GObject a =>
(a -> IO ()) -> C_PreferencesSwitchActivatedCallback
wrap_PreferencesSwitchActivatedCallback a -> IO ()
wrapped
FunPtr C_PreferencesSwitchActivatedCallback
wrapped'' <- C_PreferencesSwitchActivatedCallback
-> IO (FunPtr C_PreferencesSwitchActivatedCallback)
mk_PreferencesSwitchActivatedCallback C_PreferencesSwitchActivatedCallback
wrapped'
a
-> Text
-> FunPtr C_PreferencesSwitchActivatedCallback
-> SignalConnectMode
-> Maybe Text
-> IO SignalHandlerId
forall o a.
GObject o =>
o
-> Text
-> FunPtr a
-> SignalConnectMode
-> Maybe Text
-> IO SignalHandlerId
connectSignalFunPtr a
obj Text
"activated" FunPtr C_PreferencesSwitchActivatedCallback
wrapped'' SignalConnectMode
SignalConnectBefore Maybe Text
forall a. Maybe a
Nothing
afterPreferencesSwitchActivated :: (IsPreferencesSwitch a, MonadIO m) => a -> ((?self :: a) => PreferencesSwitchActivatedCallback) -> m SignalHandlerId
afterPreferencesSwitchActivated :: forall a (m :: * -> *).
(IsPreferencesSwitch a, MonadIO m) =>
a -> ((?self::a) => IO ()) -> m SignalHandlerId
afterPreferencesSwitchActivated a
obj (?self::a) => IO ()
cb = IO SignalHandlerId -> m SignalHandlerId
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO SignalHandlerId -> m SignalHandlerId)
-> IO SignalHandlerId -> m SignalHandlerId
forall a b. (a -> b) -> a -> b
$ do
let wrapped :: a -> IO ()
wrapped a
self = let ?self = a
?self::a
self in IO ()
(?self::a) => IO ()
cb
let wrapped' :: C_PreferencesSwitchActivatedCallback
wrapped' = (a -> IO ()) -> C_PreferencesSwitchActivatedCallback
forall a.
GObject a =>
(a -> IO ()) -> C_PreferencesSwitchActivatedCallback
wrap_PreferencesSwitchActivatedCallback a -> IO ()
wrapped
FunPtr C_PreferencesSwitchActivatedCallback
wrapped'' <- C_PreferencesSwitchActivatedCallback
-> IO (FunPtr C_PreferencesSwitchActivatedCallback)
mk_PreferencesSwitchActivatedCallback C_PreferencesSwitchActivatedCallback
wrapped'
a
-> Text
-> FunPtr C_PreferencesSwitchActivatedCallback
-> SignalConnectMode
-> Maybe Text
-> IO SignalHandlerId
forall o a.
GObject o =>
o
-> Text
-> FunPtr a
-> SignalConnectMode
-> Maybe Text
-> IO SignalHandlerId
connectSignalFunPtr a
obj Text
"activated" FunPtr C_PreferencesSwitchActivatedCallback
wrapped'' SignalConnectMode
SignalConnectAfter Maybe Text
forall a. Maybe a
Nothing
#if defined(ENABLE_OVERLOADING)
data PreferencesSwitchActivatedSignalInfo
instance SignalInfo PreferencesSwitchActivatedSignalInfo where
type HaskellCallbackType PreferencesSwitchActivatedSignalInfo = PreferencesSwitchActivatedCallback
connectSignal obj cb connectMode detail = do
let cb' = wrap_PreferencesSwitchActivatedCallback cb
cb'' <- mk_PreferencesSwitchActivatedCallback cb'
connectSignalFunPtr obj "activated" cb'' connectMode detail
dbgSignalInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.PreferencesSwitch::activated"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-PreferencesSwitch.html#g:signal:activated"})
#endif
getPreferencesSwitchIsRadio :: (MonadIO m, IsPreferencesSwitch o) => o -> m Bool
getPreferencesSwitchIsRadio :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesSwitch o) =>
o -> m Bool
getPreferencesSwitchIsRadio o
obj = IO Bool -> m Bool
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Bool -> m Bool) -> IO Bool -> m Bool
forall a b. (a -> b) -> a -> b
$ o -> String -> IO Bool
forall a. GObject a => a -> String -> IO Bool
B.Properties.getObjectPropertyBool o
obj String
"is-radio"
constructPreferencesSwitchIsRadio :: (IsPreferencesSwitch o, MIO.MonadIO m) => Bool -> m (GValueConstruct o)
constructPreferencesSwitchIsRadio :: forall o (m :: * -> *).
(IsPreferencesSwitch o, MonadIO m) =>
Bool -> m (GValueConstruct o)
constructPreferencesSwitchIsRadio Bool
val = IO (GValueConstruct o) -> m (GValueConstruct o)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> m (GValueConstruct o))
-> IO (GValueConstruct o) -> m (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ do
IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a. IO a -> IO a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> IO (GValueConstruct o))
-> IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ String -> Bool -> IO (GValueConstruct o)
forall o. String -> Bool -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyBool String
"is-radio" Bool
val
#if defined(ENABLE_OVERLOADING)
data PreferencesSwitchIsRadioPropertyInfo
instance AttrInfo PreferencesSwitchIsRadioPropertyInfo where
type AttrAllowedOps PreferencesSwitchIsRadioPropertyInfo = '[ 'AttrConstruct, 'AttrGet]
type AttrBaseTypeConstraint PreferencesSwitchIsRadioPropertyInfo = IsPreferencesSwitch
type AttrSetTypeConstraint PreferencesSwitchIsRadioPropertyInfo = (~) Bool
type AttrTransferTypeConstraint PreferencesSwitchIsRadioPropertyInfo = (~) Bool
type AttrTransferType PreferencesSwitchIsRadioPropertyInfo = Bool
type AttrGetType PreferencesSwitchIsRadioPropertyInfo = Bool
type AttrLabel PreferencesSwitchIsRadioPropertyInfo = "is-radio"
type AttrOrigin PreferencesSwitchIsRadioPropertyInfo = PreferencesSwitch
attrGet = getPreferencesSwitchIsRadio
attrSet = undefined
attrTransfer _ v = do
return v
attrConstruct = constructPreferencesSwitchIsRadio
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.PreferencesSwitch.isRadio"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-PreferencesSwitch.html#g:attr:isRadio"
})
#endif
getPreferencesSwitchKey :: (MonadIO m, IsPreferencesSwitch o) => o -> m (Maybe T.Text)
getPreferencesSwitchKey :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesSwitch o) =>
o -> m (Maybe Text)
getPreferencesSwitchKey o
obj = IO (Maybe Text) -> m (Maybe Text)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (Maybe Text) -> m (Maybe Text))
-> IO (Maybe Text) -> m (Maybe Text)
forall a b. (a -> b) -> a -> b
$ o -> String -> IO (Maybe Text)
forall a. GObject a => a -> String -> IO (Maybe Text)
B.Properties.getObjectPropertyString o
obj String
"key"
constructPreferencesSwitchKey :: (IsPreferencesSwitch o, MIO.MonadIO m) => T.Text -> m (GValueConstruct o)
constructPreferencesSwitchKey :: forall o (m :: * -> *).
(IsPreferencesSwitch o, MonadIO m) =>
Text -> m (GValueConstruct o)
constructPreferencesSwitchKey Text
val = IO (GValueConstruct o) -> m (GValueConstruct o)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> m (GValueConstruct o))
-> IO (GValueConstruct o) -> m (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ do
IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a. IO a -> IO a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> IO (GValueConstruct o))
-> IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ String -> Maybe Text -> IO (GValueConstruct o)
forall o. String -> Maybe Text -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyString String
"key" (Text -> Maybe Text
forall a. a -> Maybe a
P.Just Text
val)
#if defined(ENABLE_OVERLOADING)
data PreferencesSwitchKeyPropertyInfo
instance AttrInfo PreferencesSwitchKeyPropertyInfo where
type AttrAllowedOps PreferencesSwitchKeyPropertyInfo = '[ 'AttrConstruct, 'AttrGet, 'AttrClear]
type AttrBaseTypeConstraint PreferencesSwitchKeyPropertyInfo = IsPreferencesSwitch
type AttrSetTypeConstraint PreferencesSwitchKeyPropertyInfo = (~) T.Text
type AttrTransferTypeConstraint PreferencesSwitchKeyPropertyInfo = (~) T.Text
type AttrTransferType PreferencesSwitchKeyPropertyInfo = T.Text
type AttrGetType PreferencesSwitchKeyPropertyInfo = (Maybe T.Text)
type AttrLabel PreferencesSwitchKeyPropertyInfo = "key"
type AttrOrigin PreferencesSwitchKeyPropertyInfo = PreferencesSwitch
attrGet = getPreferencesSwitchKey
attrSet = undefined
attrTransfer _ v = do
return v
attrConstruct = constructPreferencesSwitchKey
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.PreferencesSwitch.key"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-PreferencesSwitch.html#g:attr:key"
})
#endif
getPreferencesSwitchSubtitle :: (MonadIO m, IsPreferencesSwitch o) => o -> m (Maybe T.Text)
getPreferencesSwitchSubtitle :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesSwitch o) =>
o -> m (Maybe Text)
getPreferencesSwitchSubtitle o
obj = IO (Maybe Text) -> m (Maybe Text)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (Maybe Text) -> m (Maybe Text))
-> IO (Maybe Text) -> m (Maybe Text)
forall a b. (a -> b) -> a -> b
$ o -> String -> IO (Maybe Text)
forall a. GObject a => a -> String -> IO (Maybe Text)
B.Properties.getObjectPropertyString o
obj String
"subtitle"
setPreferencesSwitchSubtitle :: (MonadIO m, IsPreferencesSwitch o) => o -> T.Text -> m ()
setPreferencesSwitchSubtitle :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesSwitch o) =>
o -> Text -> m ()
setPreferencesSwitchSubtitle o
obj Text
val = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
o -> String -> Maybe Text -> IO ()
forall a. GObject a => a -> String -> Maybe Text -> IO ()
B.Properties.setObjectPropertyString o
obj String
"subtitle" (Text -> Maybe Text
forall a. a -> Maybe a
Just Text
val)
constructPreferencesSwitchSubtitle :: (IsPreferencesSwitch o, MIO.MonadIO m) => T.Text -> m (GValueConstruct o)
constructPreferencesSwitchSubtitle :: forall o (m :: * -> *).
(IsPreferencesSwitch o, MonadIO m) =>
Text -> m (GValueConstruct o)
constructPreferencesSwitchSubtitle Text
val = IO (GValueConstruct o) -> m (GValueConstruct o)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> m (GValueConstruct o))
-> IO (GValueConstruct o) -> m (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ do
IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a. IO a -> IO a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> IO (GValueConstruct o))
-> IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ String -> Maybe Text -> IO (GValueConstruct o)
forall o. String -> Maybe Text -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyString String
"subtitle" (Text -> Maybe Text
forall a. a -> Maybe a
P.Just Text
val)
clearPreferencesSwitchSubtitle :: (MonadIO m, IsPreferencesSwitch o) => o -> m ()
clearPreferencesSwitchSubtitle :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesSwitch o) =>
o -> m ()
clearPreferencesSwitchSubtitle o
obj = 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
$ o -> String -> Maybe Text -> IO ()
forall a. GObject a => a -> String -> Maybe Text -> IO ()
B.Properties.setObjectPropertyString o
obj String
"subtitle" (Maybe Text
forall a. Maybe a
Nothing :: Maybe T.Text)
#if defined(ENABLE_OVERLOADING)
data PreferencesSwitchSubtitlePropertyInfo
instance AttrInfo PreferencesSwitchSubtitlePropertyInfo where
type AttrAllowedOps PreferencesSwitchSubtitlePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet, 'AttrClear]
type AttrBaseTypeConstraint PreferencesSwitchSubtitlePropertyInfo = IsPreferencesSwitch
type AttrSetTypeConstraint PreferencesSwitchSubtitlePropertyInfo = (~) T.Text
type AttrTransferTypeConstraint PreferencesSwitchSubtitlePropertyInfo = (~) T.Text
type AttrTransferType PreferencesSwitchSubtitlePropertyInfo = T.Text
type AttrGetType PreferencesSwitchSubtitlePropertyInfo = (Maybe T.Text)
type AttrLabel PreferencesSwitchSubtitlePropertyInfo = "subtitle"
type AttrOrigin PreferencesSwitchSubtitlePropertyInfo = PreferencesSwitch
attrGet = getPreferencesSwitchSubtitle
attrSet = setPreferencesSwitchSubtitle
attrTransfer _ v = do
return v
attrConstruct = constructPreferencesSwitchSubtitle
attrClear = clearPreferencesSwitchSubtitle
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.PreferencesSwitch.subtitle"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-PreferencesSwitch.html#g:attr:subtitle"
})
#endif
getPreferencesSwitchTarget :: (MonadIO m, IsPreferencesSwitch o) => o -> m (Maybe GVariant)
getPreferencesSwitchTarget :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesSwitch o) =>
o -> m (Maybe GVariant)
getPreferencesSwitchTarget o
obj = IO (Maybe GVariant) -> m (Maybe GVariant)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (Maybe GVariant) -> m (Maybe GVariant))
-> IO (Maybe GVariant) -> m (Maybe GVariant)
forall a b. (a -> b) -> a -> b
$ o -> String -> IO (Maybe GVariant)
forall a. GObject a => a -> String -> IO (Maybe GVariant)
B.Properties.getObjectPropertyVariant o
obj String
"target"
constructPreferencesSwitchTarget :: (IsPreferencesSwitch o, MIO.MonadIO m) => GVariant -> m (GValueConstruct o)
constructPreferencesSwitchTarget :: forall o (m :: * -> *).
(IsPreferencesSwitch o, MonadIO m) =>
GVariant -> m (GValueConstruct o)
constructPreferencesSwitchTarget GVariant
val = IO (GValueConstruct o) -> m (GValueConstruct o)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> m (GValueConstruct o))
-> IO (GValueConstruct o) -> m (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ do
IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a. IO a -> IO a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> IO (GValueConstruct o))
-> IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ String -> Maybe GVariant -> IO (GValueConstruct o)
forall o. String -> Maybe GVariant -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyVariant String
"target" (GVariant -> Maybe GVariant
forall a. a -> Maybe a
P.Just GVariant
val)
#if defined(ENABLE_OVERLOADING)
data PreferencesSwitchTargetPropertyInfo
instance AttrInfo PreferencesSwitchTargetPropertyInfo where
type AttrAllowedOps PreferencesSwitchTargetPropertyInfo = '[ 'AttrConstruct, 'AttrGet, 'AttrClear]
type AttrBaseTypeConstraint PreferencesSwitchTargetPropertyInfo = IsPreferencesSwitch
type AttrSetTypeConstraint PreferencesSwitchTargetPropertyInfo = (~) GVariant
type AttrTransferTypeConstraint PreferencesSwitchTargetPropertyInfo = (~) GVariant
type AttrTransferType PreferencesSwitchTargetPropertyInfo = GVariant
type AttrGetType PreferencesSwitchTargetPropertyInfo = (Maybe GVariant)
type AttrLabel PreferencesSwitchTargetPropertyInfo = "target"
type AttrOrigin PreferencesSwitchTargetPropertyInfo = PreferencesSwitch
attrGet = getPreferencesSwitchTarget
attrSet = undefined
attrTransfer _ v = do
return v
attrConstruct = constructPreferencesSwitchTarget
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.PreferencesSwitch.target"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-PreferencesSwitch.html#g:attr:target"
})
#endif
getPreferencesSwitchTitle :: (MonadIO m, IsPreferencesSwitch o) => o -> m (Maybe T.Text)
getPreferencesSwitchTitle :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesSwitch o) =>
o -> m (Maybe Text)
getPreferencesSwitchTitle o
obj = IO (Maybe Text) -> m (Maybe Text)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (Maybe Text) -> m (Maybe Text))
-> IO (Maybe Text) -> m (Maybe Text)
forall a b. (a -> b) -> a -> b
$ o -> String -> IO (Maybe Text)
forall a. GObject a => a -> String -> IO (Maybe Text)
B.Properties.getObjectPropertyString o
obj String
"title"
setPreferencesSwitchTitle :: (MonadIO m, IsPreferencesSwitch o) => o -> T.Text -> m ()
setPreferencesSwitchTitle :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesSwitch o) =>
o -> Text -> m ()
setPreferencesSwitchTitle o
obj Text
val = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
o -> String -> Maybe Text -> IO ()
forall a. GObject a => a -> String -> Maybe Text -> IO ()
B.Properties.setObjectPropertyString o
obj String
"title" (Text -> Maybe Text
forall a. a -> Maybe a
Just Text
val)
constructPreferencesSwitchTitle :: (IsPreferencesSwitch o, MIO.MonadIO m) => T.Text -> m (GValueConstruct o)
constructPreferencesSwitchTitle :: forall o (m :: * -> *).
(IsPreferencesSwitch o, MonadIO m) =>
Text -> m (GValueConstruct o)
constructPreferencesSwitchTitle Text
val = IO (GValueConstruct o) -> m (GValueConstruct o)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> m (GValueConstruct o))
-> IO (GValueConstruct o) -> m (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ do
IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a. IO a -> IO a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> IO (GValueConstruct o))
-> IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ String -> Maybe Text -> IO (GValueConstruct o)
forall o. String -> Maybe Text -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyString String
"title" (Text -> Maybe Text
forall a. a -> Maybe a
P.Just Text
val)
clearPreferencesSwitchTitle :: (MonadIO m, IsPreferencesSwitch o) => o -> m ()
clearPreferencesSwitchTitle :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesSwitch o) =>
o -> m ()
clearPreferencesSwitchTitle o
obj = 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
$ o -> String -> Maybe Text -> IO ()
forall a. GObject a => a -> String -> Maybe Text -> IO ()
B.Properties.setObjectPropertyString o
obj String
"title" (Maybe Text
forall a. Maybe a
Nothing :: Maybe T.Text)
#if defined(ENABLE_OVERLOADING)
data PreferencesSwitchTitlePropertyInfo
instance AttrInfo PreferencesSwitchTitlePropertyInfo where
type AttrAllowedOps PreferencesSwitchTitlePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet, 'AttrClear]
type AttrBaseTypeConstraint PreferencesSwitchTitlePropertyInfo = IsPreferencesSwitch
type AttrSetTypeConstraint PreferencesSwitchTitlePropertyInfo = (~) T.Text
type AttrTransferTypeConstraint PreferencesSwitchTitlePropertyInfo = (~) T.Text
type AttrTransferType PreferencesSwitchTitlePropertyInfo = T.Text
type AttrGetType PreferencesSwitchTitlePropertyInfo = (Maybe T.Text)
type AttrLabel PreferencesSwitchTitlePropertyInfo = "title"
type AttrOrigin PreferencesSwitchTitlePropertyInfo = PreferencesSwitch
attrGet = getPreferencesSwitchTitle
attrSet = setPreferencesSwitchTitle
attrTransfer _ v = do
return v
attrConstruct = constructPreferencesSwitchTitle
attrClear = clearPreferencesSwitchTitle
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.PreferencesSwitch.title"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-PreferencesSwitch.html#g:attr:title"
})
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList PreferencesSwitch
type instance O.AttributeList PreferencesSwitch = PreferencesSwitchAttributeList
type PreferencesSwitchAttributeList = ('[ '("appPaintable", Gtk.Widget.WidgetAppPaintablePropertyInfo), '("borderWidth", Gtk.Container.ContainerBorderWidthPropertyInfo), '("canDefault", Gtk.Widget.WidgetCanDefaultPropertyInfo), '("canFocus", Gtk.Widget.WidgetCanFocusPropertyInfo), '("child", Gtk.Container.ContainerChildPropertyInfo), '("compositeChild", Gtk.Widget.WidgetCompositeChildPropertyInfo), '("doubleBuffered", Gtk.Widget.WidgetDoubleBufferedPropertyInfo), '("events", Gtk.Widget.WidgetEventsPropertyInfo), '("expand", Gtk.Widget.WidgetExpandPropertyInfo), '("focusOnClick", Gtk.Widget.WidgetFocusOnClickPropertyInfo), '("halign", Gtk.Widget.WidgetHalignPropertyInfo), '("hasDefault", Gtk.Widget.WidgetHasDefaultPropertyInfo), '("hasFocus", Gtk.Widget.WidgetHasFocusPropertyInfo), '("hasTooltip", Gtk.Widget.WidgetHasTooltipPropertyInfo), '("heightRequest", Gtk.Widget.WidgetHeightRequestPropertyInfo), '("hexpand", Gtk.Widget.WidgetHexpandPropertyInfo), '("hexpandSet", Gtk.Widget.WidgetHexpandSetPropertyInfo), '("isFocus", Gtk.Widget.WidgetIsFocusPropertyInfo), '("isRadio", PreferencesSwitchIsRadioPropertyInfo), '("key", PreferencesSwitchKeyPropertyInfo), '("keywords", Dazzle.PreferencesBin.PreferencesBinKeywordsPropertyInfo), '("margin", Gtk.Widget.WidgetMarginPropertyInfo), '("marginBottom", Gtk.Widget.WidgetMarginBottomPropertyInfo), '("marginEnd", Gtk.Widget.WidgetMarginEndPropertyInfo), '("marginLeft", Gtk.Widget.WidgetMarginLeftPropertyInfo), '("marginRight", Gtk.Widget.WidgetMarginRightPropertyInfo), '("marginStart", Gtk.Widget.WidgetMarginStartPropertyInfo), '("marginTop", Gtk.Widget.WidgetMarginTopPropertyInfo), '("name", Gtk.Widget.WidgetNamePropertyInfo), '("noShowAll", Gtk.Widget.WidgetNoShowAllPropertyInfo), '("opacity", Gtk.Widget.WidgetOpacityPropertyInfo), '("parent", Gtk.Widget.WidgetParentPropertyInfo), '("path", Dazzle.PreferencesBin.PreferencesBinPathPropertyInfo), '("priority", Dazzle.PreferencesBin.PreferencesBinPriorityPropertyInfo), '("receivesDefault", Gtk.Widget.WidgetReceivesDefaultPropertyInfo), '("resizeMode", Gtk.Container.ContainerResizeModePropertyInfo), '("scaleFactor", Gtk.Widget.WidgetScaleFactorPropertyInfo), '("schemaId", Dazzle.PreferencesBin.PreferencesBinSchemaIdPropertyInfo), '("sensitive", Gtk.Widget.WidgetSensitivePropertyInfo), '("style", Gtk.Widget.WidgetStylePropertyInfo), '("subtitle", PreferencesSwitchSubtitlePropertyInfo), '("target", PreferencesSwitchTargetPropertyInfo), '("title", PreferencesSwitchTitlePropertyInfo), '("tooltipMarkup", Gtk.Widget.WidgetTooltipMarkupPropertyInfo), '("tooltipText", Gtk.Widget.WidgetTooltipTextPropertyInfo), '("valign", Gtk.Widget.WidgetValignPropertyInfo), '("vexpand", Gtk.Widget.WidgetVexpandPropertyInfo), '("vexpandSet", Gtk.Widget.WidgetVexpandSetPropertyInfo), '("visible", Gtk.Widget.WidgetVisiblePropertyInfo), '("widthRequest", Gtk.Widget.WidgetWidthRequestPropertyInfo), '("window", Gtk.Widget.WidgetWindowPropertyInfo)] :: [(Symbol, DK.Type)])
#endif
#if defined(ENABLE_OVERLOADING)
preferencesSwitchIsRadio :: AttrLabelProxy "isRadio"
preferencesSwitchIsRadio = AttrLabelProxy
preferencesSwitchKey :: AttrLabelProxy "key"
preferencesSwitchKey = AttrLabelProxy
preferencesSwitchSubtitle :: AttrLabelProxy "subtitle"
preferencesSwitchSubtitle = AttrLabelProxy
preferencesSwitchTarget :: AttrLabelProxy "target"
preferencesSwitchTarget = AttrLabelProxy
preferencesSwitchTitle :: AttrLabelProxy "title"
preferencesSwitchTitle = AttrLabelProxy
#endif
#if defined(ENABLE_OVERLOADING)
type instance O.SignalList PreferencesSwitch = PreferencesSwitchSignalList
type PreferencesSwitchSignalList = ('[ '("accelClosuresChanged", Gtk.Widget.WidgetAccelClosuresChangedSignalInfo), '("activated", PreferencesSwitchActivatedSignalInfo), '("add", Gtk.Container.ContainerAddSignalInfo), '("buttonPressEvent", Gtk.Widget.WidgetButtonPressEventSignalInfo), '("buttonReleaseEvent", Gtk.Widget.WidgetButtonReleaseEventSignalInfo), '("canActivateAccel", Gtk.Widget.WidgetCanActivateAccelSignalInfo), '("checkResize", Gtk.Container.ContainerCheckResizeSignalInfo), '("childNotify", Gtk.Widget.WidgetChildNotifySignalInfo), '("compositedChanged", Gtk.Widget.WidgetCompositedChangedSignalInfo), '("configureEvent", Gtk.Widget.WidgetConfigureEventSignalInfo), '("damageEvent", Gtk.Widget.WidgetDamageEventSignalInfo), '("deleteEvent", Gtk.Widget.WidgetDeleteEventSignalInfo), '("destroy", Gtk.Widget.WidgetDestroySignalInfo), '("destroyEvent", Gtk.Widget.WidgetDestroyEventSignalInfo), '("directionChanged", Gtk.Widget.WidgetDirectionChangedSignalInfo), '("dragBegin", Gtk.Widget.WidgetDragBeginSignalInfo), '("dragDataDelete", Gtk.Widget.WidgetDragDataDeleteSignalInfo), '("dragDataGet", Gtk.Widget.WidgetDragDataGetSignalInfo), '("dragDataReceived", Gtk.Widget.WidgetDragDataReceivedSignalInfo), '("dragDrop", Gtk.Widget.WidgetDragDropSignalInfo), '("dragEnd", Gtk.Widget.WidgetDragEndSignalInfo), '("dragFailed", Gtk.Widget.WidgetDragFailedSignalInfo), '("dragLeave", Gtk.Widget.WidgetDragLeaveSignalInfo), '("dragMotion", Gtk.Widget.WidgetDragMotionSignalInfo), '("draw", Gtk.Widget.WidgetDrawSignalInfo), '("enterNotifyEvent", Gtk.Widget.WidgetEnterNotifyEventSignalInfo), '("event", Gtk.Widget.WidgetEventSignalInfo), '("eventAfter", Gtk.Widget.WidgetEventAfterSignalInfo), '("focus", Gtk.Widget.WidgetFocusSignalInfo), '("focusInEvent", Gtk.Widget.WidgetFocusInEventSignalInfo), '("focusOutEvent", Gtk.Widget.WidgetFocusOutEventSignalInfo), '("grabBrokenEvent", Gtk.Widget.WidgetGrabBrokenEventSignalInfo), '("grabFocus", Gtk.Widget.WidgetGrabFocusSignalInfo), '("grabNotify", Gtk.Widget.WidgetGrabNotifySignalInfo), '("hide", Gtk.Widget.WidgetHideSignalInfo), '("hierarchyChanged", Gtk.Widget.WidgetHierarchyChangedSignalInfo), '("keyPressEvent", Gtk.Widget.WidgetKeyPressEventSignalInfo), '("keyReleaseEvent", Gtk.Widget.WidgetKeyReleaseEventSignalInfo), '("keynavFailed", Gtk.Widget.WidgetKeynavFailedSignalInfo), '("leaveNotifyEvent", Gtk.Widget.WidgetLeaveNotifyEventSignalInfo), '("map", Gtk.Widget.WidgetMapSignalInfo), '("mapEvent", Gtk.Widget.WidgetMapEventSignalInfo), '("mnemonicActivate", Gtk.Widget.WidgetMnemonicActivateSignalInfo), '("motionNotifyEvent", Gtk.Widget.WidgetMotionNotifyEventSignalInfo), '("moveFocus", Gtk.Widget.WidgetMoveFocusSignalInfo), '("notify", GObject.Object.ObjectNotifySignalInfo), '("parentSet", Gtk.Widget.WidgetParentSetSignalInfo), '("popupMenu", Gtk.Widget.WidgetPopupMenuSignalInfo), '("preferenceActivated", Dazzle.PreferencesBin.PreferencesBinPreferenceActivatedSignalInfo), '("propertyNotifyEvent", Gtk.Widget.WidgetPropertyNotifyEventSignalInfo), '("proximityInEvent", Gtk.Widget.WidgetProximityInEventSignalInfo), '("proximityOutEvent", Gtk.Widget.WidgetProximityOutEventSignalInfo), '("queryTooltip", Gtk.Widget.WidgetQueryTooltipSignalInfo), '("realize", Gtk.Widget.WidgetRealizeSignalInfo), '("remove", Gtk.Container.ContainerRemoveSignalInfo), '("screenChanged", Gtk.Widget.WidgetScreenChangedSignalInfo), '("scrollEvent", Gtk.Widget.WidgetScrollEventSignalInfo), '("selectionClearEvent", Gtk.Widget.WidgetSelectionClearEventSignalInfo), '("selectionGet", Gtk.Widget.WidgetSelectionGetSignalInfo), '("selectionNotifyEvent", Gtk.Widget.WidgetSelectionNotifyEventSignalInfo), '("selectionReceived", Gtk.Widget.WidgetSelectionReceivedSignalInfo), '("selectionRequestEvent", Gtk.Widget.WidgetSelectionRequestEventSignalInfo), '("setFocusChild", Gtk.Container.ContainerSetFocusChildSignalInfo), '("show", Gtk.Widget.WidgetShowSignalInfo), '("showHelp", Gtk.Widget.WidgetShowHelpSignalInfo), '("sizeAllocate", Gtk.Widget.WidgetSizeAllocateSignalInfo), '("stateChanged", Gtk.Widget.WidgetStateChangedSignalInfo), '("stateFlagsChanged", Gtk.Widget.WidgetStateFlagsChangedSignalInfo), '("styleSet", Gtk.Widget.WidgetStyleSetSignalInfo), '("styleUpdated", Gtk.Widget.WidgetStyleUpdatedSignalInfo), '("touchEvent", Gtk.Widget.WidgetTouchEventSignalInfo), '("unmap", Gtk.Widget.WidgetUnmapSignalInfo), '("unmapEvent", Gtk.Widget.WidgetUnmapEventSignalInfo), '("unrealize", Gtk.Widget.WidgetUnrealizeSignalInfo), '("visibilityNotifyEvent", Gtk.Widget.WidgetVisibilityNotifyEventSignalInfo), '("windowStateEvent", Gtk.Widget.WidgetWindowStateEventSignalInfo)] :: [(Symbol, DK.Type)])
#endif