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