{-# LANGUAGE TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.Clutter.Objects.Settings
    ( 
    Settings(..)                            ,
    IsSettings                              ,
    toSettings                              ,
 
#if defined(ENABLE_OVERLOADING)
    ResolveSettingsMethod                   ,
#endif
    settingsGetDefault                      ,
 
#if defined(ENABLE_OVERLOADING)
    SettingsBackendPropertyInfo             ,
#endif
    constructSettingsBackend                ,
#if defined(ENABLE_OVERLOADING)
    settingsBackend                         ,
#endif
#if defined(ENABLE_OVERLOADING)
    SettingsDndDragThresholdPropertyInfo    ,
#endif
    constructSettingsDndDragThreshold       ,
    getSettingsDndDragThreshold             ,
    setSettingsDndDragThreshold             ,
#if defined(ENABLE_OVERLOADING)
    settingsDndDragThreshold                ,
#endif
#if defined(ENABLE_OVERLOADING)
    SettingsDoubleClickDistancePropertyInfo ,
#endif
    constructSettingsDoubleClickDistance    ,
    getSettingsDoubleClickDistance          ,
    setSettingsDoubleClickDistance          ,
#if defined(ENABLE_OVERLOADING)
    settingsDoubleClickDistance             ,
#endif
#if defined(ENABLE_OVERLOADING)
    SettingsDoubleClickTimePropertyInfo     ,
#endif
    constructSettingsDoubleClickTime        ,
    getSettingsDoubleClickTime              ,
    setSettingsDoubleClickTime              ,
#if defined(ENABLE_OVERLOADING)
    settingsDoubleClickTime                 ,
#endif
#if defined(ENABLE_OVERLOADING)
    SettingsFontAntialiasPropertyInfo       ,
#endif
    constructSettingsFontAntialias          ,
    getSettingsFontAntialias                ,
    setSettingsFontAntialias                ,
#if defined(ENABLE_OVERLOADING)
    settingsFontAntialias                   ,
#endif
#if defined(ENABLE_OVERLOADING)
    SettingsFontDpiPropertyInfo             ,
#endif
    constructSettingsFontDpi                ,
    getSettingsFontDpi                      ,
    setSettingsFontDpi                      ,
#if defined(ENABLE_OVERLOADING)
    settingsFontDpi                         ,
#endif
#if defined(ENABLE_OVERLOADING)
    SettingsFontHintStylePropertyInfo       ,
#endif
    clearSettingsFontHintStyle              ,
    constructSettingsFontHintStyle          ,
    getSettingsFontHintStyle                ,
    setSettingsFontHintStyle                ,
#if defined(ENABLE_OVERLOADING)
    settingsFontHintStyle                   ,
#endif
#if defined(ENABLE_OVERLOADING)
    SettingsFontHintingPropertyInfo         ,
#endif
    constructSettingsFontHinting            ,
    getSettingsFontHinting                  ,
    setSettingsFontHinting                  ,
#if defined(ENABLE_OVERLOADING)
    settingsFontHinting                     ,
#endif
#if defined(ENABLE_OVERLOADING)
    SettingsFontNamePropertyInfo            ,
#endif
    clearSettingsFontName                   ,
    constructSettingsFontName               ,
    getSettingsFontName                     ,
    setSettingsFontName                     ,
#if defined(ENABLE_OVERLOADING)
    settingsFontName                        ,
#endif
#if defined(ENABLE_OVERLOADING)
    SettingsFontSubpixelOrderPropertyInfo   ,
#endif
    clearSettingsFontSubpixelOrder          ,
    constructSettingsFontSubpixelOrder      ,
    getSettingsFontSubpixelOrder            ,
    setSettingsFontSubpixelOrder            ,
#if defined(ENABLE_OVERLOADING)
    settingsFontSubpixelOrder               ,
#endif
#if defined(ENABLE_OVERLOADING)
    SettingsFontconfigTimestampPropertyInfo ,
#endif
    constructSettingsFontconfigTimestamp    ,
    setSettingsFontconfigTimestamp          ,
#if defined(ENABLE_OVERLOADING)
    settingsFontconfigTimestamp             ,
#endif
#if defined(ENABLE_OVERLOADING)
    SettingsLongPressDurationPropertyInfo   ,
#endif
    constructSettingsLongPressDuration      ,
    getSettingsLongPressDuration            ,
    setSettingsLongPressDuration            ,
#if defined(ENABLE_OVERLOADING)
    settingsLongPressDuration               ,
#endif
#if defined(ENABLE_OVERLOADING)
    SettingsPasswordHintTimePropertyInfo    ,
#endif
    constructSettingsPasswordHintTime       ,
    getSettingsPasswordHintTime             ,
    setSettingsPasswordHintTime             ,
#if defined(ENABLE_OVERLOADING)
    settingsPasswordHintTime                ,
#endif
#if defined(ENABLE_OVERLOADING)
    SettingsUnscaledFontDpiPropertyInfo     ,
#endif
    constructSettingsUnscaledFontDpi        ,
    setSettingsUnscaledFontDpi              ,
#if defined(ENABLE_OVERLOADING)
    settingsUnscaledFontDpi                 ,
#endif
#if defined(ENABLE_OVERLOADING)
    SettingsWindowScalingFactorPropertyInfo ,
#endif
    constructSettingsWindowScalingFactor    ,
    getSettingsWindowScalingFactor          ,
    setSettingsWindowScalingFactor          ,
#if defined(ENABLE_OVERLOADING)
    settingsWindowScalingFactor             ,
#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.Cairo.Structs.FontOptions as Cairo.FontOptions
import {-# SOURCE #-} qualified GI.Clutter.Objects.Backend as Clutter.Backend
import qualified GI.GObject.Objects.Object as GObject.Object
#else
import {-# SOURCE #-} qualified GI.Clutter.Objects.Backend as Clutter.Backend
import qualified GI.GObject.Objects.Object as GObject.Object
#endif
newtype Settings = Settings (SP.ManagedPtr Settings)
    deriving (Settings -> Settings -> Bool
(Settings -> Settings -> Bool)
-> (Settings -> Settings -> Bool) -> Eq Settings
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Settings -> Settings -> Bool
== :: Settings -> Settings -> Bool
$c/= :: Settings -> Settings -> Bool
/= :: Settings -> Settings -> Bool
Eq)
instance SP.ManagedPtrNewtype Settings where
    toManagedPtr :: Settings -> ManagedPtr Settings
toManagedPtr (Settings ManagedPtr Settings
p) = ManagedPtr Settings
p
foreign import ccall "clutter_settings_get_type"
    c_clutter_settings_get_type :: IO B.Types.GType
instance B.Types.TypedObject Settings where
    glibType :: IO GType
glibType = IO GType
c_clutter_settings_get_type
instance B.Types.GObject Settings
class (SP.GObject o, O.IsDescendantOf Settings o) => IsSettings o
instance (SP.GObject o, O.IsDescendantOf Settings o) => IsSettings o
instance O.HasParentTypes Settings
type instance O.ParentTypes Settings = '[GObject.Object.Object]
toSettings :: (MIO.MonadIO m, IsSettings o) => o -> m Settings
toSettings :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> m Settings
toSettings = IO Settings -> m Settings
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Settings -> m Settings)
-> (o -> IO Settings) -> o -> m Settings
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ManagedPtr Settings -> Settings) -> o -> IO Settings
forall o o'.
(HasCallStack, ManagedPtrNewtype o, TypedObject o,
 ManagedPtrNewtype o', TypedObject o') =>
(ManagedPtr o' -> o') -> o -> IO o'
B.ManagedPtr.unsafeCastTo ManagedPtr Settings -> Settings
Settings
instance B.GValue.IsGValue (Maybe Settings) where
    gvalueGType_ :: IO GType
gvalueGType_ = IO GType
c_clutter_settings_get_type
    gvalueSet_ :: Ptr GValue -> Maybe Settings -> IO ()
gvalueSet_ Ptr GValue
gv Maybe Settings
P.Nothing = Ptr GValue -> Ptr Settings -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv (Ptr Settings
forall a. Ptr a
FP.nullPtr :: FP.Ptr Settings)
    gvalueSet_ Ptr GValue
gv (P.Just Settings
obj) = Settings -> (Ptr Settings -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
B.ManagedPtr.withManagedPtr Settings
obj (Ptr GValue -> Ptr Settings -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv)
    gvalueGet_ :: Ptr GValue -> IO (Maybe Settings)
gvalueGet_ Ptr GValue
gv = do
        Ptr Settings
ptr <- Ptr GValue -> IO (Ptr Settings)
forall a. GObject a => Ptr GValue -> IO (Ptr a)
B.GValue.get_object Ptr GValue
gv :: IO (FP.Ptr Settings)
        if Ptr Settings
ptr Ptr Settings -> Ptr Settings -> Bool
forall a. Eq a => a -> a -> Bool
/= Ptr Settings
forall a. Ptr a
FP.nullPtr
        then Settings -> Maybe Settings
forall a. a -> Maybe a
P.Just (Settings -> Maybe Settings) -> IO Settings -> IO (Maybe Settings)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (ManagedPtr Settings -> Settings) -> Ptr Settings -> IO Settings
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
B.ManagedPtr.newObject ManagedPtr Settings -> Settings
Settings Ptr Settings
ptr
        else Maybe Settings -> IO (Maybe Settings)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe Settings
forall a. Maybe a
P.Nothing
        
    
#if defined(ENABLE_OVERLOADING)
type family ResolveSettingsMethod (t :: Symbol) (o :: DK.Type) :: DK.Type where
    ResolveSettingsMethod "bindProperty" o = GObject.Object.ObjectBindPropertyMethodInfo
    ResolveSettingsMethod "bindPropertyFull" o = GObject.Object.ObjectBindPropertyFullMethodInfo
    ResolveSettingsMethod "forceFloating" o = GObject.Object.ObjectForceFloatingMethodInfo
    ResolveSettingsMethod "freezeNotify" o = GObject.Object.ObjectFreezeNotifyMethodInfo
    ResolveSettingsMethod "getv" o = GObject.Object.ObjectGetvMethodInfo
    ResolveSettingsMethod "isFloating" o = GObject.Object.ObjectIsFloatingMethodInfo
    ResolveSettingsMethod "notify" o = GObject.Object.ObjectNotifyMethodInfo
    ResolveSettingsMethod "notifyByPspec" o = GObject.Object.ObjectNotifyByPspecMethodInfo
    ResolveSettingsMethod "ref" o = GObject.Object.ObjectRefMethodInfo
    ResolveSettingsMethod "refSink" o = GObject.Object.ObjectRefSinkMethodInfo
    ResolveSettingsMethod "runDispose" o = GObject.Object.ObjectRunDisposeMethodInfo
    ResolveSettingsMethod "stealData" o = GObject.Object.ObjectStealDataMethodInfo
    ResolveSettingsMethod "stealQdata" o = GObject.Object.ObjectStealQdataMethodInfo
    ResolveSettingsMethod "thawNotify" o = GObject.Object.ObjectThawNotifyMethodInfo
    ResolveSettingsMethod "unref" o = GObject.Object.ObjectUnrefMethodInfo
    ResolveSettingsMethod "watchClosure" o = GObject.Object.ObjectWatchClosureMethodInfo
    ResolveSettingsMethod "getData" o = GObject.Object.ObjectGetDataMethodInfo
    ResolveSettingsMethod "getProperty" o = GObject.Object.ObjectGetPropertyMethodInfo
    ResolveSettingsMethod "getQdata" o = GObject.Object.ObjectGetQdataMethodInfo
    ResolveSettingsMethod "setData" o = GObject.Object.ObjectSetDataMethodInfo
    ResolveSettingsMethod "setDataFull" o = GObject.Object.ObjectSetDataFullMethodInfo
    ResolveSettingsMethod "setProperty" o = GObject.Object.ObjectSetPropertyMethodInfo
    ResolveSettingsMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolveSettingsMethod t Settings, O.OverloadedMethod info Settings p) => OL.IsLabel t (Settings -> 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 ~ ResolveSettingsMethod t Settings, O.OverloadedMethod info Settings p, R.HasField t Settings p) => R.HasField t Settings p where
    getField = O.overloadedMethod @info
#endif
instance (info ~ ResolveSettingsMethod t Settings, O.OverloadedMethodInfo info Settings) => OL.IsLabel t (O.MethodProxy info Settings) where
#if MIN_VERSION_base(4,10,0)
    fromLabel = O.MethodProxy
#else
    fromLabel _ = O.MethodProxy
#endif
#endif
   
   
   
constructSettingsBackend :: (IsSettings o, MIO.MonadIO m, Clutter.Backend.IsBackend a) => a -> m (GValueConstruct o)
constructSettingsBackend :: forall o (m :: * -> *) a.
(IsSettings o, MonadIO m, IsBackend a) =>
a -> m (GValueConstruct o)
constructSettingsBackend 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
"backend" (a -> Maybe a
forall a. a -> Maybe a
P.Just a
val)
#if defined(ENABLE_OVERLOADING)
data SettingsBackendPropertyInfo
instance AttrInfo SettingsBackendPropertyInfo where
    type AttrAllowedOps SettingsBackendPropertyInfo = '[ 'AttrConstruct, 'AttrClear]
    type AttrBaseTypeConstraint SettingsBackendPropertyInfo = IsSettings
    type AttrSetTypeConstraint SettingsBackendPropertyInfo = Clutter.Backend.IsBackend
    type AttrTransferTypeConstraint SettingsBackendPropertyInfo = Clutter.Backend.IsBackend
    type AttrTransferType SettingsBackendPropertyInfo = Clutter.Backend.Backend
    type AttrGetType SettingsBackendPropertyInfo = ()
    type AttrLabel SettingsBackendPropertyInfo = "backend"
    type AttrOrigin SettingsBackendPropertyInfo = Settings
    attrGet = undefined
    attrSet = undefined
    attrTransfer _ v = do
        unsafeCastTo Clutter.Backend.Backend v
    attrConstruct = constructSettingsBackend
    attrClear = undefined
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Clutter.Objects.Settings.backend"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-clutter-1.0.6/docs/GI-Clutter-Objects-Settings.html#g:attr:backend"
        })
