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