{-# LANGUAGE TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.Gtk.Objects.CenterLayout
(
CenterLayout(..) ,
IsCenterLayout ,
toCenterLayout ,
#if defined(ENABLE_OVERLOADING)
ResolveCenterLayoutMethod ,
#endif
#if defined(ENABLE_OVERLOADING)
CenterLayoutGetBaselinePositionMethodInfo,
#endif
centerLayoutGetBaselinePosition ,
#if defined(ENABLE_OVERLOADING)
CenterLayoutGetCenterWidgetMethodInfo ,
#endif
centerLayoutGetCenterWidget ,
#if defined(ENABLE_OVERLOADING)
CenterLayoutGetEndWidgetMethodInfo ,
#endif
centerLayoutGetEndWidget ,
#if defined(ENABLE_OVERLOADING)
CenterLayoutGetOrientationMethodInfo ,
#endif
centerLayoutGetOrientation ,
#if defined(ENABLE_OVERLOADING)
CenterLayoutGetStartWidgetMethodInfo ,
#endif
centerLayoutGetStartWidget ,
centerLayoutNew ,
#if defined(ENABLE_OVERLOADING)
CenterLayoutSetBaselinePositionMethodInfo,
#endif
centerLayoutSetBaselinePosition ,
#if defined(ENABLE_OVERLOADING)
CenterLayoutSetCenterWidgetMethodInfo ,
#endif
centerLayoutSetCenterWidget ,
#if defined(ENABLE_OVERLOADING)
CenterLayoutSetEndWidgetMethodInfo ,
#endif
centerLayoutSetEndWidget ,
#if defined(ENABLE_OVERLOADING)
CenterLayoutSetOrientationMethodInfo ,
#endif
centerLayoutSetOrientation ,
#if defined(ENABLE_OVERLOADING)
CenterLayoutSetStartWidgetMethodInfo ,
#endif
centerLayoutSetStartWidget ,
) 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.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.Text as T
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 GI.GObject.Objects.Object as GObject.Object
import {-# SOURCE #-} qualified GI.Gtk.Enums as Gtk.Enums
import {-# SOURCE #-} qualified GI.Gtk.Objects.LayoutManager as Gtk.LayoutManager
import {-# SOURCE #-} qualified GI.Gtk.Objects.Widget as Gtk.Widget
newtype CenterLayout = CenterLayout (SP.ManagedPtr CenterLayout)
deriving (CenterLayout -> CenterLayout -> Bool
(CenterLayout -> CenterLayout -> Bool)
-> (CenterLayout -> CenterLayout -> Bool) -> Eq CenterLayout
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: CenterLayout -> CenterLayout -> Bool
$c/= :: CenterLayout -> CenterLayout -> Bool
== :: CenterLayout -> CenterLayout -> Bool
$c== :: CenterLayout -> CenterLayout -> Bool
Eq)
instance SP.ManagedPtrNewtype CenterLayout where
toManagedPtr :: CenterLayout -> ManagedPtr CenterLayout
toManagedPtr (CenterLayout ManagedPtr CenterLayout
p) = ManagedPtr CenterLayout
p
foreign import ccall "gtk_center_layout_get_type"
c_gtk_center_layout_get_type :: IO B.Types.GType
instance B.Types.TypedObject CenterLayout where
glibType :: IO GType
glibType = IO GType
c_gtk_center_layout_get_type
instance B.Types.GObject CenterLayout
instance B.GValue.IsGValue CenterLayout where
toGValue :: CenterLayout -> IO GValue
toGValue CenterLayout
o = do
GType
gtype <- IO GType
c_gtk_center_layout_get_type
CenterLayout -> (Ptr CenterLayout -> IO GValue) -> IO GValue
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
B.ManagedPtr.withManagedPtr CenterLayout
o (GType
-> (GValue -> Ptr CenterLayout -> IO ())
-> Ptr CenterLayout
-> IO GValue
forall a. GType -> (GValue -> a -> IO ()) -> a -> IO GValue
B.GValue.buildGValue GType
gtype GValue -> Ptr CenterLayout -> IO ()
forall a. GObject a => GValue -> Ptr a -> IO ()
B.GValue.set_object)
fromGValue :: GValue -> IO CenterLayout
fromGValue GValue
gv = do
Ptr CenterLayout
ptr <- GValue -> IO (Ptr CenterLayout)
forall b. GObject b => GValue -> IO (Ptr b)
B.GValue.get_object GValue
gv :: IO (Ptr CenterLayout)
(ManagedPtr CenterLayout -> CenterLayout)
-> Ptr CenterLayout -> IO CenterLayout
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
B.ManagedPtr.newObject ManagedPtr CenterLayout -> CenterLayout
CenterLayout Ptr CenterLayout
ptr
class (SP.GObject o, O.IsDescendantOf CenterLayout o) => IsCenterLayout o
instance (SP.GObject o, O.IsDescendantOf CenterLayout o) => IsCenterLayout o
instance O.HasParentTypes CenterLayout
type instance O.ParentTypes CenterLayout = '[Gtk.LayoutManager.LayoutManager, GObject.Object.Object]
toCenterLayout :: (MonadIO m, IsCenterLayout o) => o -> m CenterLayout
toCenterLayout :: o -> m CenterLayout
toCenterLayout = IO CenterLayout -> m CenterLayout
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO CenterLayout -> m CenterLayout)
-> (o -> IO CenterLayout) -> o -> m CenterLayout
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ManagedPtr CenterLayout -> CenterLayout) -> o -> IO CenterLayout
forall o o'.
(HasCallStack, ManagedPtrNewtype o, TypedObject o,
ManagedPtrNewtype o', TypedObject o') =>
(ManagedPtr o' -> o') -> o -> IO o'
unsafeCastTo ManagedPtr CenterLayout -> CenterLayout
CenterLayout
#if defined(ENABLE_OVERLOADING)
type family ResolveCenterLayoutMethod (t :: Symbol) (o :: *) :: * where
ResolveCenterLayoutMethod "allocate" o = Gtk.LayoutManager.LayoutManagerAllocateMethodInfo
ResolveCenterLayoutMethod "bindProperty" o = GObject.Object.ObjectBindPropertyMethodInfo
ResolveCenterLayoutMethod "bindPropertyFull" o = GObject.Object.ObjectBindPropertyFullMethodInfo
ResolveCenterLayoutMethod "forceFloating" o = GObject.Object.ObjectForceFloatingMethodInfo
ResolveCenterLayoutMethod "freezeNotify" o = GObject.Object.ObjectFreezeNotifyMethodInfo
ResolveCenterLayoutMethod "getv" o = GObject.Object.ObjectGetvMethodInfo
ResolveCenterLayoutMethod "isFloating" o = GObject.Object.ObjectIsFloatingMethodInfo
ResolveCenterLayoutMethod "layoutChanged" o = Gtk.LayoutManager.LayoutManagerLayoutChangedMethodInfo
ResolveCenterLayoutMethod "measure" o = Gtk.LayoutManager.LayoutManagerMeasureMethodInfo
ResolveCenterLayoutMethod "notify" o = GObject.Object.ObjectNotifyMethodInfo
ResolveCenterLayoutMethod "notifyByPspec" o = GObject.Object.ObjectNotifyByPspecMethodInfo
ResolveCenterLayoutMethod "ref" o = GObject.Object.ObjectRefMethodInfo
ResolveCenterLayoutMethod "refSink" o = GObject.Object.ObjectRefSinkMethodInfo
ResolveCenterLayoutMethod "runDispose" o = GObject.Object.ObjectRunDisposeMethodInfo
ResolveCenterLayoutMethod "stealData" o = GObject.Object.ObjectStealDataMethodInfo
ResolveCenterLayoutMethod "stealQdata" o = GObject.Object.ObjectStealQdataMethodInfo
ResolveCenterLayoutMethod "thawNotify" o = GObject.Object.ObjectThawNotifyMethodInfo
ResolveCenterLayoutMethod "unref" o = GObject.Object.ObjectUnrefMethodInfo
ResolveCenterLayoutMethod "watchClosure" o = GObject.Object.ObjectWatchClosureMethodInfo
ResolveCenterLayoutMethod "getBaselinePosition" o = CenterLayoutGetBaselinePositionMethodInfo
ResolveCenterLayoutMethod "getCenterWidget" o = CenterLayoutGetCenterWidgetMethodInfo
ResolveCenterLayoutMethod "getData" o = GObject.Object.ObjectGetDataMethodInfo
ResolveCenterLayoutMethod "getEndWidget" o = CenterLayoutGetEndWidgetMethodInfo
ResolveCenterLayoutMethod "getLayoutChild" o = Gtk.LayoutManager.LayoutManagerGetLayoutChildMethodInfo
ResolveCenterLayoutMethod "getOrientation" o = CenterLayoutGetOrientationMethodInfo
ResolveCenterLayoutMethod "getProperty" o = GObject.Object.ObjectGetPropertyMethodInfo
ResolveCenterLayoutMethod "getQdata" o = GObject.Object.ObjectGetQdataMethodInfo
ResolveCenterLayoutMethod "getRequestMode" o = Gtk.LayoutManager.LayoutManagerGetRequestModeMethodInfo
ResolveCenterLayoutMethod "getStartWidget" o = CenterLayoutGetStartWidgetMethodInfo
ResolveCenterLayoutMethod "getWidget" o = Gtk.LayoutManager.LayoutManagerGetWidgetMethodInfo
ResolveCenterLayoutMethod "setBaselinePosition" o = CenterLayoutSetBaselinePositionMethodInfo
ResolveCenterLayoutMethod "setCenterWidget" o = CenterLayoutSetCenterWidgetMethodInfo
ResolveCenterLayoutMethod "setData" o = GObject.Object.ObjectSetDataMethodInfo
ResolveCenterLayoutMethod "setDataFull" o = GObject.Object.ObjectSetDataFullMethodInfo
ResolveCenterLayoutMethod "setEndWidget" o = CenterLayoutSetEndWidgetMethodInfo
ResolveCenterLayoutMethod "setOrientation" o = CenterLayoutSetOrientationMethodInfo
ResolveCenterLayoutMethod "setProperty" o = GObject.Object.ObjectSetPropertyMethodInfo
ResolveCenterLayoutMethod "setStartWidget" o = CenterLayoutSetStartWidgetMethodInfo
ResolveCenterLayoutMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolveCenterLayoutMethod t CenterLayout, O.MethodInfo info CenterLayout p) => OL.IsLabel t (CenterLayout -> p) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.overloadedMethod @info
#else
fromLabel _ = O.overloadedMethod @info
#endif
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList CenterLayout
type instance O.AttributeList CenterLayout = CenterLayoutAttributeList
type CenterLayoutAttributeList = ('[ ] :: [(Symbol, *)])
#endif
#if defined(ENABLE_OVERLOADING)
#endif
#if defined(ENABLE_OVERLOADING)
type instance O.SignalList CenterLayout = CenterLayoutSignalList
type CenterLayoutSignalList = ('[ '("notify", GObject.Object.ObjectNotifySignalInfo)] :: [(Symbol, *)])
#endif
foreign import ccall "gtk_center_layout_new" gtk_center_layout_new ::
IO (Ptr CenterLayout)
centerLayoutNew ::
(B.CallStack.HasCallStack, MonadIO m) =>
m CenterLayout
centerLayoutNew :: m CenterLayout
centerLayoutNew = IO CenterLayout -> m CenterLayout
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO CenterLayout -> m CenterLayout)
-> IO CenterLayout -> m CenterLayout
forall a b. (a -> b) -> a -> b
$ do
Ptr CenterLayout
result <- IO (Ptr CenterLayout)
gtk_center_layout_new
Text -> Ptr CenterLayout -> IO ()
forall a. HasCallStack => Text -> Ptr a -> IO ()
checkUnexpectedReturnNULL Text
"centerLayoutNew" Ptr CenterLayout
result
CenterLayout
result' <- ((ManagedPtr CenterLayout -> CenterLayout)
-> Ptr CenterLayout -> IO CenterLayout
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
wrapObject ManagedPtr CenterLayout -> CenterLayout
CenterLayout) Ptr CenterLayout
result
CenterLayout -> IO CenterLayout
forall (m :: * -> *) a. Monad m => a -> m a
return CenterLayout
result'
#if defined(ENABLE_OVERLOADING)
#endif
foreign import ccall "gtk_center_layout_get_baseline_position" gtk_center_layout_get_baseline_position ::
Ptr CenterLayout ->
IO CUInt
centerLayoutGetBaselinePosition ::
(B.CallStack.HasCallStack, MonadIO m, IsCenterLayout a) =>
a
-> m Gtk.Enums.BaselinePosition
centerLayoutGetBaselinePosition :: a -> m BaselinePosition
centerLayoutGetBaselinePosition a
self = IO BaselinePosition -> m BaselinePosition
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO BaselinePosition -> m BaselinePosition)
-> IO BaselinePosition -> m BaselinePosition
forall a b. (a -> b) -> a -> b
$ do
Ptr CenterLayout
self' <- a -> IO (Ptr CenterLayout)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CUInt
result <- Ptr CenterLayout -> IO CUInt
gtk_center_layout_get_baseline_position Ptr CenterLayout
self'
let result' :: BaselinePosition
result' = (Int -> BaselinePosition
forall a. Enum a => Int -> a
toEnum (Int -> BaselinePosition)
-> (CUInt -> Int) -> CUInt -> BaselinePosition
forall b c a. (b -> c) -> (a -> b) -> a -> c
. CUInt -> Int
forall a b. (Integral a, Num b) => a -> b
fromIntegral) CUInt
result
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
BaselinePosition -> IO BaselinePosition
forall (m :: * -> *) a. Monad m => a -> m a
return BaselinePosition
result'
#if defined(ENABLE_OVERLOADING)
data CenterLayoutGetBaselinePositionMethodInfo
instance (signature ~ (m Gtk.Enums.BaselinePosition), MonadIO m, IsCenterLayout a) => O.MethodInfo CenterLayoutGetBaselinePositionMethodInfo a signature where
overloadedMethod = centerLayoutGetBaselinePosition
#endif
foreign import ccall "gtk_center_layout_get_center_widget" gtk_center_layout_get_center_widget ::
Ptr CenterLayout ->
IO (Ptr Gtk.Widget.Widget)
centerLayoutGetCenterWidget ::
(B.CallStack.HasCallStack, MonadIO m, IsCenterLayout a) =>
a
-> m Gtk.Widget.Widget
centerLayoutGetCenterWidget :: a -> m Widget
centerLayoutGetCenterWidget a
self = IO Widget -> m Widget
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Widget -> m Widget) -> IO Widget -> m Widget
forall a b. (a -> b) -> a -> b
$ do
Ptr CenterLayout
self' <- a -> IO (Ptr CenterLayout)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
Ptr Widget
result <- Ptr CenterLayout -> IO (Ptr Widget)
gtk_center_layout_get_center_widget Ptr CenterLayout
self'
Text -> Ptr Widget -> IO ()
forall a. HasCallStack => Text -> Ptr a -> IO ()
checkUnexpectedReturnNULL Text
"centerLayoutGetCenterWidget" Ptr Widget
result
Widget
result' <- ((ManagedPtr Widget -> Widget) -> Ptr Widget -> IO Widget
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
newObject ManagedPtr Widget -> Widget
Gtk.Widget.Widget) Ptr Widget
result
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
Widget -> IO Widget
forall (m :: * -> *) a. Monad m => a -> m a
return Widget
result'
#if defined(ENABLE_OVERLOADING)
data CenterLayoutGetCenterWidgetMethodInfo
instance (signature ~ (m Gtk.Widget.Widget), MonadIO m, IsCenterLayout a) => O.MethodInfo CenterLayoutGetCenterWidgetMethodInfo a signature where
overloadedMethod = centerLayoutGetCenterWidget
#endif
foreign import ccall "gtk_center_layout_get_end_widget" gtk_center_layout_get_end_widget ::
Ptr CenterLayout ->
IO (Ptr Gtk.Widget.Widget)
centerLayoutGetEndWidget ::
(B.CallStack.HasCallStack, MonadIO m, IsCenterLayout a) =>
a
-> m Gtk.Widget.Widget
centerLayoutGetEndWidget :: a -> m Widget
centerLayoutGetEndWidget a
self = IO Widget -> m Widget
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Widget -> m Widget) -> IO Widget -> m Widget
forall a b. (a -> b) -> a -> b
$ do
Ptr CenterLayout
self' <- a -> IO (Ptr CenterLayout)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
Ptr Widget
result <- Ptr CenterLayout -> IO (Ptr Widget)
gtk_center_layout_get_end_widget Ptr CenterLayout
self'
Text -> Ptr Widget -> IO ()
forall a. HasCallStack => Text -> Ptr a -> IO ()
checkUnexpectedReturnNULL Text
"centerLayoutGetEndWidget" Ptr Widget
result
Widget
result' <- ((ManagedPtr Widget -> Widget) -> Ptr Widget -> IO Widget
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
newObject ManagedPtr Widget -> Widget
Gtk.Widget.Widget) Ptr Widget
result
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
Widget -> IO Widget
forall (m :: * -> *) a. Monad m => a -> m a
return Widget
result'
#if defined(ENABLE_OVERLOADING)
data CenterLayoutGetEndWidgetMethodInfo
instance (signature ~ (m Gtk.Widget.Widget), MonadIO m, IsCenterLayout a) => O.MethodInfo CenterLayoutGetEndWidgetMethodInfo a signature where
overloadedMethod = centerLayoutGetEndWidget
#endif
foreign import ccall "gtk_center_layout_get_orientation" gtk_center_layout_get_orientation ::
Ptr CenterLayout ->
IO CUInt
centerLayoutGetOrientation ::
(B.CallStack.HasCallStack, MonadIO m, IsCenterLayout a) =>
a
-> m Gtk.Enums.Orientation
centerLayoutGetOrientation :: a -> m Orientation
centerLayoutGetOrientation a
self = IO Orientation -> m Orientation
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Orientation -> m Orientation)
-> IO Orientation -> m Orientation
forall a b. (a -> b) -> a -> b
$ do
Ptr CenterLayout
self' <- a -> IO (Ptr CenterLayout)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CUInt
result <- Ptr CenterLayout -> IO CUInt
gtk_center_layout_get_orientation Ptr CenterLayout
self'
let result' :: Orientation
result' = (Int -> Orientation
forall a. Enum a => Int -> a
toEnum (Int -> Orientation) -> (CUInt -> Int) -> CUInt -> Orientation
forall b c a. (b -> c) -> (a -> b) -> a -> c
. CUInt -> Int
forall a b. (Integral a, Num b) => a -> b
fromIntegral) CUInt
result
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
Orientation -> IO Orientation
forall (m :: * -> *) a. Monad m => a -> m a
return Orientation
result'
#if defined(ENABLE_OVERLOADING)
data CenterLayoutGetOrientationMethodInfo
instance (signature ~ (m Gtk.Enums.Orientation), MonadIO m, IsCenterLayout a) => O.MethodInfo CenterLayoutGetOrientationMethodInfo a signature where
overloadedMethod = centerLayoutGetOrientation
#endif
foreign import ccall "gtk_center_layout_get_start_widget" gtk_center_layout_get_start_widget ::
Ptr CenterLayout ->
IO (Ptr Gtk.Widget.Widget)
centerLayoutGetStartWidget ::
(B.CallStack.HasCallStack, MonadIO m, IsCenterLayout a) =>
a
-> m Gtk.Widget.Widget
centerLayoutGetStartWidget :: a -> m Widget
centerLayoutGetStartWidget a
self = IO Widget -> m Widget
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Widget -> m Widget) -> IO Widget -> m Widget
forall a b. (a -> b) -> a -> b
$ do
Ptr CenterLayout
self' <- a -> IO (Ptr CenterLayout)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
Ptr Widget
result <- Ptr CenterLayout -> IO (Ptr Widget)
gtk_center_layout_get_start_widget Ptr CenterLayout
self'
Text -> Ptr Widget -> IO ()
forall a. HasCallStack => Text -> Ptr a -> IO ()
checkUnexpectedReturnNULL Text
"centerLayoutGetStartWidget" Ptr Widget
result
Widget
result' <- ((ManagedPtr Widget -> Widget) -> Ptr Widget -> IO Widget
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
newObject ManagedPtr Widget -> Widget
Gtk.Widget.Widget) Ptr Widget
result
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
Widget -> IO Widget
forall (m :: * -> *) a. Monad m => a -> m a
return Widget
result'
#if defined(ENABLE_OVERLOADING)
data CenterLayoutGetStartWidgetMethodInfo
instance (signature ~ (m Gtk.Widget.Widget), MonadIO m, IsCenterLayout a) => O.MethodInfo CenterLayoutGetStartWidgetMethodInfo a signature where
overloadedMethod = centerLayoutGetStartWidget
#endif
foreign import ccall "gtk_center_layout_set_baseline_position" gtk_center_layout_set_baseline_position ::
Ptr CenterLayout ->
CUInt ->
IO ()
centerLayoutSetBaselinePosition ::
(B.CallStack.HasCallStack, MonadIO m, IsCenterLayout a) =>
a
-> Gtk.Enums.BaselinePosition
-> m ()
centerLayoutSetBaselinePosition :: a -> BaselinePosition -> m ()
centerLayoutSetBaselinePosition a
self BaselinePosition
baselinePosition = IO () -> m ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
Ptr CenterLayout
self' <- a -> IO (Ptr CenterLayout)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
let baselinePosition' :: CUInt
baselinePosition' = (Int -> CUInt
forall a b. (Integral a, Num b) => a -> b
fromIntegral (Int -> CUInt)
-> (BaselinePosition -> Int) -> BaselinePosition -> CUInt
forall b c a. (b -> c) -> (a -> b) -> a -> c
. BaselinePosition -> Int
forall a. Enum a => a -> Int
fromEnum) BaselinePosition
baselinePosition
Ptr CenterLayout -> CUInt -> IO ()
gtk_center_layout_set_baseline_position Ptr CenterLayout
self' CUInt
baselinePosition'
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
() -> IO ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#if defined(ENABLE_OVERLOADING)
data CenterLayoutSetBaselinePositionMethodInfo
instance (signature ~ (Gtk.Enums.BaselinePosition -> m ()), MonadIO m, IsCenterLayout a) => O.MethodInfo CenterLayoutSetBaselinePositionMethodInfo a signature where
overloadedMethod = centerLayoutSetBaselinePosition
#endif
foreign import ccall "gtk_center_layout_set_center_widget" gtk_center_layout_set_center_widget ::
Ptr CenterLayout ->
Ptr Gtk.Widget.Widget ->
IO ()
centerLayoutSetCenterWidget ::
(B.CallStack.HasCallStack, MonadIO m, IsCenterLayout a, Gtk.Widget.IsWidget b) =>
a
-> b
-> m ()
centerLayoutSetCenterWidget :: a -> b -> m ()
centerLayoutSetCenterWidget a
self b
widget = IO () -> m ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
Ptr CenterLayout
self' <- a -> IO (Ptr CenterLayout)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
Ptr Widget
widget' <- b -> IO (Ptr Widget)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr b
widget
Ptr CenterLayout -> Ptr Widget -> IO ()
gtk_center_layout_set_center_widget Ptr CenterLayout
self' Ptr Widget
widget'
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
b -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr b
widget
() -> IO ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#if defined(ENABLE_OVERLOADING)
data CenterLayoutSetCenterWidgetMethodInfo
instance (signature ~ (b -> m ()), MonadIO m, IsCenterLayout a, Gtk.Widget.IsWidget b) => O.MethodInfo CenterLayoutSetCenterWidgetMethodInfo a signature where
overloadedMethod = centerLayoutSetCenterWidget
#endif
foreign import ccall "gtk_center_layout_set_end_widget" gtk_center_layout_set_end_widget ::
Ptr CenterLayout ->
Ptr Gtk.Widget.Widget ->
IO ()
centerLayoutSetEndWidget ::
(B.CallStack.HasCallStack, MonadIO m, IsCenterLayout a, Gtk.Widget.IsWidget b) =>
a
-> b
-> m ()
centerLayoutSetEndWidget :: a -> b -> m ()
centerLayoutSetEndWidget a
self b
widget = IO () -> m ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
Ptr CenterLayout
self' <- a -> IO (Ptr CenterLayout)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
Ptr Widget
widget' <- b -> IO (Ptr Widget)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr b
widget
Ptr CenterLayout -> Ptr Widget -> IO ()
gtk_center_layout_set_end_widget Ptr CenterLayout
self' Ptr Widget
widget'
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
b -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr b
widget
() -> IO ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#if defined(ENABLE_OVERLOADING)
data CenterLayoutSetEndWidgetMethodInfo
instance (signature ~ (b -> m ()), MonadIO m, IsCenterLayout a, Gtk.Widget.IsWidget b) => O.MethodInfo CenterLayoutSetEndWidgetMethodInfo a signature where
overloadedMethod = centerLayoutSetEndWidget
#endif
foreign import ccall "gtk_center_layout_set_orientation" gtk_center_layout_set_orientation ::
Ptr CenterLayout ->
CUInt ->
IO ()
centerLayoutSetOrientation ::
(B.CallStack.HasCallStack, MonadIO m, IsCenterLayout a) =>
a
-> Gtk.Enums.Orientation
-> m ()
centerLayoutSetOrientation :: a -> Orientation -> m ()
centerLayoutSetOrientation a
self Orientation
orientation = IO () -> m ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
Ptr CenterLayout
self' <- a -> IO (Ptr CenterLayout)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
let orientation' :: CUInt
orientation' = (Int -> CUInt
forall a b. (Integral a, Num b) => a -> b
fromIntegral (Int -> CUInt) -> (Orientation -> Int) -> Orientation -> CUInt
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Orientation -> Int
forall a. Enum a => a -> Int
fromEnum) Orientation
orientation
Ptr CenterLayout -> CUInt -> IO ()
gtk_center_layout_set_orientation Ptr CenterLayout
self' CUInt
orientation'
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
() -> IO ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#if defined(ENABLE_OVERLOADING)
data CenterLayoutSetOrientationMethodInfo
instance (signature ~ (Gtk.Enums.Orientation -> m ()), MonadIO m, IsCenterLayout a) => O.MethodInfo CenterLayoutSetOrientationMethodInfo a signature where
overloadedMethod = centerLayoutSetOrientation
#endif
foreign import ccall "gtk_center_layout_set_start_widget" gtk_center_layout_set_start_widget ::
Ptr CenterLayout ->
Ptr Gtk.Widget.Widget ->
IO ()
centerLayoutSetStartWidget ::
(B.CallStack.HasCallStack, MonadIO m, IsCenterLayout a, Gtk.Widget.IsWidget b) =>
a
-> b
-> m ()
centerLayoutSetStartWidget :: a -> b -> m ()
centerLayoutSetStartWidget a
self b
widget = IO () -> m ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
Ptr CenterLayout
self' <- a -> IO (Ptr CenterLayout)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
Ptr Widget
widget' <- b -> IO (Ptr Widget)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr b
widget
Ptr CenterLayout -> Ptr Widget -> IO ()
gtk_center_layout_set_start_widget Ptr CenterLayout
self' Ptr Widget
widget'
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
b -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr b
widget
() -> IO ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#if defined(ENABLE_OVERLOADING)
data CenterLayoutSetStartWidgetMethodInfo
instance (signature ~ (b -> m ()), MonadIO m, IsCenterLayout a, Gtk.Widget.IsWidget b) => O.MethodInfo CenterLayoutSetStartWidgetMethodInfo a signature where
overloadedMethod = centerLayoutSetStartWidget
#endif