#endif
   
   
   
getSettingsDndDragThreshold :: (MonadIO m, IsSettings o) => o -> m Int32
getSettingsDndDragThreshold :: forall (m :: * -> *) o. (MonadIO m, IsSettings o) => o -> m Int32
getSettingsDndDragThreshold o
obj = IO Int32 -> m Int32
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Int32 -> m Int32) -> IO Int32 -> m Int32
forall a b. (a -> b) -> a -> b
$ o -> String -> IO Int32
forall a. GObject a => a -> String -> IO Int32
B.Properties.getObjectPropertyInt32 o
obj String
"dnd-drag-threshold"
setSettingsDndDragThreshold :: (MonadIO m, IsSettings o) => o -> Int32 -> m ()
setSettingsDndDragThreshold :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> Int32 -> m ()
setSettingsDndDragThreshold o
obj Int32
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 -> Int32 -> IO ()
forall a. GObject a => a -> String -> Int32 -> IO ()
B.Properties.setObjectPropertyInt32 o
obj String
"dnd-drag-threshold" Int32
val
constructSettingsDndDragThreshold :: (IsSettings o, MIO.MonadIO m) => Int32 -> m (GValueConstruct o)
constructSettingsDndDragThreshold :: forall o (m :: * -> *).
(IsSettings o, MonadIO m) =>
Int32 -> m (GValueConstruct o)
constructSettingsDndDragThreshold Int32
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 -> Int32 -> IO (GValueConstruct o)
forall o. String -> Int32 -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyInt32 String
"dnd-drag-threshold" Int32
val
#if defined(ENABLE_OVERLOADING)
data SettingsDndDragThresholdPropertyInfo
instance AttrInfo SettingsDndDragThresholdPropertyInfo where
    type AttrAllowedOps SettingsDndDragThresholdPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrBaseTypeConstraint SettingsDndDragThresholdPropertyInfo = IsSettings
    type AttrSetTypeConstraint SettingsDndDragThresholdPropertyInfo = (~) Int32
    type AttrTransferTypeConstraint SettingsDndDragThresholdPropertyInfo = (~) Int32
    type AttrTransferType SettingsDndDragThresholdPropertyInfo = Int32
    type AttrGetType SettingsDndDragThresholdPropertyInfo = Int32
    type AttrLabel SettingsDndDragThresholdPropertyInfo = "dnd-drag-threshold"
    type AttrOrigin SettingsDndDragThresholdPropertyInfo = Settings
    attrGet = getSettingsDndDragThreshold
    attrSet = setSettingsDndDragThreshold
    attrTransfer _ v = do
        return v
    attrConstruct = constructSettingsDndDragThreshold
    attrClear = undefined
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Clutter.Objects.Settings.dndDragThreshold"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-clutter-1.0.6/docs/GI-Clutter-Objects-Settings.html#g:attr:dndDragThreshold"
        })
