{-# LANGUAGE ImplicitParams, RankNTypes, TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.Dazzle.Objects.PreferencesSpinButton
(
PreferencesSpinButton(..) ,
IsPreferencesSpinButton ,
toPreferencesSpinButton ,
#if defined(ENABLE_OVERLOADING)
ResolvePreferencesSpinButtonMethod ,
#endif
#if defined(ENABLE_OVERLOADING)
PreferencesSpinButtonGetSpinButtonMethodInfo,
#endif
preferencesSpinButtonGetSpinButton ,
#if defined(ENABLE_OVERLOADING)
PreferencesSpinButtonKeyPropertyInfo ,
#endif
constructPreferencesSpinButtonKey ,
getPreferencesSpinButtonKey ,
#if defined(ENABLE_OVERLOADING)
preferencesSpinButtonKey ,
#endif
#if defined(ENABLE_OVERLOADING)
PreferencesSpinButtonSubtitlePropertyInfo,
#endif
constructPreferencesSpinButtonSubtitle ,
getPreferencesSpinButtonSubtitle ,
#if defined(ENABLE_OVERLOADING)
preferencesSpinButtonSubtitle ,
#endif
#if defined(ENABLE_OVERLOADING)
PreferencesSpinButtonTitlePropertyInfo ,
#endif
constructPreferencesSpinButtonTitle ,
getPreferencesSpinButtonTitle ,
#if defined(ENABLE_OVERLOADING)
preferencesSpinButtonTitle ,
#endif
PreferencesSpinButtonActivateCallback ,
#if defined(ENABLE_OVERLOADING)
PreferencesSpinButtonActivateSignalInfo ,
#endif
afterPreferencesSpinButtonActivate ,
onPreferencesSpinButtonActivate ,
) 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 PreferencesSpinButton = PreferencesSpinButton (SP.ManagedPtr PreferencesSpinButton)
deriving (PreferencesSpinButton -> PreferencesSpinButton -> Bool
(PreferencesSpinButton -> PreferencesSpinButton -> Bool)
-> (PreferencesSpinButton -> PreferencesSpinButton -> Bool)
-> Eq PreferencesSpinButton
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: PreferencesSpinButton -> PreferencesSpinButton -> Bool
== :: PreferencesSpinButton -> PreferencesSpinButton -> Bool
$c/= :: PreferencesSpinButton -> PreferencesSpinButton -> Bool
/= :: PreferencesSpinButton -> PreferencesSpinButton -> Bool
Eq)
instance SP.ManagedPtrNewtype PreferencesSpinButton where
toManagedPtr :: PreferencesSpinButton -> ManagedPtr PreferencesSpinButton
toManagedPtr (PreferencesSpinButton ManagedPtr PreferencesSpinButton
p) = ManagedPtr PreferencesSpinButton
p
foreign import ccall "dzl_preferences_spin_button_get_type"
c_dzl_preferences_spin_button_get_type :: IO B.Types.GType
instance B.Types.TypedObject PreferencesSpinButton where
glibType :: IO GType
glibType = IO GType
c_dzl_preferences_spin_button_get_type
instance B.Types.GObject PreferencesSpinButton
class (SP.GObject o, O.IsDescendantOf PreferencesSpinButton o) => IsPreferencesSpinButton o
instance (SP.GObject o, O.IsDescendantOf PreferencesSpinButton o) => IsPreferencesSpinButton o
instance O.HasParentTypes PreferencesSpinButton
type instance O.ParentTypes PreferencesSpinButton = '[Dazzle.PreferencesBin.PreferencesBin, Gtk.Bin.Bin, Gtk.Container.Container, Gtk.Widget.Widget, GObject.Object.Object, Atk.ImplementorIface.ImplementorIface, Gtk.Buildable.Buildable]
toPreferencesSpinButton :: (MIO.MonadIO m, IsPreferencesSpinButton o) => o -> m PreferencesSpinButton
toPreferencesSpinButton :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesSpinButton o) =>
o -> m PreferencesSpinButton
toPreferencesSpinButton = IO PreferencesSpinButton -> m PreferencesSpinButton
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO PreferencesSpinButton -> m PreferencesSpinButton)
-> (o -> IO PreferencesSpinButton) -> o -> m PreferencesSpinButton
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ManagedPtr PreferencesSpinButton -> PreferencesSpinButton)
-> o -> IO PreferencesSpinButton
forall o o'.
(HasCallStack, ManagedPtrNewtype o, TypedObject o,
ManagedPtrNewtype o', TypedObject o') =>
(ManagedPtr o' -> o') -> o -> IO o'
B.ManagedPtr.unsafeCastTo ManagedPtr PreferencesSpinButton -> PreferencesSpinButton
PreferencesSpinButton
instance B.GValue.IsGValue (Maybe PreferencesSpinButton) where
gvalueGType_ :: IO GType
gvalueGType_ = IO GType
c_dzl_preferences_spin_button_get_type
gvalueSet_ :: Ptr GValue -> Maybe PreferencesSpinButton -> IO ()
gvalueSet_ Ptr GValue
gv Maybe PreferencesSpinButton
P.Nothing = Ptr GValue -> Ptr PreferencesSpinButton -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv (Ptr PreferencesSpinButton
forall a. Ptr a
FP.nullPtr :: FP.Ptr PreferencesSpinButton)
gvalueSet_ Ptr GValue
gv (P.Just PreferencesSpinButton
obj) = PreferencesSpinButton
-> (Ptr PreferencesSpinButton -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
B.ManagedPtr.withManagedPtr PreferencesSpinButton
obj (Ptr GValue -> Ptr PreferencesSpinButton -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv)
gvalueGet_ :: Ptr GValue -> IO (Maybe PreferencesSpinButton)
gvalueGet_ Ptr GValue
gv = do
Ptr PreferencesSpinButton
ptr <- Ptr GValue -> IO (Ptr PreferencesSpinButton)
forall a. GObject a => Ptr GValue -> IO (Ptr a)
B.GValue.get_object Ptr GValue
gv :: IO (FP.Ptr PreferencesSpinButton)
if Ptr PreferencesSpinButton
ptr Ptr PreferencesSpinButton -> Ptr PreferencesSpinButton -> Bool
forall a. Eq a => a -> a -> Bool
/= Ptr PreferencesSpinButton
forall a. Ptr a
FP.nullPtr
then PreferencesSpinButton -> Maybe PreferencesSpinButton
forall a. a -> Maybe a
P.Just (PreferencesSpinButton -> Maybe PreferencesSpinButton)
-> IO PreferencesSpinButton -> IO (Maybe PreferencesSpinButton)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (ManagedPtr PreferencesSpinButton -> PreferencesSpinButton)
-> Ptr PreferencesSpinButton -> IO PreferencesSpinButton
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
B.ManagedPtr.newObject ManagedPtr PreferencesSpinButton -> PreferencesSpinButton
PreferencesSpinButton Ptr PreferencesSpinButton
ptr
else Maybe PreferencesSpinButton -> IO (Maybe PreferencesSpinButton)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe PreferencesSpinButton
forall a. Maybe a
P.Nothing
#if defined(ENABLE_OVERLOADING)
type family ResolvePreferencesSpinButtonMethod (t :: Symbol) (o :: DK.Type) :: DK.Type where
ResolvePreferencesSpinButtonMethod "activate" o = Gtk.Widget.WidgetActivateMethodInfo
ResolvePreferencesSpinButtonMethod "add" o = Gtk.Container.ContainerAddMethodInfo
ResolvePreferencesSpinButtonMethod "addAccelerator" o = Gtk.Widget.WidgetAddAcceleratorMethodInfo
ResolvePreferencesSpinButtonMethod "addChild" o = Gtk.Buildable.BuildableAddChildMethodInfo
ResolvePreferencesSpinButtonMethod "addDeviceEvents" o = Gtk.Widget.WidgetAddDeviceEventsMethodInfo
ResolvePreferencesSpinButtonMethod "addEvents" o = Gtk.Widget.WidgetAddEventsMethodInfo
ResolvePreferencesSpinButtonMethod "addMnemonicLabel" o = Gtk.Widget.WidgetAddMnemonicLabelMethodInfo
ResolvePreferencesSpinButtonMethod "addTickCallback" o = Gtk.Widget.WidgetAddTickCallbackMethodInfo
ResolvePreferencesSpinButtonMethod "bindProperty" o = GObject.Object.ObjectBindPropertyMethodInfo
ResolvePreferencesSpinButtonMethod "bindPropertyFull" o = GObject.Object.ObjectBindPropertyFullMethodInfo
ResolvePreferencesSpinButtonMethod "canActivateAccel" o = Gtk.Widget.WidgetCanActivateAccelMethodInfo
ResolvePreferencesSpinButtonMethod "checkResize" o = Gtk.Container.ContainerCheckResizeMethodInfo
ResolvePreferencesSpinButtonMethod "childFocus" o = Gtk.Widget.WidgetChildFocusMethodInfo
ResolvePreferencesSpinButtonMethod "childGetProperty" o = Gtk.Container.ContainerChildGetPropertyMethodInfo
ResolvePreferencesSpinButtonMethod "childNotify" o = Gtk.Container.ContainerChildNotifyMethodInfo
ResolvePreferencesSpinButtonMethod "childNotifyByPspec" o = Gtk.Container.ContainerChildNotifyByPspecMethodInfo
ResolvePreferencesSpinButtonMethod "childSetProperty" o = Gtk.Container.ContainerChildSetPropertyMethodInfo
ResolvePreferencesSpinButtonMethod "childType" o = Gtk.Container.ContainerChildTypeMethodInfo
ResolvePreferencesSpinButtonMethod "classPath" o = Gtk.Widget.WidgetClassPathMethodInfo
ResolvePreferencesSpinButtonMethod "computeExpand" o = Gtk.Widget.WidgetComputeExpandMethodInfo
ResolvePreferencesSpinButtonMethod "constructChild" o = Gtk.Buildable.BuildableConstructChildMethodInfo
ResolvePreferencesSpinButtonMethod "createPangoContext" o = Gtk.Widget.WidgetCreatePangoContextMethodInfo
ResolvePreferencesSpinButtonMethod "createPangoLayout" o = Gtk.Widget.WidgetCreatePangoLayoutMethodInfo
ResolvePreferencesSpinButtonMethod "customFinished" o = Gtk.Buildable.BuildableCustomFinishedMethodInfo
ResolvePreferencesSpinButtonMethod "customTagEnd" o = Gtk.Buildable.BuildableCustomTagEndMethodInfo
ResolvePreferencesSpinButtonMethod "customTagStart" o = Gtk.Buildable.BuildableCustomTagStartMethodInfo
ResolvePreferencesSpinButtonMethod "destroy" o = Gtk.Widget.WidgetDestroyMethodInfo
ResolvePreferencesSpinButtonMethod "destroyed" o = Gtk.Widget.WidgetDestroyedMethodInfo
ResolvePreferencesSpinButtonMethod "deviceIsShadowed" o = Gtk.Widget.WidgetDeviceIsShadowedMethodInfo
ResolvePreferencesSpinButtonMethod "dragBegin" o = Gtk.Widget.WidgetDragBeginMethodInfo
ResolvePreferencesSpinButtonMethod "dragBeginWithCoordinates" o = Gtk.Widget.WidgetDragBeginWithCoordinatesMethodInfo
ResolvePreferencesSpinButtonMethod "dragCheckThreshold" o = Gtk.Widget.WidgetDragCheckThresholdMethodInfo
ResolvePreferencesSpinButtonMethod "dragDestAddImageTargets" o = Gtk.Widget.WidgetDragDestAddImageTargetsMethodInfo
ResolvePreferencesSpinButtonMethod "dragDestAddTextTargets" o = Gtk.Widget.WidgetDragDestAddTextTargetsMethodInfo
ResolvePreferencesSpinButtonMethod "dragDestAddUriTargets" o = Gtk.Widget.WidgetDragDestAddUriTargetsMethodInfo
ResolvePreferencesSpinButtonMethod "dragDestFindTarget" o = Gtk.Widget.WidgetDragDestFindTargetMethodInfo
ResolvePreferencesSpinButtonMethod "dragDestGetTargetList" o = Gtk.Widget.WidgetDragDestGetTargetListMethodInfo
ResolvePreferencesSpinButtonMethod "dragDestGetTrackMotion" o = Gtk.Widget.WidgetDragDestGetTrackMotionMethodInfo
ResolvePreferencesSpinButtonMethod "dragDestSet" o = Gtk.Widget.WidgetDragDestSetMethodInfo
ResolvePreferencesSpinButtonMethod "dragDestSetProxy" o = Gtk.Widget.WidgetDragDestSetProxyMethodInfo
ResolvePreferencesSpinButtonMethod "dragDestSetTargetList" o = Gtk.Widget.WidgetDragDestSetTargetListMethodInfo
ResolvePreferencesSpinButtonMethod "dragDestSetTrackMotion" o = Gtk.Widget.WidgetDragDestSetTrackMotionMethodInfo
ResolvePreferencesSpinButtonMethod "dragDestUnset" o = Gtk.Widget.WidgetDragDestUnsetMethodInfo
ResolvePreferencesSpinButtonMethod "dragGetData" o = Gtk.Widget.WidgetDragGetDataMethodInfo
ResolvePreferencesSpinButtonMethod "dragHighlight" o = Gtk.Widget.WidgetDragHighlightMethodInfo
ResolvePreferencesSpinButtonMethod "dragSourceAddImageTargets" o = Gtk.Widget.WidgetDragSourceAddImageTargetsMethodInfo
ResolvePreferencesSpinButtonMethod "dragSourceAddTextTargets" o = Gtk.Widget.WidgetDragSourceAddTextTargetsMethodInfo
ResolvePreferencesSpinButtonMethod "dragSourceAddUriTargets" o = Gtk.Widget.WidgetDragSourceAddUriTargetsMethodInfo
ResolvePreferencesSpinButtonMethod "dragSourceGetTargetList" o = Gtk.Widget.WidgetDragSourceGetTargetListMethodInfo
ResolvePreferencesSpinButtonMethod "dragSourceSet" o = Gtk.Widget.WidgetDragSourceSetMethodInfo
ResolvePreferencesSpinButtonMethod "dragSourceSetIconGicon" o = Gtk.Widget.WidgetDragSourceSetIconGiconMethodInfo
ResolvePreferencesSpinButtonMethod "dragSourceSetIconName" o = Gtk.Widget.WidgetDragSourceSetIconNameMethodInfo
ResolvePreferencesSpinButtonMethod "dragSourceSetIconPixbuf" o = Gtk.Widget.WidgetDragSourceSetIconPixbufMethodInfo
ResolvePreferencesSpinButtonMethod "dragSourceSetIconStock" o = Gtk.Widget.WidgetDragSourceSetIconStockMethodInfo
ResolvePreferencesSpinButtonMethod "dragSourceSetTargetList" o = Gtk.Widget.WidgetDragSourceSetTargetListMethodInfo
ResolvePreferencesSpinButtonMethod "dragSourceUnset" o = Gtk.Widget.WidgetDragSourceUnsetMethodInfo
ResolvePreferencesSpinButtonMethod "dragUnhighlight" o = Gtk.Widget.WidgetDragUnhighlightMethodInfo
ResolvePreferencesSpinButtonMethod "draw" o = Gtk.Widget.WidgetDrawMethodInfo
ResolvePreferencesSpinButtonMethod "ensureStyle" o = Gtk.Widget.WidgetEnsureStyleMethodInfo
ResolvePreferencesSpinButtonMethod "errorBell" o = Gtk.Widget.WidgetErrorBellMethodInfo
ResolvePreferencesSpinButtonMethod "event" o = Gtk.Widget.WidgetEventMethodInfo
ResolvePreferencesSpinButtonMethod "forall" o = Gtk.Container.ContainerForallMethodInfo
ResolvePreferencesSpinButtonMethod "forceFloating" o = GObject.Object.ObjectForceFloatingMethodInfo
ResolvePreferencesSpinButtonMethod "foreach" o = Gtk.Container.ContainerForeachMethodInfo
ResolvePreferencesSpinButtonMethod "freezeChildNotify" o = Gtk.Widget.WidgetFreezeChildNotifyMethodInfo
ResolvePreferencesSpinButtonMethod "freezeNotify" o = GObject.Object.ObjectFreezeNotifyMethodInfo
ResolvePreferencesSpinButtonMethod "getv" o = GObject.Object.ObjectGetvMethodInfo
ResolvePreferencesSpinButtonMethod "grabAdd" o = Gtk.Widget.WidgetGrabAddMethodInfo
ResolvePreferencesSpinButtonMethod "grabDefault" o = Gtk.Widget.WidgetGrabDefaultMethodInfo
ResolvePreferencesSpinButtonMethod "grabFocus" o = Gtk.Widget.WidgetGrabFocusMethodInfo
ResolvePreferencesSpinButtonMethod "grabRemove" o = Gtk.Widget.WidgetGrabRemoveMethodInfo
ResolvePreferencesSpinButtonMethod "hasDefault" o = Gtk.Widget.WidgetHasDefaultMethodInfo
ResolvePreferencesSpinButtonMethod "hasFocus" o = Gtk.Widget.WidgetHasFocusMethodInfo
ResolvePreferencesSpinButtonMethod "hasGrab" o = Gtk.Widget.WidgetHasGrabMethodInfo
ResolvePreferencesSpinButtonMethod "hasRcStyle" o = Gtk.Widget.WidgetHasRcStyleMethodInfo
ResolvePreferencesSpinButtonMethod "hasScreen" o = Gtk.Widget.WidgetHasScreenMethodInfo
ResolvePreferencesSpinButtonMethod "hasVisibleFocus" o = Gtk.Widget.WidgetHasVisibleFocusMethodInfo
ResolvePreferencesSpinButtonMethod "hide" o = Gtk.Widget.WidgetHideMethodInfo
ResolvePreferencesSpinButtonMethod "hideOnDelete" o = Gtk.Widget.WidgetHideOnDeleteMethodInfo
ResolvePreferencesSpinButtonMethod "inDestruction" o = Gtk.Widget.WidgetInDestructionMethodInfo
ResolvePreferencesSpinButtonMethod "initTemplate" o = Gtk.Widget.WidgetInitTemplateMethodInfo
ResolvePreferencesSpinButtonMethod "inputShapeCombineRegion" o = Gtk.Widget.WidgetInputShapeCombineRegionMethodInfo
ResolvePreferencesSpinButtonMethod "insertActionGroup" o = Gtk.Widget.WidgetInsertActionGroupMethodInfo
ResolvePreferencesSpinButtonMethod "intersect" o = Gtk.Widget.WidgetIntersectMethodInfo
ResolvePreferencesSpinButtonMethod "isAncestor" o = Gtk.Widget.WidgetIsAncestorMethodInfo
ResolvePreferencesSpinButtonMethod "isComposited" o = Gtk.Widget.WidgetIsCompositedMethodInfo
ResolvePreferencesSpinButtonMethod "isDrawable" o = Gtk.Widget.WidgetIsDrawableMethodInfo
ResolvePreferencesSpinButtonMethod "isFloating" o = GObject.Object.ObjectIsFloatingMethodInfo
ResolvePreferencesSpinButtonMethod "isFocus" o = Gtk.Widget.WidgetIsFocusMethodInfo
ResolvePreferencesSpinButtonMethod "isSensitive" o = Gtk.Widget.WidgetIsSensitiveMethodInfo
ResolvePreferencesSpinButtonMethod "isToplevel" o = Gtk.Widget.WidgetIsToplevelMethodInfo
ResolvePreferencesSpinButtonMethod "isVisible" o = Gtk.Widget.WidgetIsVisibleMethodInfo
ResolvePreferencesSpinButtonMethod "keynavFailed" o = Gtk.Widget.WidgetKeynavFailedMethodInfo
ResolvePreferencesSpinButtonMethod "listAccelClosures" o = Gtk.Widget.WidgetListAccelClosuresMethodInfo
ResolvePreferencesSpinButtonMethod "listActionPrefixes" o = Gtk.Widget.WidgetListActionPrefixesMethodInfo
ResolvePreferencesSpinButtonMethod "listMnemonicLabels" o = Gtk.Widget.WidgetListMnemonicLabelsMethodInfo
ResolvePreferencesSpinButtonMethod "map" o = Gtk.Widget.WidgetMapMethodInfo
ResolvePreferencesSpinButtonMethod "mnemonicActivate" o = Gtk.Widget.WidgetMnemonicActivateMethodInfo
ResolvePreferencesSpinButtonMethod "modifyBase" o = Gtk.Widget.WidgetModifyBaseMethodInfo
ResolvePreferencesSpinButtonMethod "modifyBg" o = Gtk.Widget.WidgetModifyBgMethodInfo
ResolvePreferencesSpinButtonMethod "modifyCursor" o = Gtk.Widget.WidgetModifyCursorMethodInfo
ResolvePreferencesSpinButtonMethod "modifyFg" o = Gtk.Widget.WidgetModifyFgMethodInfo
ResolvePreferencesSpinButtonMethod "modifyFont" o = Gtk.Widget.WidgetModifyFontMethodInfo
ResolvePreferencesSpinButtonMethod "modifyStyle" o = Gtk.Widget.WidgetModifyStyleMethodInfo
ResolvePreferencesSpinButtonMethod "modifyText" o = Gtk.Widget.WidgetModifyTextMethodInfo
ResolvePreferencesSpinButtonMethod "notify" o = GObject.Object.ObjectNotifyMethodInfo
ResolvePreferencesSpinButtonMethod "notifyByPspec" o = GObject.Object.ObjectNotifyByPspecMethodInfo
ResolvePreferencesSpinButtonMethod "overrideBackgroundColor" o = Gtk.Widget.WidgetOverrideBackgroundColorMethodInfo
ResolvePreferencesSpinButtonMethod "overrideColor" o = Gtk.Widget.WidgetOverrideColorMethodInfo
ResolvePreferencesSpinButtonMethod "overrideCursor" o = Gtk.Widget.WidgetOverrideCursorMethodInfo
ResolvePreferencesSpinButtonMethod "overrideFont" o = Gtk.Widget.WidgetOverrideFontMethodInfo
ResolvePreferencesSpinButtonMethod "overrideSymbolicColor" o = Gtk.Widget.WidgetOverrideSymbolicColorMethodInfo
ResolvePreferencesSpinButtonMethod "parserFinished" o = Gtk.Buildable.BuildableParserFinishedMethodInfo
ResolvePreferencesSpinButtonMethod "path" o = Gtk.Widget.WidgetPathMethodInfo
ResolvePreferencesSpinButtonMethod "propagateDraw" o = Gtk.Container.ContainerPropagateDrawMethodInfo
ResolvePreferencesSpinButtonMethod "queueAllocate" o = Gtk.Widget.WidgetQueueAllocateMethodInfo
ResolvePreferencesSpinButtonMethod "queueComputeExpand" o = Gtk.Widget.WidgetQueueComputeExpandMethodInfo
ResolvePreferencesSpinButtonMethod "queueDraw" o = Gtk.Widget.WidgetQueueDrawMethodInfo
ResolvePreferencesSpinButtonMethod "queueDrawArea" o = Gtk.Widget.WidgetQueueDrawAreaMethodInfo
ResolvePreferencesSpinButtonMethod "queueDrawRegion" o = Gtk.Widget.WidgetQueueDrawRegionMethodInfo
ResolvePreferencesSpinButtonMethod "queueResize" o = Gtk.Widget.WidgetQueueResizeMethodInfo
ResolvePreferencesSpinButtonMethod "queueResizeNoRedraw" o = Gtk.Widget.WidgetQueueResizeNoRedrawMethodInfo
ResolvePreferencesSpinButtonMethod "realize" o = Gtk.Widget.WidgetRealizeMethodInfo
ResolvePreferencesSpinButtonMethod "ref" o = GObject.Object.ObjectRefMethodInfo
ResolvePreferencesSpinButtonMethod "refSink" o = GObject.Object.ObjectRefSinkMethodInfo
ResolvePreferencesSpinButtonMethod "regionIntersect" o = Gtk.Widget.WidgetRegionIntersectMethodInfo
ResolvePreferencesSpinButtonMethod "registerWindow" o = Gtk.Widget.WidgetRegisterWindowMethodInfo
ResolvePreferencesSpinButtonMethod "remove" o = Gtk.Container.ContainerRemoveMethodInfo
ResolvePreferencesSpinButtonMethod "removeAccelerator" o = Gtk.Widget.WidgetRemoveAcceleratorMethodInfo
ResolvePreferencesSpinButtonMethod "removeMnemonicLabel" o = Gtk.Widget.WidgetRemoveMnemonicLabelMethodInfo
ResolvePreferencesSpinButtonMethod "removeTickCallback" o = Gtk.Widget.WidgetRemoveTickCallbackMethodInfo
ResolvePreferencesSpinButtonMethod "renderIcon" o = Gtk.Widget.WidgetRenderIconMethodInfo
ResolvePreferencesSpinButtonMethod "renderIconPixbuf" o = Gtk.Widget.WidgetRenderIconPixbufMethodInfo
ResolvePreferencesSpinButtonMethod "reparent" o = Gtk.Widget.WidgetReparentMethodInfo
ResolvePreferencesSpinButtonMethod "resetRcStyles" o = Gtk.Widget.WidgetResetRcStylesMethodInfo
ResolvePreferencesSpinButtonMethod "resetStyle" o = Gtk.Widget.WidgetResetStyleMethodInfo
ResolvePreferencesSpinButtonMethod "resizeChildren" o = Gtk.Container.ContainerResizeChildrenMethodInfo
ResolvePreferencesSpinButtonMethod "runDispose" o = GObject.Object.ObjectRunDisposeMethodInfo
ResolvePreferencesSpinButtonMethod "sendExpose" o = Gtk.Widget.WidgetSendExposeMethodInfo
ResolvePreferencesSpinButtonMethod "sendFocusChange" o = Gtk.Widget.WidgetSendFocusChangeMethodInfo
ResolvePreferencesSpinButtonMethod "shapeCombineRegion" o = Gtk.Widget.WidgetShapeCombineRegionMethodInfo
ResolvePreferencesSpinButtonMethod "show" o = Gtk.Widget.WidgetShowMethodInfo
ResolvePreferencesSpinButtonMethod "showAll" o = Gtk.Widget.WidgetShowAllMethodInfo
ResolvePreferencesSpinButtonMethod "showNow" o = Gtk.Widget.WidgetShowNowMethodInfo
ResolvePreferencesSpinButtonMethod "sizeAllocate" o = Gtk.Widget.WidgetSizeAllocateMethodInfo
ResolvePreferencesSpinButtonMethod "sizeAllocateWithBaseline" o = Gtk.Widget.WidgetSizeAllocateWithBaselineMethodInfo
ResolvePreferencesSpinButtonMethod "sizeRequest" o = Gtk.Widget.WidgetSizeRequestMethodInfo
ResolvePreferencesSpinButtonMethod "stealData" o = GObject.Object.ObjectStealDataMethodInfo
ResolvePreferencesSpinButtonMethod "stealQdata" o = GObject.Object.ObjectStealQdataMethodInfo
ResolvePreferencesSpinButtonMethod "styleAttach" o = Gtk.Widget.WidgetStyleAttachMethodInfo
ResolvePreferencesSpinButtonMethod "styleGetProperty" o = Gtk.Widget.WidgetStyleGetPropertyMethodInfo
ResolvePreferencesSpinButtonMethod "thawChildNotify" o = Gtk.Widget.WidgetThawChildNotifyMethodInfo
ResolvePreferencesSpinButtonMethod "thawNotify" o = GObject.Object.ObjectThawNotifyMethodInfo
ResolvePreferencesSpinButtonMethod "translateCoordinates" o = Gtk.Widget.WidgetTranslateCoordinatesMethodInfo
ResolvePreferencesSpinButtonMethod "triggerTooltipQuery" o = Gtk.Widget.WidgetTriggerTooltipQueryMethodInfo
ResolvePreferencesSpinButtonMethod "unmap" o = Gtk.Widget.WidgetUnmapMethodInfo
ResolvePreferencesSpinButtonMethod "unparent" o = Gtk.Widget.WidgetUnparentMethodInfo
ResolvePreferencesSpinButtonMethod "unrealize" o = Gtk.Widget.WidgetUnrealizeMethodInfo
ResolvePreferencesSpinButtonMethod "unref" o = GObject.Object.ObjectUnrefMethodInfo
ResolvePreferencesSpinButtonMethod "unregisterWindow" o = Gtk.Widget.WidgetUnregisterWindowMethodInfo
ResolvePreferencesSpinButtonMethod "unsetFocusChain" o = Gtk.Container.ContainerUnsetFocusChainMethodInfo
ResolvePreferencesSpinButtonMethod "unsetStateFlags" o = Gtk.Widget.WidgetUnsetStateFlagsMethodInfo
ResolvePreferencesSpinButtonMethod "watchClosure" o = GObject.Object.ObjectWatchClosureMethodInfo
ResolvePreferencesSpinButtonMethod "getAccessible" o = Gtk.Widget.WidgetGetAccessibleMethodInfo
ResolvePreferencesSpinButtonMethod "getActionGroup" o = Gtk.Widget.WidgetGetActionGroupMethodInfo
ResolvePreferencesSpinButtonMethod "getAllocatedBaseline" o = Gtk.Widget.WidgetGetAllocatedBaselineMethodInfo
ResolvePreferencesSpinButtonMethod "getAllocatedHeight" o = Gtk.Widget.WidgetGetAllocatedHeightMethodInfo
ResolvePreferencesSpinButtonMethod "getAllocatedSize" o = Gtk.Widget.WidgetGetAllocatedSizeMethodInfo
ResolvePreferencesSpinButtonMethod "getAllocatedWidth" o = Gtk.Widget.WidgetGetAllocatedWidthMethodInfo
ResolvePreferencesSpinButtonMethod "getAllocation" o = Gtk.Widget.WidgetGetAllocationMethodInfo
ResolvePreferencesSpinButtonMethod "getAncestor" o = Gtk.Widget.WidgetGetAncestorMethodInfo
ResolvePreferencesSpinButtonMethod "getAppPaintable" o = Gtk.Widget.WidgetGetAppPaintableMethodInfo
ResolvePreferencesSpinButtonMethod "getBorderWidth" o = Gtk.Container.ContainerGetBorderWidthMethodInfo
ResolvePreferencesSpinButtonMethod "getCanDefault" o = Gtk.Widget.WidgetGetCanDefaultMethodInfo
ResolvePreferencesSpinButtonMethod "getCanFocus" o = Gtk.Widget.WidgetGetCanFocusMethodInfo
ResolvePreferencesSpinButtonMethod "getChild" o = Gtk.Bin.BinGetChildMethodInfo
ResolvePreferencesSpinButtonMethod "getChildRequisition" o = Gtk.Widget.WidgetGetChildRequisitionMethodInfo
ResolvePreferencesSpinButtonMethod "getChildVisible" o = Gtk.Widget.WidgetGetChildVisibleMethodInfo
ResolvePreferencesSpinButtonMethod "getChildren" o = Gtk.Container.ContainerGetChildrenMethodInfo
ResolvePreferencesSpinButtonMethod "getClip" o = Gtk.Widget.WidgetGetClipMethodInfo
ResolvePreferencesSpinButtonMethod "getClipboard" o = Gtk.Widget.WidgetGetClipboardMethodInfo
ResolvePreferencesSpinButtonMethod "getCompositeName" o = Gtk.Widget.WidgetGetCompositeNameMethodInfo
ResolvePreferencesSpinButtonMethod "getData" o = GObject.Object.ObjectGetDataMethodInfo
ResolvePreferencesSpinButtonMethod "getDeviceEnabled" o = Gtk.Widget.WidgetGetDeviceEnabledMethodInfo
ResolvePreferencesSpinButtonMethod "getDeviceEvents" o = Gtk.Widget.WidgetGetDeviceEventsMethodInfo
ResolvePreferencesSpinButtonMethod "getDirection" o = Gtk.Widget.WidgetGetDirectionMethodInfo
ResolvePreferencesSpinButtonMethod "getDisplay" o = Gtk.Widget.WidgetGetDisplayMethodInfo
ResolvePreferencesSpinButtonMethod "getDoubleBuffered" o = Gtk.Widget.WidgetGetDoubleBufferedMethodInfo
ResolvePreferencesSpinButtonMethod "getEvents" o = Gtk.Widget.WidgetGetEventsMethodInfo
ResolvePreferencesSpinButtonMethod "getFocusChain" o = Gtk.Container.ContainerGetFocusChainMethodInfo
ResolvePreferencesSpinButtonMethod "getFocusChild" o = Gtk.Container.ContainerGetFocusChildMethodInfo
ResolvePreferencesSpinButtonMethod "getFocusHadjustment" o = Gtk.Container.ContainerGetFocusHadjustmentMethodInfo
ResolvePreferencesSpinButtonMethod "getFocusOnClick" o = Gtk.Widget.WidgetGetFocusOnClickMethodInfo
ResolvePreferencesSpinButtonMethod "getFocusVadjustment" o = Gtk.Container.ContainerGetFocusVadjustmentMethodInfo
ResolvePreferencesSpinButtonMethod "getFontMap" o = Gtk.Widget.WidgetGetFontMapMethodInfo
ResolvePreferencesSpinButtonMethod "getFontOptions" o = Gtk.Widget.WidgetGetFontOptionsMethodInfo
ResolvePreferencesSpinButtonMethod "getFrameClock" o = Gtk.Widget.WidgetGetFrameClockMethodInfo
ResolvePreferencesSpinButtonMethod "getHalign" o = Gtk.Widget.WidgetGetHalignMethodInfo
ResolvePreferencesSpinButtonMethod "getHasTooltip" o = Gtk.Widget.WidgetGetHasTooltipMethodInfo
ResolvePreferencesSpinButtonMethod "getHasWindow" o = Gtk.Widget.WidgetGetHasWindowMethodInfo
ResolvePreferencesSpinButtonMethod "getHexpand" o = Gtk.Widget.WidgetGetHexpandMethodInfo
ResolvePreferencesSpinButtonMethod "getHexpandSet" o = Gtk.Widget.WidgetGetHexpandSetMethodInfo
ResolvePreferencesSpinButtonMethod "getInternalChild" o = Gtk.Buildable.BuildableGetInternalChildMethodInfo
ResolvePreferencesSpinButtonMethod "getMapped" o = Gtk.Widget.WidgetGetMappedMethodInfo
ResolvePreferencesSpinButtonMethod "getMarginBottom" o = Gtk.Widget.WidgetGetMarginBottomMethodInfo
ResolvePreferencesSpinButtonMethod "getMarginEnd" o = Gtk.Widget.WidgetGetMarginEndMethodInfo
ResolvePreferencesSpinButtonMethod "getMarginLeft" o = Gtk.Widget.WidgetGetMarginLeftMethodInfo
ResolvePreferencesSpinButtonMethod "getMarginRight" o = Gtk.Widget.WidgetGetMarginRightMethodInfo
ResolvePreferencesSpinButtonMethod "getMarginStart" o = Gtk.Widget.WidgetGetMarginStartMethodInfo
ResolvePreferencesSpinButtonMethod "getMarginTop" o = Gtk.Widget.WidgetGetMarginTopMethodInfo
ResolvePreferencesSpinButtonMethod "getModifierMask" o = Gtk.Widget.WidgetGetModifierMaskMethodInfo
ResolvePreferencesSpinButtonMethod "getModifierStyle" o = Gtk.Widget.WidgetGetModifierStyleMethodInfo
ResolvePreferencesSpinButtonMethod "getName" o = Gtk.Widget.WidgetGetNameMethodInfo
ResolvePreferencesSpinButtonMethod "getNoShowAll" o = Gtk.Widget.WidgetGetNoShowAllMethodInfo
ResolvePreferencesSpinButtonMethod "getOpacity" o = Gtk.Widget.WidgetGetOpacityMethodInfo
ResolvePreferencesSpinButtonMethod "getPangoContext" o = Gtk.Widget.WidgetGetPangoContextMethodInfo
ResolvePreferencesSpinButtonMethod "getParent" o = Gtk.Widget.WidgetGetParentMethodInfo
ResolvePreferencesSpinButtonMethod "getParentWindow" o = Gtk.Widget.WidgetGetParentWindowMethodInfo
ResolvePreferencesSpinButtonMethod "getPath" o = Gtk.Widget.WidgetGetPathMethodInfo
ResolvePreferencesSpinButtonMethod "getPathForChild" o = Gtk.Container.ContainerGetPathForChildMethodInfo
ResolvePreferencesSpinButtonMethod "getPointer" o = Gtk.Widget.WidgetGetPointerMethodInfo
ResolvePreferencesSpinButtonMethod "getPreferredHeight" o = Gtk.Widget.WidgetGetPreferredHeightMethodInfo
ResolvePreferencesSpinButtonMethod "getPreferredHeightAndBaselineForWidth" o = Gtk.Widget.WidgetGetPreferredHeightAndBaselineForWidthMethodInfo
ResolvePreferencesSpinButtonMethod "getPreferredHeightForWidth" o = Gtk.Widget.WidgetGetPreferredHeightForWidthMethodInfo
ResolvePreferencesSpinButtonMethod "getPreferredSize" o = Gtk.Widget.WidgetGetPreferredSizeMethodInfo
ResolvePreferencesSpinButtonMethod "getPreferredWidth" o = Gtk.Widget.WidgetGetPreferredWidthMethodInfo
ResolvePreferencesSpinButtonMethod "getPreferredWidthForHeight" o = Gtk.Widget.WidgetGetPreferredWidthForHeightMethodInfo
ResolvePreferencesSpinButtonMethod "getProperty" o = GObject.Object.ObjectGetPropertyMethodInfo
ResolvePreferencesSpinButtonMethod "getQdata" o = GObject.Object.ObjectGetQdataMethodInfo
ResolvePreferencesSpinButtonMethod "getRealized" o = Gtk.Widget.WidgetGetRealizedMethodInfo
ResolvePreferencesSpinButtonMethod "getReceivesDefault" o = Gtk.Widget.WidgetGetReceivesDefaultMethodInfo
ResolvePreferencesSpinButtonMethod "getRequestMode" o = Gtk.Widget.WidgetGetRequestModeMethodInfo
ResolvePreferencesSpinButtonMethod "getRequisition" o = Gtk.Widget.WidgetGetRequisitionMethodInfo
ResolvePreferencesSpinButtonMethod "getResizeMode" o = Gtk.Container.ContainerGetResizeModeMethodInfo
ResolvePreferencesSpinButtonMethod "getRootWindow" o = Gtk.Widget.WidgetGetRootWindowMethodInfo
ResolvePreferencesSpinButtonMethod "getScaleFactor" o = Gtk.Widget.WidgetGetScaleFactorMethodInfo
ResolvePreferencesSpinButtonMethod "getScreen" o = Gtk.Widget.WidgetGetScreenMethodInfo
ResolvePreferencesSpinButtonMethod "getSensitive" o = Gtk.Widget.WidgetGetSensitiveMethodInfo
ResolvePreferencesSpinButtonMethod "getSettings" o = Gtk.Widget.WidgetGetSettingsMethodInfo
ResolvePreferencesSpinButtonMethod "getSizeRequest" o = Gtk.Widget.WidgetGetSizeRequestMethodInfo
ResolvePreferencesSpinButtonMethod "getSpinButton" o = PreferencesSpinButtonGetSpinButtonMethodInfo
ResolvePreferencesSpinButtonMethod "getState" o = Gtk.Widget.WidgetGetStateMethodInfo
ResolvePreferencesSpinButtonMethod "getStateFlags" o = Gtk.Widget.WidgetGetStateFlagsMethodInfo
ResolvePreferencesSpinButtonMethod "getStyle" o = Gtk.Widget.WidgetGetStyleMethodInfo
ResolvePreferencesSpinButtonMethod "getStyleContext" o = Gtk.Widget.WidgetGetStyleContextMethodInfo
ResolvePreferencesSpinButtonMethod "getSupportMultidevice" o = Gtk.Widget.WidgetGetSupportMultideviceMethodInfo
ResolvePreferencesSpinButtonMethod "getTemplateChild" o = Gtk.Widget.WidgetGetTemplateChildMethodInfo
ResolvePreferencesSpinButtonMethod "getTooltipMarkup" o = Gtk.Widget.WidgetGetTooltipMarkupMethodInfo
ResolvePreferencesSpinButtonMethod "getTooltipText" o = Gtk.Widget.WidgetGetTooltipTextMethodInfo
ResolvePreferencesSpinButtonMethod "getTooltipWindow" o = Gtk.Widget.WidgetGetTooltipWindowMethodInfo
ResolvePreferencesSpinButtonMethod "getToplevel" o = Gtk.Widget.WidgetGetToplevelMethodInfo
ResolvePreferencesSpinButtonMethod "getValign" o = Gtk.Widget.WidgetGetValignMethodInfo
ResolvePreferencesSpinButtonMethod "getValignWithBaseline" o = Gtk.Widget.WidgetGetValignWithBaselineMethodInfo
ResolvePreferencesSpinButtonMethod "getVexpand" o = Gtk.Widget.WidgetGetVexpandMethodInfo
ResolvePreferencesSpinButtonMethod "getVexpandSet" o = Gtk.Widget.WidgetGetVexpandSetMethodInfo
ResolvePreferencesSpinButtonMethod "getVisible" o = Gtk.Widget.WidgetGetVisibleMethodInfo
ResolvePreferencesSpinButtonMethod "getVisual" o = Gtk.Widget.WidgetGetVisualMethodInfo
ResolvePreferencesSpinButtonMethod "getWindow" o = Gtk.Widget.WidgetGetWindowMethodInfo
ResolvePreferencesSpinButtonMethod "setAccelPath" o = Gtk.Widget.WidgetSetAccelPathMethodInfo
ResolvePreferencesSpinButtonMethod "setAllocation" o = Gtk.Widget.WidgetSetAllocationMethodInfo
ResolvePreferencesSpinButtonMethod "setAppPaintable" o = Gtk.Widget.WidgetSetAppPaintableMethodInfo
ResolvePreferencesSpinButtonMethod "setBorderWidth" o = Gtk.Container.ContainerSetBorderWidthMethodInfo
ResolvePreferencesSpinButtonMethod "setBuildableProperty" o = Gtk.Buildable.BuildableSetBuildablePropertyMethodInfo
ResolvePreferencesSpinButtonMethod "setCanDefault" o = Gtk.Widget.WidgetSetCanDefaultMethodInfo
ResolvePreferencesSpinButtonMethod "setCanFocus" o = Gtk.Widget.WidgetSetCanFocusMethodInfo
ResolvePreferencesSpinButtonMethod "setChildVisible" o = Gtk.Widget.WidgetSetChildVisibleMethodInfo
ResolvePreferencesSpinButtonMethod "setClip" o = Gtk.Widget.WidgetSetClipMethodInfo
ResolvePreferencesSpinButtonMethod "setCompositeName" o = Gtk.Widget.WidgetSetCompositeNameMethodInfo
ResolvePreferencesSpinButtonMethod "setData" o = GObject.Object.ObjectSetDataMethodInfo
ResolvePreferencesSpinButtonMethod "setDataFull" o = GObject.Object.ObjectSetDataFullMethodInfo
ResolvePreferencesSpinButtonMethod "setDeviceEnabled" o = Gtk.Widget.WidgetSetDeviceEnabledMethodInfo
ResolvePreferencesSpinButtonMethod "setDeviceEvents" o = Gtk.Widget.WidgetSetDeviceEventsMethodInfo
ResolvePreferencesSpinButtonMethod "setDirection" o = Gtk.Widget.WidgetSetDirectionMethodInfo
ResolvePreferencesSpinButtonMethod "setDoubleBuffered" o = Gtk.Widget.WidgetSetDoubleBufferedMethodInfo
ResolvePreferencesSpinButtonMethod "setEvents" o = Gtk.Widget.WidgetSetEventsMethodInfo
ResolvePreferencesSpinButtonMethod "setFocusChain" o = Gtk.Container.ContainerSetFocusChainMethodInfo
ResolvePreferencesSpinButtonMethod "setFocusChild" o = Gtk.Container.ContainerSetFocusChildMethodInfo
ResolvePreferencesSpinButtonMethod "setFocusHadjustment" o = Gtk.Container.ContainerSetFocusHadjustmentMethodInfo
ResolvePreferencesSpinButtonMethod "setFocusOnClick" o = Gtk.Widget.WidgetSetFocusOnClickMethodInfo
ResolvePreferencesSpinButtonMethod "setFocusVadjustment" o = Gtk.Container.ContainerSetFocusVadjustmentMethodInfo
ResolvePreferencesSpinButtonMethod "setFontMap" o = Gtk.Widget.WidgetSetFontMapMethodInfo
ResolvePreferencesSpinButtonMethod "setFontOptions" o = Gtk.Widget.WidgetSetFontOptionsMethodInfo
ResolvePreferencesSpinButtonMethod "setHalign" o = Gtk.Widget.WidgetSetHalignMethodInfo
ResolvePreferencesSpinButtonMethod "setHasTooltip" o = Gtk.Widget.WidgetSetHasTooltipMethodInfo
ResolvePreferencesSpinButtonMethod "setHasWindow" o = Gtk.Widget.WidgetSetHasWindowMethodInfo
ResolvePreferencesSpinButtonMethod "setHexpand" o = Gtk.Widget.WidgetSetHexpandMethodInfo
ResolvePreferencesSpinButtonMethod "setHexpandSet" o = Gtk.Widget.WidgetSetHexpandSetMethodInfo
ResolvePreferencesSpinButtonMethod "setMapped" o = Gtk.Widget.WidgetSetMappedMethodInfo
ResolvePreferencesSpinButtonMethod "setMarginBottom" o = Gtk.Widget.WidgetSetMarginBottomMethodInfo
ResolvePreferencesSpinButtonMethod "setMarginEnd" o = Gtk.Widget.WidgetSetMarginEndMethodInfo
ResolvePreferencesSpinButtonMethod "setMarginLeft" o = Gtk.Widget.WidgetSetMarginLeftMethodInfo
ResolvePreferencesSpinButtonMethod "setMarginRight" o = Gtk.Widget.WidgetSetMarginRightMethodInfo
ResolvePreferencesSpinButtonMethod "setMarginStart" o = Gtk.Widget.WidgetSetMarginStartMethodInfo
ResolvePreferencesSpinButtonMethod "setMarginTop" o = Gtk.Widget.WidgetSetMarginTopMethodInfo
ResolvePreferencesSpinButtonMethod "setName" o = Gtk.Widget.WidgetSetNameMethodInfo
ResolvePreferencesSpinButtonMethod "setNoShowAll" o = Gtk.Widget.WidgetSetNoShowAllMethodInfo
ResolvePreferencesSpinButtonMethod "setOpacity" o = Gtk.Widget.WidgetSetOpacityMethodInfo
ResolvePreferencesSpinButtonMethod "setParent" o = Gtk.Widget.WidgetSetParentMethodInfo
ResolvePreferencesSpinButtonMethod "setParentWindow" o = Gtk.Widget.WidgetSetParentWindowMethodInfo
ResolvePreferencesSpinButtonMethod "setProperty" o = GObject.Object.ObjectSetPropertyMethodInfo
ResolvePreferencesSpinButtonMethod "setRealized" o = Gtk.Widget.WidgetSetRealizedMethodInfo
ResolvePreferencesSpinButtonMethod "setReallocateRedraws" o = Gtk.Container.ContainerSetReallocateRedrawsMethodInfo
ResolvePreferencesSpinButtonMethod "setReceivesDefault" o = Gtk.Widget.WidgetSetReceivesDefaultMethodInfo
ResolvePreferencesSpinButtonMethod "setRedrawOnAllocate" o = Gtk.Widget.WidgetSetRedrawOnAllocateMethodInfo
ResolvePreferencesSpinButtonMethod "setResizeMode" o = Gtk.Container.ContainerSetResizeModeMethodInfo
ResolvePreferencesSpinButtonMethod "setSensitive" o = Gtk.Widget.WidgetSetSensitiveMethodInfo
ResolvePreferencesSpinButtonMethod "setSizeRequest" o = Gtk.Widget.WidgetSetSizeRequestMethodInfo
ResolvePreferencesSpinButtonMethod "setState" o = Gtk.Widget.WidgetSetStateMethodInfo
ResolvePreferencesSpinButtonMethod "setStateFlags" o = Gtk.Widget.WidgetSetStateFlagsMethodInfo
ResolvePreferencesSpinButtonMethod "setStyle" o = Gtk.Widget.WidgetSetStyleMethodInfo
ResolvePreferencesSpinButtonMethod "setSupportMultidevice" o = Gtk.Widget.WidgetSetSupportMultideviceMethodInfo
ResolvePreferencesSpinButtonMethod "setTooltipMarkup" o = Gtk.Widget.WidgetSetTooltipMarkupMethodInfo
ResolvePreferencesSpinButtonMethod "setTooltipText" o = Gtk.Widget.WidgetSetTooltipTextMethodInfo
ResolvePreferencesSpinButtonMethod "setTooltipWindow" o = Gtk.Widget.WidgetSetTooltipWindowMethodInfo
ResolvePreferencesSpinButtonMethod "setValign" o = Gtk.Widget.WidgetSetValignMethodInfo
ResolvePreferencesSpinButtonMethod "setVexpand" o = Gtk.Widget.WidgetSetVexpandMethodInfo
ResolvePreferencesSpinButtonMethod "setVexpandSet" o = Gtk.Widget.WidgetSetVexpandSetMethodInfo
ResolvePreferencesSpinButtonMethod "setVisible" o = Gtk.Widget.WidgetSetVisibleMethodInfo
ResolvePreferencesSpinButtonMethod "setVisual" o = Gtk.Widget.WidgetSetVisualMethodInfo
ResolvePreferencesSpinButtonMethod "setWindow" o = Gtk.Widget.WidgetSetWindowMethodInfo
ResolvePreferencesSpinButtonMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolvePreferencesSpinButtonMethod t PreferencesSpinButton, O.OverloadedMethod info PreferencesSpinButton p) => OL.IsLabel t (PreferencesSpinButton -> 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 ~ ResolvePreferencesSpinButtonMethod t PreferencesSpinButton, O.OverloadedMethod info PreferencesSpinButton p, R.HasField t PreferencesSpinButton p) => R.HasField t PreferencesSpinButton p where
getField = O.overloadedMethod @info
#endif
instance (info ~ ResolvePreferencesSpinButtonMethod t PreferencesSpinButton, O.OverloadedMethodInfo info PreferencesSpinButton) => OL.IsLabel t (O.MethodProxy info PreferencesSpinButton) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.MethodProxy
#else
fromLabel _ = O.MethodProxy
#endif
#endif
type PreferencesSpinButtonActivateCallback =
IO ()
type C_PreferencesSpinButtonActivateCallback =
Ptr PreferencesSpinButton ->
Ptr () ->
IO ()
foreign import ccall "wrapper"
mk_PreferencesSpinButtonActivateCallback :: C_PreferencesSpinButtonActivateCallback -> IO (FunPtr C_PreferencesSpinButtonActivateCallback)
wrap_PreferencesSpinButtonActivateCallback ::
GObject a => (a -> PreferencesSpinButtonActivateCallback) ->
C_PreferencesSpinButtonActivateCallback
wrap_PreferencesSpinButtonActivateCallback :: forall a.
GObject a =>
(a -> IO ()) -> C_PreferencesSpinButtonActivateCallback
wrap_PreferencesSpinButtonActivateCallback a -> IO ()
gi'cb Ptr PreferencesSpinButton
gi'selfPtr Ptr ()
_ = do
Ptr PreferencesSpinButton
-> (PreferencesSpinButton -> IO ()) -> IO ()
forall o b.
(HasCallStack, GObject o) =>
Ptr o -> (o -> IO b) -> IO b
B.ManagedPtr.withNewObject Ptr PreferencesSpinButton
gi'selfPtr ((PreferencesSpinButton -> IO ()) -> IO ())
-> (PreferencesSpinButton -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \PreferencesSpinButton
gi'self -> a -> IO ()
gi'cb (PreferencesSpinButton -> a
forall a b. Coercible a b => a -> b
Coerce.coerce PreferencesSpinButton
gi'self)
onPreferencesSpinButtonActivate :: (IsPreferencesSpinButton a, MonadIO m) => a -> ((?self :: a) => PreferencesSpinButtonActivateCallback) -> m SignalHandlerId
onPreferencesSpinButtonActivate :: forall a (m :: * -> *).
(IsPreferencesSpinButton a, MonadIO m) =>
a -> ((?self::a) => IO ()) -> m SignalHandlerId
onPreferencesSpinButtonActivate 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_PreferencesSpinButtonActivateCallback
wrapped' = (a -> IO ()) -> C_PreferencesSpinButtonActivateCallback
forall a.
GObject a =>
(a -> IO ()) -> C_PreferencesSpinButtonActivateCallback
wrap_PreferencesSpinButtonActivateCallback a -> IO ()
wrapped
FunPtr C_PreferencesSpinButtonActivateCallback
wrapped'' <- C_PreferencesSpinButtonActivateCallback
-> IO (FunPtr C_PreferencesSpinButtonActivateCallback)
mk_PreferencesSpinButtonActivateCallback C_PreferencesSpinButtonActivateCallback
wrapped'
a
-> Text
-> FunPtr C_PreferencesSpinButtonActivateCallback
-> SignalConnectMode
-> Maybe Text
-> IO SignalHandlerId
forall o a.
GObject o =>
o
-> Text
-> FunPtr a
-> SignalConnectMode
-> Maybe Text
-> IO SignalHandlerId
connectSignalFunPtr a
obj Text
"activate" FunPtr C_PreferencesSpinButtonActivateCallback
wrapped'' SignalConnectMode
SignalConnectBefore Maybe Text
forall a. Maybe a
Nothing
afterPreferencesSpinButtonActivate :: (IsPreferencesSpinButton a, MonadIO m) => a -> ((?self :: a) => PreferencesSpinButtonActivateCallback) -> m SignalHandlerId
afterPreferencesSpinButtonActivate :: forall a (m :: * -> *).
(IsPreferencesSpinButton a, MonadIO m) =>
a -> ((?self::a) => IO ()) -> m SignalHandlerId
afterPreferencesSpinButtonActivate 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_PreferencesSpinButtonActivateCallback
wrapped' = (a -> IO ()) -> C_PreferencesSpinButtonActivateCallback
forall a.
GObject a =>
(a -> IO ()) -> C_PreferencesSpinButtonActivateCallback
wrap_PreferencesSpinButtonActivateCallback a -> IO ()
wrapped
FunPtr C_PreferencesSpinButtonActivateCallback
wrapped'' <- C_PreferencesSpinButtonActivateCallback
-> IO (FunPtr C_PreferencesSpinButtonActivateCallback)
mk_PreferencesSpinButtonActivateCallback C_PreferencesSpinButtonActivateCallback
wrapped'
a
-> Text
-> FunPtr C_PreferencesSpinButtonActivateCallback
-> SignalConnectMode
-> Maybe Text
-> IO SignalHandlerId
forall o a.
GObject o =>
o
-> Text
-> FunPtr a
-> SignalConnectMode
-> Maybe Text
-> IO SignalHandlerId
connectSignalFunPtr a
obj Text
"activate" FunPtr C_PreferencesSpinButtonActivateCallback
wrapped'' SignalConnectMode
SignalConnectAfter Maybe Text
forall a. Maybe a
Nothing
#if defined(ENABLE_OVERLOADING)
data PreferencesSpinButtonActivateSignalInfo
instance SignalInfo PreferencesSpinButtonActivateSignalInfo where
type HaskellCallbackType PreferencesSpinButtonActivateSignalInfo = PreferencesSpinButtonActivateCallback
connectSignal obj cb connectMode detail = do
let cb' = wrap_PreferencesSpinButtonActivateCallback cb
cb'' <- mk_PreferencesSpinButtonActivateCallback cb'
connectSignalFunPtr obj "activate" cb'' connectMode detail
dbgSignalInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.PreferencesSpinButton::activate"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-PreferencesSpinButton.html#g:signal:activate"})
#endif
getPreferencesSpinButtonKey :: (MonadIO m, IsPreferencesSpinButton o) => o -> m (Maybe T.Text)
getPreferencesSpinButtonKey :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesSpinButton o) =>
o -> m (Maybe Text)
getPreferencesSpinButtonKey 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"
constructPreferencesSpinButtonKey :: (IsPreferencesSpinButton o, MIO.MonadIO m) => T.Text -> m (GValueConstruct o)
constructPreferencesSpinButtonKey :: forall o (m :: * -> *).
(IsPreferencesSpinButton o, MonadIO m) =>
Text -> m (GValueConstruct o)
constructPreferencesSpinButtonKey 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 PreferencesSpinButtonKeyPropertyInfo
instance AttrInfo PreferencesSpinButtonKeyPropertyInfo where
type AttrAllowedOps PreferencesSpinButtonKeyPropertyInfo = '[ 'AttrConstruct, 'AttrGet, 'AttrClear]
type AttrBaseTypeConstraint PreferencesSpinButtonKeyPropertyInfo = IsPreferencesSpinButton
type AttrSetTypeConstraint PreferencesSpinButtonKeyPropertyInfo = (~) T.Text
type AttrTransferTypeConstraint PreferencesSpinButtonKeyPropertyInfo = (~) T.Text
type AttrTransferType PreferencesSpinButtonKeyPropertyInfo = T.Text
type AttrGetType PreferencesSpinButtonKeyPropertyInfo = (Maybe T.Text)
type AttrLabel PreferencesSpinButtonKeyPropertyInfo = "key"
type AttrOrigin PreferencesSpinButtonKeyPropertyInfo = PreferencesSpinButton
attrGet = getPreferencesSpinButtonKey
attrSet = undefined
attrTransfer _ v = do
return v
attrConstruct = constructPreferencesSpinButtonKey
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.PreferencesSpinButton.key"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-PreferencesSpinButton.html#g:attr:key"
})
#endif
getPreferencesSpinButtonSubtitle :: (MonadIO m, IsPreferencesSpinButton o) => o -> m (Maybe T.Text)
getPreferencesSpinButtonSubtitle :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesSpinButton o) =>
o -> m (Maybe Text)
getPreferencesSpinButtonSubtitle 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"
constructPreferencesSpinButtonSubtitle :: (IsPreferencesSpinButton o, MIO.MonadIO m) => T.Text -> m (GValueConstruct o)
constructPreferencesSpinButtonSubtitle :: forall o (m :: * -> *).
(IsPreferencesSpinButton o, MonadIO m) =>
Text -> m (GValueConstruct o)
constructPreferencesSpinButtonSubtitle 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)
#if defined(ENABLE_OVERLOADING)
data PreferencesSpinButtonSubtitlePropertyInfo
instance AttrInfo PreferencesSpinButtonSubtitlePropertyInfo where
type AttrAllowedOps PreferencesSpinButtonSubtitlePropertyInfo = '[ 'AttrConstruct, 'AttrGet, 'AttrClear]
type AttrBaseTypeConstraint PreferencesSpinButtonSubtitlePropertyInfo = IsPreferencesSpinButton
type AttrSetTypeConstraint PreferencesSpinButtonSubtitlePropertyInfo = (~) T.Text
type AttrTransferTypeConstraint PreferencesSpinButtonSubtitlePropertyInfo = (~) T.Text
type AttrTransferType PreferencesSpinButtonSubtitlePropertyInfo = T.Text
type AttrGetType PreferencesSpinButtonSubtitlePropertyInfo = (Maybe T.Text)
type AttrLabel PreferencesSpinButtonSubtitlePropertyInfo = "subtitle"
type AttrOrigin PreferencesSpinButtonSubtitlePropertyInfo = PreferencesSpinButton
attrGet = getPreferencesSpinButtonSubtitle
attrSet = undefined
attrTransfer _ v = do
return v
attrConstruct = constructPreferencesSpinButtonSubtitle
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.PreferencesSpinButton.subtitle"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-PreferencesSpinButton.html#g:attr:subtitle"
})
#endif
getPreferencesSpinButtonTitle :: (MonadIO m, IsPreferencesSpinButton o) => o -> m (Maybe T.Text)
getPreferencesSpinButtonTitle :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesSpinButton o) =>
o -> m (Maybe Text)
getPreferencesSpinButtonTitle 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"
constructPreferencesSpinButtonTitle :: (IsPreferencesSpinButton o, MIO.MonadIO m) => T.Text -> m (GValueConstruct o)
constructPreferencesSpinButtonTitle :: forall o (m :: * -> *).
(IsPreferencesSpinButton o, MonadIO m) =>
Text -> m (GValueConstruct o)
constructPreferencesSpinButtonTitle 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)
#if defined(ENABLE_OVERLOADING)
data PreferencesSpinButtonTitlePropertyInfo
instance AttrInfo PreferencesSpinButtonTitlePropertyInfo where
type AttrAllowedOps PreferencesSpinButtonTitlePropertyInfo = '[ 'AttrConstruct, 'AttrGet, 'AttrClear]
type AttrBaseTypeConstraint PreferencesSpinButtonTitlePropertyInfo = IsPreferencesSpinButton
type AttrSetTypeConstraint PreferencesSpinButtonTitlePropertyInfo = (~) T.Text
type AttrTransferTypeConstraint PreferencesSpinButtonTitlePropertyInfo = (~) T.Text
type AttrTransferType PreferencesSpinButtonTitlePropertyInfo = T.Text
type AttrGetType PreferencesSpinButtonTitlePropertyInfo = (Maybe T.Text)
type AttrLabel PreferencesSpinButtonTitlePropertyInfo = "title"
type AttrOrigin PreferencesSpinButtonTitlePropertyInfo = PreferencesSpinButton
attrGet = getPreferencesSpinButtonTitle
attrSet = undefined
attrTransfer _ v = do
return v
attrConstruct = constructPreferencesSpinButtonTitle
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.PreferencesSpinButton.title"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-PreferencesSpinButton.html#g:attr:title"
})
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList PreferencesSpinButton
type instance O.AttributeList PreferencesSpinButton = PreferencesSpinButtonAttributeList
type PreferencesSpinButtonAttributeList = ('[ '("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), '("key", PreferencesSpinButtonKeyPropertyInfo), '("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", PreferencesSpinButtonSubtitlePropertyInfo), '("title", PreferencesSpinButtonTitlePropertyInfo), '("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)
preferencesSpinButtonKey :: AttrLabelProxy "key"
preferencesSpinButtonKey = AttrLabelProxy
preferencesSpinButtonSubtitle :: AttrLabelProxy "subtitle"
preferencesSpinButtonSubtitle = AttrLabelProxy
preferencesSpinButtonTitle :: AttrLabelProxy "title"
preferencesSpinButtonTitle = AttrLabelProxy
#endif
#if defined(ENABLE_OVERLOADING)
type instance O.SignalList PreferencesSpinButton = PreferencesSpinButtonSignalList
type PreferencesSpinButtonSignalList = ('[ '("accelClosuresChanged", Gtk.Widget.WidgetAccelClosuresChangedSignalInfo), '("activate", PreferencesSpinButtonActivateSignalInfo), '("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
foreign import ccall "dzl_preferences_spin_button_get_spin_button" dzl_preferences_spin_button_get_spin_button ::
Ptr PreferencesSpinButton ->
IO (Ptr Gtk.Widget.Widget)
preferencesSpinButtonGetSpinButton ::
(B.CallStack.HasCallStack, MonadIO m, IsPreferencesSpinButton a) =>
a
-> m Gtk.Widget.Widget
preferencesSpinButtonGetSpinButton :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsPreferencesSpinButton a) =>
a -> m Widget
preferencesSpinButtonGetSpinButton a
self = IO Widget -> m Widget
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Widget -> m Widget) -> IO Widget -> m Widget
forall a b. (a -> b) -> a -> b
$ do
Ptr PreferencesSpinButton
self' <- a -> IO (Ptr PreferencesSpinButton)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
Ptr Widget
result <- Ptr PreferencesSpinButton -> IO (Ptr Widget)
dzl_preferences_spin_button_get_spin_button Ptr PreferencesSpinButton
self'
Text -> Ptr Widget -> IO ()
forall a. HasCallStack => Text -> Ptr a -> IO ()
checkUnexpectedReturnNULL Text
"preferencesSpinButtonGetSpinButton" Ptr Widget
result
Widget
result' <- ((ManagedPtr Widget -> Widget) -> Ptr Widget -> IO Widget
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
newObject ManagedPtr Widget -> Widget
Gtk.Widget.Widget) Ptr Widget
result
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
Widget -> IO Widget
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Widget
result'
#if defined(ENABLE_OVERLOADING)
data PreferencesSpinButtonGetSpinButtonMethodInfo
instance (signature ~ (m Gtk.Widget.Widget), MonadIO m, IsPreferencesSpinButton a) => O.OverloadedMethod PreferencesSpinButtonGetSpinButtonMethodInfo a signature where
overloadedMethod = preferencesSpinButtonGetSpinButton
instance O.OverloadedMethodInfo PreferencesSpinButtonGetSpinButtonMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.PreferencesSpinButton.preferencesSpinButtonGetSpinButton",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-PreferencesSpinButton.html#v:preferencesSpinButtonGetSpinButton"
})
#endif