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