#endif
   
   
   
getSettingsDoubleClickDistance :: (MonadIO m, IsSettings o) => o -> m Int32
getSettingsDoubleClickDistance :: forall (m :: * -> *) o. (MonadIO m, IsSettings o) => o -> m Int32
getSettingsDoubleClickDistance o
obj = IO Int32 -> m Int32
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Int32 -> m Int32) -> IO Int32 -> m Int32
forall a b. (a -> b) -> a -> b
$ o -> String -> IO Int32
forall a. GObject a => a -> String -> IO Int32
B.Properties.getObjectPropertyInt32 o
obj String
"double-click-distance"
setSettingsDoubleClickDistance :: (MonadIO m, IsSettings o) => o -> Int32 -> m ()
setSettingsDoubleClickDistance :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> Int32 -> m ()
setSettingsDoubleClickDistance o
obj Int32
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 -> Int32 -> IO ()
forall a. GObject a => a -> String -> Int32 -> IO ()
B.Properties.setObjectPropertyInt32 o
obj String
"double-click-distance" Int32
val
constructSettingsDoubleClickDistance :: (IsSettings o, MIO.MonadIO m) => Int32 -> m (GValueConstruct o)
constructSettingsDoubleClickDistance :: forall o (m :: * -> *).
(IsSettings o, MonadIO m) =>
Int32 -> m (GValueConstruct o)
constructSettingsDoubleClickDistance Int32
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 -> Int32 -> IO (GValueConstruct o)
forall o. String -> Int32 -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyInt32 String
"double-click-distance" Int32
val
#if defined(ENABLE_OVERLOADING)
data SettingsDoubleClickDistancePropertyInfo
instance AttrInfo SettingsDoubleClickDistancePropertyInfo where
    type AttrAllowedOps SettingsDoubleClickDistancePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrBaseTypeConstraint SettingsDoubleClickDistancePropertyInfo = IsSettings
    type AttrSetTypeConstraint SettingsDoubleClickDistancePropertyInfo = (~) Int32
    type AttrTransferTypeConstraint SettingsDoubleClickDistancePropertyInfo = (~) Int32
    type AttrTransferType SettingsDoubleClickDistancePropertyInfo = Int32
    type AttrGetType SettingsDoubleClickDistancePropertyInfo = Int32
    type AttrLabel SettingsDoubleClickDistancePropertyInfo = "double-click-distance"
    type AttrOrigin SettingsDoubleClickDistancePropertyInfo = Settings
    attrGet = getSettingsDoubleClickDistance
    attrSet = setSettingsDoubleClickDistance
    attrTransfer _ v = do
        return v
    attrConstruct = constructSettingsDoubleClickDistance
    attrClear = undefined
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Clutter.Objects.Settings.doubleClickDistance"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-clutter-1.0.6/docs/GI-Clutter-Objects-Settings.html#g:attr:doubleClickDistance"
        })
#endif
   
   
   
getSettingsDoubleClickTime :: (MonadIO m, IsSettings o) => o -> m Int32
getSettingsDoubleClickTime :: forall (m :: * -> *) o. (MonadIO m, IsSettings o) => o -> m Int32
getSettingsDoubleClickTime o
obj = IO Int32 -> m Int32
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Int32 -> m Int32) -> IO Int32 -> m Int32
forall a b. (a -> b) -> a -> b
$ o -> String -> IO Int32
forall a. GObject a => a -> String -> IO Int32
B.Properties.getObjectPropertyInt32 o
obj String
"double-click-time"
setSettingsDoubleClickTime :: (MonadIO m, IsSettings o) => o -> Int32 -> m ()
setSettingsDoubleClickTime :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> Int32 -> m ()
setSettingsDoubleClickTime o
obj Int32
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 -> Int32 -> IO ()
forall a. GObject a => a -> String -> Int32 -> IO ()
B.Properties.setObjectPropertyInt32 o
obj String
"double-click-time" Int32
val
constructSettingsDoubleClickTime :: (IsSettings o, MIO.MonadIO m) => Int32 -> m (GValueConstruct o)
constructSettingsDoubleClickTime :: forall o (m :: * -> *).
(IsSettings o, MonadIO m) =>
Int32 -> m (GValueConstruct o)
constructSettingsDoubleClickTime Int32
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 -> Int32 -> IO (GValueConstruct o)
forall o. String -> Int32 -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyInt32 String
"double-click-time" Int32
val
#if defined(ENABLE_OVERLOADING)
data SettingsDoubleClickTimePropertyInfo
instance AttrInfo SettingsDoubleClickTimePropertyInfo where
    type AttrAllowedOps SettingsDoubleClickTimePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrBaseTypeConstraint SettingsDoubleClickTimePropertyInfo = IsSettings
    type AttrSetTypeConstraint SettingsDoubleClickTimePropertyInfo = (~) Int32
    type AttrTransferTypeConstraint SettingsDoubleClickTimePropertyInfo = (~) Int32
    type AttrTransferType SettingsDoubleClickTimePropertyInfo = Int32
    type AttrGetType SettingsDoubleClickTimePropertyInfo = Int32
    type AttrLabel SettingsDoubleClickTimePropertyInfo = "double-click-time"
    type AttrOrigin SettingsDoubleClickTimePropertyInfo = Settings
    attrGet = getSettingsDoubleClickTime
    attrSet = setSettingsDoubleClickTime
    attrTransfer _ v = do
        return v
    attrConstruct = constructSettingsDoubleClickTime
    attrClear = undefined
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Clutter.Objects.Settings.doubleClickTime"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-clutter-1.0.6/docs/GI-Clutter-Objects-Settings.html#g:attr:doubleClickTime"
        })
#endif
   
   
   
getSettingsFontAntialias :: (MonadIO m, IsSettings o) => o -> m Int32
getSettingsFontAntialias :: forall (m :: * -> *) o. (MonadIO m, IsSettings o) => o -> m Int32
getSettingsFontAntialias o
obj = IO Int32 -> m Int32
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Int32 -> m Int32) -> IO Int32 -> m Int32
forall a b. (a -> b) -> a -> b
$ o -> String -> IO Int32
forall a. GObject a => a -> String -> IO Int32
B.Properties.getObjectPropertyInt32 o
obj String
"font-antialias"
setSettingsFontAntialias :: (MonadIO m, IsSettings o) => o -> Int32 -> m ()
setSettingsFontAntialias :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> Int32 -> m ()
setSettingsFontAntialias o
obj Int32
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 -> Int32 -> IO ()
forall a. GObject a => a -> String -> Int32 -> IO ()
B.Properties.setObjectPropertyInt32 o
obj String
"font-antialias" Int32
val
constructSettingsFontAntialias :: (IsSettings o, MIO.MonadIO m) => Int32 -> m (GValueConstruct o)
constructSettingsFontAntialias :: forall o (m :: * -> *).
(IsSettings o, MonadIO m) =>
Int32 -> m (GValueConstruct o)
constructSettingsFontAntialias Int32
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 -> Int32 -> IO (GValueConstruct o)
forall o. String -> Int32 -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyInt32 String
"font-antialias" Int32
val
#if defined(ENABLE_OVERLOADING)
data SettingsFontAntialiasPropertyInfo
instance AttrInfo SettingsFontAntialiasPropertyInfo where
    type AttrAllowedOps SettingsFontAntialiasPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrBaseTypeConstraint SettingsFontAntialiasPropertyInfo = IsSettings
    type AttrSetTypeConstraint SettingsFontAntialiasPropertyInfo = (~) Int32
    type AttrTransferTypeConstraint SettingsFontAntialiasPropertyInfo = (~) Int32
    type AttrTransferType SettingsFontAntialiasPropertyInfo = Int32
    type AttrGetType SettingsFontAntialiasPropertyInfo = Int32
    type AttrLabel SettingsFontAntialiasPropertyInfo = "font-antialias"
    type AttrOrigin SettingsFontAntialiasPropertyInfo = Settings
    attrGet = getSettingsFontAntialias
    attrSet = setSettingsFontAntialias
    attrTransfer _ v = do
        return v
    attrConstruct = constructSettingsFontAntialias
    attrClear = undefined
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Clutter.Objects.Settings.fontAntialias"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-clutter-1.0.6/docs/GI-Clutter-Objects-Settings.html#g:attr:fontAntialias"
        })
#endif
   
   
   
getSettingsFontDpi :: (MonadIO m, IsSettings o) => o -> m Int32
getSettingsFontDpi :: forall (m :: * -> *) o. (MonadIO m, IsSettings o) => o -> m Int32
getSettingsFontDpi o
obj = IO Int32 -> m Int32
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Int32 -> m Int32) -> IO Int32 -> m Int32
forall a b. (a -> b) -> a -> b
$ o -> String -> IO Int32
forall a. GObject a => a -> String -> IO Int32
B.Properties.getObjectPropertyInt32 o
obj String
"font-dpi"
setSettingsFontDpi :: (MonadIO m, IsSettings o) => o -> Int32 -> m ()
setSettingsFontDpi :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> Int32 -> m ()
setSettingsFontDpi o
obj Int32
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 -> Int32 -> IO ()
forall a. GObject a => a -> String -> Int32 -> IO ()
B.Properties.setObjectPropertyInt32 o
obj String
"font-dpi" Int32
val
constructSettingsFontDpi :: (IsSettings o, MIO.MonadIO m) => Int32 -> m (GValueConstruct o)
constructSettingsFontDpi :: forall o (m :: * -> *).
(IsSettings o, MonadIO m) =>
Int32 -> m (GValueConstruct o)
constructSettingsFontDpi Int32
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 -> Int32 -> IO (GValueConstruct o)
forall o. String -> Int32 -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyInt32 String
"font-dpi" Int32
val
#if defined(ENABLE_OVERLOADING)
data SettingsFontDpiPropertyInfo
instance AttrInfo SettingsFontDpiPropertyInfo where
    type AttrAllowedOps SettingsFontDpiPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrBaseTypeConstraint SettingsFontDpiPropertyInfo = IsSettings
    type AttrSetTypeConstraint SettingsFontDpiPropertyInfo = (~) Int32
    type AttrTransferTypeConstraint SettingsFontDpiPropertyInfo = (~) Int32
    type AttrTransferType SettingsFontDpiPropertyInfo = Int32
    type AttrGetType SettingsFontDpiPropertyInfo = Int32
    type AttrLabel SettingsFontDpiPropertyInfo = "font-dpi"
    type AttrOrigin SettingsFontDpiPropertyInfo = Settings
    attrGet = getSettingsFontDpi
    attrSet = setSettingsFontDpi
    attrTransfer _ v = do
        return v
    attrConstruct = constructSettingsFontDpi
    attrClear = undefined
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Clutter.Objects.Settings.fontDpi"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-clutter-1.0.6/docs/GI-Clutter-Objects-Settings.html#g:attr:fontDpi"
        })
#endif
   
   
   
getSettingsFontHintStyle :: (MonadIO m, IsSettings o) => o -> m (Maybe T.Text)
getSettingsFontHintStyle :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> m (Maybe Text)
getSettingsFontHintStyle o
obj = IO (Maybe Text) -> m (Maybe Text)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (Maybe Text) -> m (Maybe Text))
-> IO (Maybe Text) -> m (Maybe Text)
forall a b. (a -> b) -> a -> b
$ o -> String -> IO (Maybe Text)
forall a. GObject a => a -> String -> IO (Maybe Text)
B.Properties.getObjectPropertyString o
obj String
"font-hint-style"
setSettingsFontHintStyle :: (MonadIO m, IsSettings o) => o -> T.Text -> m ()
setSettingsFontHintStyle :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> Text -> m ()
setSettingsFontHintStyle o
obj Text
val = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
    o -> String -> Maybe Text -> IO ()
forall a. GObject a => a -> String -> Maybe Text -> IO ()
B.Properties.setObjectPropertyString o
obj String
"font-hint-style" (Text -> Maybe Text
forall a. a -> Maybe a
Just Text
val)
constructSettingsFontHintStyle :: (IsSettings o, MIO.MonadIO m) => T.Text -> m (GValueConstruct o)
constructSettingsFontHintStyle :: forall o (m :: * -> *).
(IsSettings o, MonadIO m) =>
Text -> m (GValueConstruct o)
constructSettingsFontHintStyle Text
val = IO (GValueConstruct o) -> m (GValueConstruct o)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> m (GValueConstruct o))
-> IO (GValueConstruct o) -> m (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ do
    IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a. IO a -> IO a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> IO (GValueConstruct o))
-> IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ String -> Maybe Text -> IO (GValueConstruct o)
forall o. String -> Maybe Text -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyString String
"font-hint-style" (Text -> Maybe Text
forall a. a -> Maybe a
P.Just Text
val)
clearSettingsFontHintStyle :: (MonadIO m, IsSettings o) => o -> m ()
clearSettingsFontHintStyle :: forall (m :: * -> *) o. (MonadIO m, IsSettings o) => o -> m ()
clearSettingsFontHintStyle o
obj = 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
$ o -> String -> Maybe Text -> IO ()
forall a. GObject a => a -> String -> Maybe Text -> IO ()
B.Properties.setObjectPropertyString o
obj String
"font-hint-style" (Maybe Text
forall a. Maybe a
Nothing :: Maybe T.Text)
#if defined(ENABLE_OVERLOADING)
data SettingsFontHintStylePropertyInfo
instance AttrInfo SettingsFontHintStylePropertyInfo where
    type AttrAllowedOps SettingsFontHintStylePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet, 'AttrClear]
    type AttrBaseTypeConstraint SettingsFontHintStylePropertyInfo = IsSettings
    type AttrSetTypeConstraint SettingsFontHintStylePropertyInfo = (~) T.Text
    type AttrTransferTypeConstraint SettingsFontHintStylePropertyInfo = (~) T.Text
    type AttrTransferType SettingsFontHintStylePropertyInfo = T.Text
    type AttrGetType SettingsFontHintStylePropertyInfo = (Maybe T.Text)
    type AttrLabel SettingsFontHintStylePropertyInfo = "font-hint-style"
    type AttrOrigin SettingsFontHintStylePropertyInfo = Settings
    attrGet = getSettingsFontHintStyle
    attrSet = setSettingsFontHintStyle
    attrTransfer _ v = do
        return v
    attrConstruct = constructSettingsFontHintStyle
    attrClear = clearSettingsFontHintStyle
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Clutter.Objects.Settings.fontHintStyle"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-clutter-1.0.6/docs/GI-Clutter-Objects-Settings.html#g:attr:fontHintStyle"
        })
#endif
   
   
   
getSettingsFontHinting :: (MonadIO m, IsSettings o) => o -> m Int32
getSettingsFontHinting :: forall (m :: * -> *) o. (MonadIO m, IsSettings o) => o -> m Int32
getSettingsFontHinting o
obj = IO Int32 -> m Int32
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Int32 -> m Int32) -> IO Int32 -> m Int32
forall a b. (a -> b) -> a -> b
$ o -> String -> IO Int32
forall a. GObject a => a -> String -> IO Int32
B.Properties.getObjectPropertyInt32 o
obj String
"font-hinting"
setSettingsFontHinting :: (MonadIO m, IsSettings o) => o -> Int32 -> m ()
setSettingsFontHinting :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> Int32 -> m ()
setSettingsFontHinting o
obj Int32
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 -> Int32 -> IO ()
forall a. GObject a => a -> String -> Int32 -> IO ()
B.Properties.setObjectPropertyInt32 o
obj String
"font-hinting" Int32
val
constructSettingsFontHinting :: (IsSettings o, MIO.MonadIO m) => Int32 -> m (GValueConstruct o)
constructSettingsFontHinting :: forall o (m :: * -> *).
(IsSettings o, MonadIO m) =>
Int32 -> m (GValueConstruct o)
constructSettingsFontHinting Int32
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 -> Int32 -> IO (GValueConstruct o)
forall o. String -> Int32 -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyInt32 String
"font-hinting" Int32
val
#if defined(ENABLE_OVERLOADING)
data SettingsFontHintingPropertyInfo
instance AttrInfo SettingsFontHintingPropertyInfo where
    type AttrAllowedOps SettingsFontHintingPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrBaseTypeConstraint SettingsFontHintingPropertyInfo = IsSettings
    type AttrSetTypeConstraint SettingsFontHintingPropertyInfo = (~) Int32
    type AttrTransferTypeConstraint SettingsFontHintingPropertyInfo = (~) Int32
    type AttrTransferType SettingsFontHintingPropertyInfo = Int32
    type AttrGetType SettingsFontHintingPropertyInfo = Int32
    type AttrLabel SettingsFontHintingPropertyInfo = "font-hinting"
    type AttrOrigin SettingsFontHintingPropertyInfo = Settings
    attrGet = getSettingsFontHinting
    attrSet = setSettingsFontHinting
    attrTransfer _ v = do
        return v
    attrConstruct = constructSettingsFontHinting
    attrClear = undefined
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Clutter.Objects.Settings.fontHinting"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-clutter-1.0.6/docs/GI-Clutter-Objects-Settings.html#g:attr:fontHinting"
        })
#endif
   
   
   
getSettingsFontName :: (MonadIO m, IsSettings o) => o -> m (Maybe T.Text)
getSettingsFontName :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> m (Maybe Text)
getSettingsFontName o
obj = IO (Maybe Text) -> m (Maybe Text)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (Maybe Text) -> m (Maybe Text))
-> IO (Maybe Text) -> m (Maybe Text)
forall a b. (a -> b) -> a -> b
$ o -> String -> IO (Maybe Text)
forall a. GObject a => a -> String -> IO (Maybe Text)
B.Properties.getObjectPropertyString o
obj String
"font-name"
setSettingsFontName :: (MonadIO m, IsSettings o) => o -> T.Text -> m ()
setSettingsFontName :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> Text -> m ()
setSettingsFontName o
obj Text
val = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
    o -> String -> Maybe Text -> IO ()
forall a. GObject a => a -> String -> Maybe Text -> IO ()
B.Properties.setObjectPropertyString o
obj String
"font-name" (Text -> Maybe Text
forall a. a -> Maybe a
Just Text
val)
constructSettingsFontName :: (IsSettings o, MIO.MonadIO m) => T.Text -> m (GValueConstruct o)
constructSettingsFontName :: forall o (m :: * -> *).
(IsSettings o, MonadIO m) =>
Text -> m (GValueConstruct o)
constructSettingsFontName Text
val = IO (GValueConstruct o) -> m (GValueConstruct o)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> m (GValueConstruct o))
-> IO (GValueConstruct o) -> m (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ do
    IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a. IO a -> IO a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> IO (GValueConstruct o))
-> IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ String -> Maybe Text -> IO (GValueConstruct o)
forall o. String -> Maybe Text -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyString String
"font-name" (Text -> Maybe Text
forall a. a -> Maybe a
P.Just Text
val)
clearSettingsFontName :: (MonadIO m, IsSettings o) => o -> m ()
clearSettingsFontName :: forall (m :: * -> *) o. (MonadIO m, IsSettings o) => o -> m ()
clearSettingsFontName o
obj = 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
$ o -> String -> Maybe Text -> IO ()
forall a. GObject a => a -> String -> Maybe Text -> IO ()
B.Properties.setObjectPropertyString o
obj String
"font-name" (Maybe Text
forall a. Maybe a
Nothing :: Maybe T.Text)
#if defined(ENABLE_OVERLOADING)
data SettingsFontNamePropertyInfo
instance AttrInfo SettingsFontNamePropertyInfo where
    type AttrAllowedOps SettingsFontNamePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet, 'AttrClear]
    type AttrBaseTypeConstraint SettingsFontNamePropertyInfo = IsSettings
    type AttrSetTypeConstraint SettingsFontNamePropertyInfo = (~) T.Text
    type AttrTransferTypeConstraint SettingsFontNamePropertyInfo = (~) T.Text
    type AttrTransferType SettingsFontNamePropertyInfo = T.Text
    type AttrGetType SettingsFontNamePropertyInfo = (Maybe T.Text)
    type AttrLabel SettingsFontNamePropertyInfo = "font-name"
    type AttrOrigin SettingsFontNamePropertyInfo = Settings
    attrGet = getSettingsFontName
    attrSet = setSettingsFontName
    attrTransfer _ v = do
        return v
    attrConstruct = constructSettingsFontName
    attrClear = clearSettingsFontName
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Clutter.Objects.Settings.fontName"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-clutter-1.0.6/docs/GI-Clutter-Objects-Settings.html#g:attr:fontName"
        })
#endif
   
   
   
getSettingsFontSubpixelOrder :: (MonadIO m, IsSettings o) => o -> m (Maybe T.Text)
getSettingsFontSubpixelOrder :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> m (Maybe Text)
getSettingsFontSubpixelOrder o
obj = IO (Maybe Text) -> m (Maybe Text)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (Maybe Text) -> m (Maybe Text))
-> IO (Maybe Text) -> m (Maybe Text)
forall a b. (a -> b) -> a -> b
$ o -> String -> IO (Maybe Text)
forall a. GObject a => a -> String -> IO (Maybe Text)
B.Properties.getObjectPropertyString o
obj String
"font-subpixel-order"
setSettingsFontSubpixelOrder :: (MonadIO m, IsSettings o) => o -> T.Text -> m ()
setSettingsFontSubpixelOrder :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> Text -> m ()
setSettingsFontSubpixelOrder o
obj Text
val = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
    o -> String -> Maybe Text -> IO ()
forall a. GObject a => a -> String -> Maybe Text -> IO ()
B.Properties.setObjectPropertyString o
obj String
"font-subpixel-order" (Text -> Maybe Text
forall a. a -> Maybe a
Just Text
val)
constructSettingsFontSubpixelOrder :: (IsSettings o, MIO.MonadIO m) => T.Text -> m (GValueConstruct o)
constructSettingsFontSubpixelOrder :: forall o (m :: * -> *).
(IsSettings o, MonadIO m) =>
Text -> m (GValueConstruct o)
constructSettingsFontSubpixelOrder Text
val = IO (GValueConstruct o) -> m (GValueConstruct o)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> m (GValueConstruct o))
-> IO (GValueConstruct o) -> m (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ do
    IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a. IO a -> IO a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> IO (GValueConstruct o))
-> IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ String -> Maybe Text -> IO (GValueConstruct o)
forall o. String -> Maybe Text -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyString String
"font-subpixel-order" (Text -> Maybe Text
forall a. a -> Maybe a
P.Just Text
val)
clearSettingsFontSubpixelOrder :: (MonadIO m, IsSettings o) => o -> m ()
clearSettingsFontSubpixelOrder :: forall (m :: * -> *) o. (MonadIO m, IsSettings o) => o -> m ()
clearSettingsFontSubpixelOrder o
obj = 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
$ o -> String -> Maybe Text -> IO ()
forall a. GObject a => a -> String -> Maybe Text -> IO ()
B.Properties.setObjectPropertyString o
obj String
"font-subpixel-order" (Maybe Text
forall a. Maybe a
Nothing :: Maybe T.Text)
#if defined(ENABLE_OVERLOADING)
data SettingsFontSubpixelOrderPropertyInfo
instance AttrInfo SettingsFontSubpixelOrderPropertyInfo where
    type AttrAllowedOps SettingsFontSubpixelOrderPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet, 'AttrClear]
    type AttrBaseTypeConstraint SettingsFontSubpixelOrderPropertyInfo = IsSettings
    type AttrSetTypeConstraint SettingsFontSubpixelOrderPropertyInfo = (~) T.Text
    type AttrTransferTypeConstraint SettingsFontSubpixelOrderPropertyInfo = (~) T.Text
    type AttrTransferType SettingsFontSubpixelOrderPropertyInfo = T.Text
    type AttrGetType SettingsFontSubpixelOrderPropertyInfo = (Maybe T.Text)
    type AttrLabel SettingsFontSubpixelOrderPropertyInfo = "font-subpixel-order"
    type AttrOrigin SettingsFontSubpixelOrderPropertyInfo = Settings
    attrGet = getSettingsFontSubpixelOrder
    attrSet = setSettingsFontSubpixelOrder
    attrTransfer _ v = do
        return v
    attrConstruct = constructSettingsFontSubpixelOrder
    attrClear = clearSettingsFontSubpixelOrder
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Clutter.Objects.Settings.fontSubpixelOrder"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-clutter-1.0.6/docs/GI-Clutter-Objects-Settings.html#g:attr:fontSubpixelOrder"
        })
#endif
   
   
   
setSettingsFontconfigTimestamp :: (MonadIO m, IsSettings o) => o -> Word32 -> m ()
setSettingsFontconfigTimestamp :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> Word32 -> m ()
setSettingsFontconfigTimestamp o
obj Word32
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 -> Word32 -> IO ()
forall a. GObject a => a -> String -> Word32 -> IO ()
B.Properties.setObjectPropertyUInt32 o
obj String
"fontconfig-timestamp" Word32
val
constructSettingsFontconfigTimestamp :: (IsSettings o, MIO.MonadIO m) => Word32 -> m (GValueConstruct o)
constructSettingsFontconfigTimestamp :: forall o (m :: * -> *).
(IsSettings o, MonadIO m) =>
Word32 -> m (GValueConstruct o)
constructSettingsFontconfigTimestamp Word32
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 -> Word32 -> IO (GValueConstruct o)
forall o. String -> Word32 -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyUInt32 String
"fontconfig-timestamp" Word32
val
#if defined(ENABLE_OVERLOADING)
data SettingsFontconfigTimestampPropertyInfo
instance AttrInfo SettingsFontconfigTimestampPropertyInfo where
    type AttrAllowedOps SettingsFontconfigTimestampPropertyInfo = '[ 'AttrSet, 'AttrConstruct]
    type AttrBaseTypeConstraint SettingsFontconfigTimestampPropertyInfo = IsSettings
    type AttrSetTypeConstraint SettingsFontconfigTimestampPropertyInfo = (~) Word32
    type AttrTransferTypeConstraint SettingsFontconfigTimestampPropertyInfo = (~) Word32
    type AttrTransferType SettingsFontconfigTimestampPropertyInfo = Word32
    type AttrGetType SettingsFontconfigTimestampPropertyInfo = ()
    type AttrLabel SettingsFontconfigTimestampPropertyInfo = "fontconfig-timestamp"
    type AttrOrigin SettingsFontconfigTimestampPropertyInfo = Settings
    attrGet = undefined
    attrSet = setSettingsFontconfigTimestamp
    attrTransfer _ v = do
        return v
    attrConstruct = constructSettingsFontconfigTimestamp
    attrClear = undefined
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Clutter.Objects.Settings.fontconfigTimestamp"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-clutter-1.0.6/docs/GI-Clutter-Objects-Settings.html#g:attr:fontconfigTimestamp"
        })
#endif
   
   
   
getSettingsLongPressDuration :: (MonadIO m, IsSettings o) => o -> m Int32
getSettingsLongPressDuration :: forall (m :: * -> *) o. (MonadIO m, IsSettings o) => o -> m Int32
getSettingsLongPressDuration o
obj = IO Int32 -> m Int32
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Int32 -> m Int32) -> IO Int32 -> m Int32
forall a b. (a -> b) -> a -> b
$ o -> String -> IO Int32
forall a. GObject a => a -> String -> IO Int32
B.Properties.getObjectPropertyInt32 o
obj String
"long-press-duration"
setSettingsLongPressDuration :: (MonadIO m, IsSettings o) => o -> Int32 -> m ()
setSettingsLongPressDuration :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> Int32 -> m ()
setSettingsLongPressDuration o
obj Int32
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 -> Int32 -> IO ()
forall a. GObject a => a -> String -> Int32 -> IO ()
B.Properties.setObjectPropertyInt32 o
obj String
"long-press-duration" Int32
val
constructSettingsLongPressDuration :: (IsSettings o, MIO.MonadIO m) => Int32 -> m (GValueConstruct o)
constructSettingsLongPressDuration :: forall o (m :: * -> *).
(IsSettings o, MonadIO m) =>
Int32 -> m (GValueConstruct o)
constructSettingsLongPressDuration Int32
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 -> Int32 -> IO (GValueConstruct o)
forall o. String -> Int32 -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyInt32 String
"long-press-duration" Int32
val
#if defined(ENABLE_OVERLOADING)
data SettingsLongPressDurationPropertyInfo
instance AttrInfo SettingsLongPressDurationPropertyInfo where
    type AttrAllowedOps SettingsLongPressDurationPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrBaseTypeConstraint SettingsLongPressDurationPropertyInfo = IsSettings
    type AttrSetTypeConstraint SettingsLongPressDurationPropertyInfo = (~) Int32
    type AttrTransferTypeConstraint SettingsLongPressDurationPropertyInfo = (~) Int32
    type AttrTransferType SettingsLongPressDurationPropertyInfo = Int32
    type AttrGetType SettingsLongPressDurationPropertyInfo = Int32
    type AttrLabel SettingsLongPressDurationPropertyInfo = "long-press-duration"
    type AttrOrigin SettingsLongPressDurationPropertyInfo = Settings
    attrGet = getSettingsLongPressDuration
    attrSet = setSettingsLongPressDuration
    attrTransfer _ v = do
        return v
    attrConstruct = constructSettingsLongPressDuration
    attrClear = undefined
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Clutter.Objects.Settings.longPressDuration"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-clutter-1.0.6/docs/GI-Clutter-Objects-Settings.html#g:attr:longPressDuration"
        })
#endif
   
   
   
getSettingsPasswordHintTime :: (MonadIO m, IsSettings o) => o -> m Word32
getSettingsPasswordHintTime :: forall (m :: * -> *) o. (MonadIO m, IsSettings o) => o -> m Word32
getSettingsPasswordHintTime o
obj = IO Word32 -> m Word32
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Word32 -> m Word32) -> IO Word32 -> m Word32
forall a b. (a -> b) -> a -> b
$ o -> String -> IO Word32
forall a. GObject a => a -> String -> IO Word32
B.Properties.getObjectPropertyUInt32 o
obj String
"password-hint-time"
setSettingsPasswordHintTime :: (MonadIO m, IsSettings o) => o -> Word32 -> m ()
setSettingsPasswordHintTime :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> Word32 -> m ()
setSettingsPasswordHintTime o
obj Word32
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 -> Word32 -> IO ()
forall a. GObject a => a -> String -> Word32 -> IO ()
B.Properties.setObjectPropertyUInt32 o
obj String
"password-hint-time" Word32
val
constructSettingsPasswordHintTime :: (IsSettings o, MIO.MonadIO m) => Word32 -> m (GValueConstruct o)
constructSettingsPasswordHintTime :: forall o (m :: * -> *).
(IsSettings o, MonadIO m) =>
Word32 -> m (GValueConstruct o)
constructSettingsPasswordHintTime Word32
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 -> Word32 -> IO (GValueConstruct o)
forall o. String -> Word32 -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyUInt32 String
"password-hint-time" Word32
val
#if defined(ENABLE_OVERLOADING)
data SettingsPasswordHintTimePropertyInfo
instance AttrInfo SettingsPasswordHintTimePropertyInfo where
    type AttrAllowedOps SettingsPasswordHintTimePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrBaseTypeConstraint SettingsPasswordHintTimePropertyInfo = IsSettings
    type AttrSetTypeConstraint SettingsPasswordHintTimePropertyInfo = (~) Word32
    type AttrTransferTypeConstraint SettingsPasswordHintTimePropertyInfo = (~) Word32
    type AttrTransferType SettingsPasswordHintTimePropertyInfo = Word32
    type AttrGetType SettingsPasswordHintTimePropertyInfo = Word32
    type AttrLabel SettingsPasswordHintTimePropertyInfo = "password-hint-time"
    type AttrOrigin SettingsPasswordHintTimePropertyInfo = Settings
    attrGet = getSettingsPasswordHintTime
    attrSet = setSettingsPasswordHintTime
    attrTransfer _ v = do
        return v
    attrConstruct = constructSettingsPasswordHintTime
    attrClear = undefined
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Clutter.Objects.Settings.passwordHintTime"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-clutter-1.0.6/docs/GI-Clutter-Objects-Settings.html#g:attr:passwordHintTime"
        })
#endif
   
   
   
setSettingsUnscaledFontDpi :: (MonadIO m, IsSettings o) => o -> Int32 -> m ()
setSettingsUnscaledFontDpi :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> Int32 -> m ()
setSettingsUnscaledFontDpi o
obj Int32
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 -> Int32 -> IO ()
forall a. GObject a => a -> String -> Int32 -> IO ()
B.Properties.setObjectPropertyInt32 o
obj String
"unscaled-font-dpi" Int32
val
constructSettingsUnscaledFontDpi :: (IsSettings o, MIO.MonadIO m) => Int32 -> m (GValueConstruct o)
constructSettingsUnscaledFontDpi :: forall o (m :: * -> *).
(IsSettings o, MonadIO m) =>
Int32 -> m (GValueConstruct o)
constructSettingsUnscaledFontDpi Int32
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 -> Int32 -> IO (GValueConstruct o)
forall o. String -> Int32 -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyInt32 String
"unscaled-font-dpi" Int32
val
#if defined(ENABLE_OVERLOADING)
data SettingsUnscaledFontDpiPropertyInfo
instance AttrInfo SettingsUnscaledFontDpiPropertyInfo where
    type AttrAllowedOps SettingsUnscaledFontDpiPropertyInfo = '[ 'AttrSet, 'AttrConstruct]
    type AttrBaseTypeConstraint SettingsUnscaledFontDpiPropertyInfo = IsSettings
    type AttrSetTypeConstraint SettingsUnscaledFontDpiPropertyInfo = (~) Int32
    type AttrTransferTypeConstraint SettingsUnscaledFontDpiPropertyInfo = (~) Int32
    type AttrTransferType SettingsUnscaledFontDpiPropertyInfo = Int32
    type AttrGetType SettingsUnscaledFontDpiPropertyInfo = ()
    type AttrLabel SettingsUnscaledFontDpiPropertyInfo = "unscaled-font-dpi"
    type AttrOrigin SettingsUnscaledFontDpiPropertyInfo = Settings
    attrGet = undefined
    attrSet = setSettingsUnscaledFontDpi
    attrTransfer _ v = do
        return v
    attrConstruct = constructSettingsUnscaledFontDpi
    attrClear = undefined
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Clutter.Objects.Settings.unscaledFontDpi"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-clutter-1.0.6/docs/GI-Clutter-Objects-Settings.html#g:attr:unscaledFontDpi"
        })
#endif
   
   
   
getSettingsWindowScalingFactor :: (MonadIO m, IsSettings o) => o -> m Int32
getSettingsWindowScalingFactor :: forall (m :: * -> *) o. (MonadIO m, IsSettings o) => o -> m Int32
getSettingsWindowScalingFactor o
obj = IO Int32 -> m Int32
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Int32 -> m Int32) -> IO Int32 -> m Int32
forall a b. (a -> b) -> a -> b
$ o -> String -> IO Int32
forall a. GObject a => a -> String -> IO Int32
B.Properties.getObjectPropertyInt32 o
obj String
"window-scaling-factor"
setSettingsWindowScalingFactor :: (MonadIO m, IsSettings o) => o -> Int32 -> m ()
setSettingsWindowScalingFactor :: forall (m :: * -> *) o.
(MonadIO m, IsSettings o) =>
o -> Int32 -> m ()
setSettingsWindowScalingFactor o
obj Int32
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 -> Int32 -> IO ()
forall a. GObject a => a -> String -> Int32 -> IO ()
B.Properties.setObjectPropertyInt32 o
obj String
"window-scaling-factor" Int32
val
constructSettingsWindowScalingFactor :: (IsSettings o, MIO.MonadIO m) => Int32 -> m (GValueConstruct o)
constructSettingsWindowScalingFactor :: forall o (m :: * -> *).
(IsSettings o, MonadIO m) =>
Int32 -> m (GValueConstruct o)
constructSettingsWindowScalingFactor Int32
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 -> Int32 -> IO (GValueConstruct o)
forall o. String -> Int32 -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyInt32 String
"window-scaling-factor" Int32
val
#if defined(ENABLE_OVERLOADING)
data SettingsWindowScalingFactorPropertyInfo
instance AttrInfo SettingsWindowScalingFactorPropertyInfo where
    type AttrAllowedOps SettingsWindowScalingFactorPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
    type AttrBaseTypeConstraint SettingsWindowScalingFactorPropertyInfo = IsSettings
    type AttrSetTypeConstraint SettingsWindowScalingFactorPropertyInfo = (~) Int32
    type AttrTransferTypeConstraint SettingsWindowScalingFactorPropertyInfo = (~) Int32
    type AttrTransferType SettingsWindowScalingFactorPropertyInfo = Int32
    type AttrGetType SettingsWindowScalingFactorPropertyInfo = Int32
    type AttrLabel SettingsWindowScalingFactorPropertyInfo = "window-scaling-factor"
    type AttrOrigin SettingsWindowScalingFactorPropertyInfo = Settings
    attrGet = getSettingsWindowScalingFactor
    attrSet = setSettingsWindowScalingFactor
    attrTransfer _ v = do
        return v
    attrConstruct = constructSettingsWindowScalingFactor
    attrClear = undefined
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.Clutter.Objects.Settings.windowScalingFactor"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-clutter-1.0.6/docs/GI-Clutter-Objects-Settings.html#g:attr:windowScalingFactor"
        })
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList Settings
type instance O.AttributeList Settings = SettingsAttributeList
type SettingsAttributeList = ('[ '("backend", SettingsBackendPropertyInfo), '("dndDragThreshold", SettingsDndDragThresholdPropertyInfo), '("doubleClickDistance", SettingsDoubleClickDistancePropertyInfo), '("doubleClickTime", SettingsDoubleClickTimePropertyInfo), '("fontAntialias", SettingsFontAntialiasPropertyInfo), '("fontDpi", SettingsFontDpiPropertyInfo), '("fontHintStyle", SettingsFontHintStylePropertyInfo), '("fontHinting", SettingsFontHintingPropertyInfo), '("fontName", SettingsFontNamePropertyInfo), '("fontSubpixelOrder", SettingsFontSubpixelOrderPropertyInfo), '("fontconfigTimestamp", SettingsFontconfigTimestampPropertyInfo), '("longPressDuration", SettingsLongPressDurationPropertyInfo), '("passwordHintTime", SettingsPasswordHintTimePropertyInfo), '("unscaledFontDpi", SettingsUnscaledFontDpiPropertyInfo), '("windowScalingFactor", SettingsWindowScalingFactorPropertyInfo)] :: [(Symbol, DK.Type)])
#endif
#if defined(ENABLE_OVERLOADING)
settingsBackend :: AttrLabelProxy "backend"
settingsBackend = AttrLabelProxy
settingsDndDragThreshold :: AttrLabelProxy "dndDragThreshold"
settingsDndDragThreshold = AttrLabelProxy
settingsDoubleClickDistance :: AttrLabelProxy "doubleClickDistance"
settingsDoubleClickDistance = AttrLabelProxy
settingsDoubleClickTime :: AttrLabelProxy "doubleClickTime"
settingsDoubleClickTime = AttrLabelProxy
settingsFontAntialias :: AttrLabelProxy "fontAntialias"
settingsFontAntialias = AttrLabelProxy
settingsFontDpi :: AttrLabelProxy "fontDpi"
settingsFontDpi = AttrLabelProxy
settingsFontHintStyle :: AttrLabelProxy "fontHintStyle"
settingsFontHintStyle = AttrLabelProxy
settingsFontHinting :: AttrLabelProxy "fontHinting"
settingsFontHinting = AttrLabelProxy
settingsFontName :: AttrLabelProxy "fontName"
settingsFontName = AttrLabelProxy
settingsFontSubpixelOrder :: AttrLabelProxy "fontSubpixelOrder"
settingsFontSubpixelOrder = AttrLabelProxy
settingsFontconfigTimestamp :: AttrLabelProxy "fontconfigTimestamp"
settingsFontconfigTimestamp = AttrLabelProxy
settingsLongPressDuration :: AttrLabelProxy "longPressDuration"
settingsLongPressDuration = AttrLabelProxy
settingsPasswordHintTime :: AttrLabelProxy "passwordHintTime"
settingsPasswordHintTime = AttrLabelProxy
settingsUnscaledFontDpi :: AttrLabelProxy "unscaledFontDpi"
settingsUnscaledFontDpi = AttrLabelProxy
settingsWindowScalingFactor :: AttrLabelProxy "windowScalingFactor"
settingsWindowScalingFactor = AttrLabelProxy
#endif
#if defined(ENABLE_OVERLOADING)
type instance O.SignalList Settings = SettingsSignalList
type SettingsSignalList = ('[ '("notify", GObject.Object.ObjectNotifySignalInfo)] :: [(Symbol, DK.Type)])
#endif
foreign import ccall "clutter_settings_get_default" clutter_settings_get_default :: 
    IO (Ptr Settings)
settingsGetDefault ::
    (B.CallStack.HasCallStack, MonadIO m) =>
    m Settings
    
    
    
settingsGetDefault :: forall (m :: * -> *). (HasCallStack, MonadIO m) => m Settings
settingsGetDefault  = IO Settings -> m Settings
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Settings -> m Settings) -> IO Settings -> m Settings
forall a b. (a -> b) -> a -> b
$ do
    Ptr Settings
result <- IO (Ptr Settings)
clutter_settings_get_default
    Text -> Ptr Settings -> IO ()
forall a. HasCallStack => Text -> Ptr a -> IO ()
checkUnexpectedReturnNULL Text
"settingsGetDefault" Ptr Settings
result
    Settings
result' <- ((ManagedPtr Settings -> Settings) -> Ptr Settings -> IO Settings
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
newObject ManagedPtr Settings -> Settings
Settings) Ptr Settings
result
    Settings -> IO Settings
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Settings
result'
#if defined(ENABLE_OVERLOADING)
#endif