{-# LANGUAGE TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.Gdk.Structs.EventSetting
(
EventSetting(..) ,
newZeroEventSetting ,
noEventSetting ,
#if defined(ENABLE_OVERLOADING)
ResolveEventSettingMethod ,
#endif
#if defined(ENABLE_OVERLOADING)
eventSetting_action ,
#endif
getEventSettingAction ,
setEventSettingAction ,
clearEventSettingName ,
#if defined(ENABLE_OVERLOADING)
eventSetting_name ,
#endif
getEventSettingName ,
setEventSettingName ,
#if defined(ENABLE_OVERLOADING)
eventSetting_sendEvent ,
#endif
getEventSettingSendEvent ,
setEventSettingSendEvent ,
#if defined(ENABLE_OVERLOADING)
eventSetting_type ,
#endif
getEventSettingType ,
setEventSettingType ,
clearEventSettingWindow ,
#if defined(ENABLE_OVERLOADING)
eventSetting_window ,
#endif
getEventSettingWindow ,
setEventSettingWindow ,
) 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.ManagedPtr as B.ManagedPtr
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 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 {-# SOURCE #-} qualified GI.Gdk.Enums as Gdk.Enums
import {-# SOURCE #-} qualified GI.Gdk.Objects.Window as Gdk.Window
newtype EventSetting = EventSetting (ManagedPtr EventSetting)
deriving (Eq)
instance WrappedPtr EventSetting where
wrappedPtrCalloc = callocBytes 32
wrappedPtrCopy = \p -> withManagedPtr p (copyBytes 32 >=> wrapPtr EventSetting)
wrappedPtrFree = Just ptr_to_g_free
newZeroEventSetting :: MonadIO m => m EventSetting
newZeroEventSetting = liftIO $ wrappedPtrCalloc >>= wrapPtr EventSetting
instance tag ~ 'AttrSet => Constructible EventSetting tag where
new _ attrs = do
o <- newZeroEventSetting
GI.Attributes.set o attrs
return o
noEventSetting :: Maybe EventSetting
noEventSetting = Nothing
getEventSettingType :: MonadIO m => EventSetting -> m Gdk.Enums.EventType
getEventSettingType s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 0) :: IO CInt
let val' = (toEnum . fromIntegral) val
return val'
setEventSettingType :: MonadIO m => EventSetting -> Gdk.Enums.EventType -> m ()
setEventSettingType s val = liftIO $ withManagedPtr s $ \ptr -> do
let val' = (fromIntegral . fromEnum) val
poke (ptr `plusPtr` 0) (val' :: CInt)
#if defined(ENABLE_OVERLOADING)
data EventSettingTypeFieldInfo
instance AttrInfo EventSettingTypeFieldInfo where
type AttrBaseTypeConstraint EventSettingTypeFieldInfo = (~) EventSetting
type AttrAllowedOps EventSettingTypeFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventSettingTypeFieldInfo = (~) Gdk.Enums.EventType
type AttrTransferTypeConstraint EventSettingTypeFieldInfo = (~)Gdk.Enums.EventType
type AttrTransferType EventSettingTypeFieldInfo = Gdk.Enums.EventType
type AttrGetType EventSettingTypeFieldInfo = Gdk.Enums.EventType
type AttrLabel EventSettingTypeFieldInfo = "type"
type AttrOrigin EventSettingTypeFieldInfo = EventSetting
attrGet = getEventSettingType
attrSet = setEventSettingType
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventSetting_type :: AttrLabelProxy "type"
eventSetting_type = AttrLabelProxy
#endif
getEventSettingWindow :: MonadIO m => EventSetting -> m (Maybe Gdk.Window.Window)
getEventSettingWindow s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 8) :: IO (Ptr Gdk.Window.Window)
result <- SP.convertIfNonNull val $ \val' -> do
val'' <- (newObject Gdk.Window.Window) val'
return val''
return result
setEventSettingWindow :: MonadIO m => EventSetting -> Ptr Gdk.Window.Window -> m ()
setEventSettingWindow s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 8) (val :: Ptr Gdk.Window.Window)
clearEventSettingWindow :: MonadIO m => EventSetting -> m ()
clearEventSettingWindow s = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 8) (FP.nullPtr :: Ptr Gdk.Window.Window)
#if defined(ENABLE_OVERLOADING)
data EventSettingWindowFieldInfo
instance AttrInfo EventSettingWindowFieldInfo where
type AttrBaseTypeConstraint EventSettingWindowFieldInfo = (~) EventSetting
type AttrAllowedOps EventSettingWindowFieldInfo = '[ 'AttrSet, 'AttrGet, 'AttrClear]
type AttrSetTypeConstraint EventSettingWindowFieldInfo = (~) (Ptr Gdk.Window.Window)
type AttrTransferTypeConstraint EventSettingWindowFieldInfo = (~)(Ptr Gdk.Window.Window)
type AttrTransferType EventSettingWindowFieldInfo = (Ptr Gdk.Window.Window)
type AttrGetType EventSettingWindowFieldInfo = Maybe Gdk.Window.Window
type AttrLabel EventSettingWindowFieldInfo = "window"
type AttrOrigin EventSettingWindowFieldInfo = EventSetting
attrGet = getEventSettingWindow
attrSet = setEventSettingWindow
attrConstruct = undefined
attrClear = clearEventSettingWindow
attrTransfer _ v = do
return v
eventSetting_window :: AttrLabelProxy "window"
eventSetting_window = AttrLabelProxy
#endif
getEventSettingSendEvent :: MonadIO m => EventSetting -> m Int8
getEventSettingSendEvent s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 16) :: IO Int8
return val
setEventSettingSendEvent :: MonadIO m => EventSetting -> Int8 -> m ()
setEventSettingSendEvent s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 16) (val :: Int8)
#if defined(ENABLE_OVERLOADING)
data EventSettingSendEventFieldInfo
instance AttrInfo EventSettingSendEventFieldInfo where
type AttrBaseTypeConstraint EventSettingSendEventFieldInfo = (~) EventSetting
type AttrAllowedOps EventSettingSendEventFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventSettingSendEventFieldInfo = (~) Int8
type AttrTransferTypeConstraint EventSettingSendEventFieldInfo = (~)Int8
type AttrTransferType EventSettingSendEventFieldInfo = Int8
type AttrGetType EventSettingSendEventFieldInfo = Int8
type AttrLabel EventSettingSendEventFieldInfo = "send_event"
type AttrOrigin EventSettingSendEventFieldInfo = EventSetting
attrGet = getEventSettingSendEvent
attrSet = setEventSettingSendEvent
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventSetting_sendEvent :: AttrLabelProxy "sendEvent"
eventSetting_sendEvent = AttrLabelProxy
#endif
getEventSettingAction :: MonadIO m => EventSetting -> m Gdk.Enums.SettingAction
getEventSettingAction s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 20) :: IO CUInt
let val' = (toEnum . fromIntegral) val
return val'
setEventSettingAction :: MonadIO m => EventSetting -> Gdk.Enums.SettingAction -> m ()
setEventSettingAction s val = liftIO $ withManagedPtr s $ \ptr -> do
let val' = (fromIntegral . fromEnum) val
poke (ptr `plusPtr` 20) (val' :: CUInt)
#if defined(ENABLE_OVERLOADING)
data EventSettingActionFieldInfo
instance AttrInfo EventSettingActionFieldInfo where
type AttrBaseTypeConstraint EventSettingActionFieldInfo = (~) EventSetting
type AttrAllowedOps EventSettingActionFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventSettingActionFieldInfo = (~) Gdk.Enums.SettingAction
type AttrTransferTypeConstraint EventSettingActionFieldInfo = (~)Gdk.Enums.SettingAction
type AttrTransferType EventSettingActionFieldInfo = Gdk.Enums.SettingAction
type AttrGetType EventSettingActionFieldInfo = Gdk.Enums.SettingAction
type AttrLabel EventSettingActionFieldInfo = "action"
type AttrOrigin EventSettingActionFieldInfo = EventSetting
attrGet = getEventSettingAction
attrSet = setEventSettingAction
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventSetting_action :: AttrLabelProxy "action"
eventSetting_action = AttrLabelProxy
#endif
getEventSettingName :: MonadIO m => EventSetting -> m (Maybe T.Text)
getEventSettingName s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 24) :: IO CString
result <- SP.convertIfNonNull val $ \val' -> do
val'' <- cstringToText val'
return val''
return result
setEventSettingName :: MonadIO m => EventSetting -> CString -> m ()
setEventSettingName s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 24) (val :: CString)
clearEventSettingName :: MonadIO m => EventSetting -> m ()
clearEventSettingName s = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 24) (FP.nullPtr :: CString)
#if defined(ENABLE_OVERLOADING)
data EventSettingNameFieldInfo
instance AttrInfo EventSettingNameFieldInfo where
type AttrBaseTypeConstraint EventSettingNameFieldInfo = (~) EventSetting
type AttrAllowedOps EventSettingNameFieldInfo = '[ 'AttrSet, 'AttrGet, 'AttrClear]
type AttrSetTypeConstraint EventSettingNameFieldInfo = (~) CString
type AttrTransferTypeConstraint EventSettingNameFieldInfo = (~)CString
type AttrTransferType EventSettingNameFieldInfo = CString
type AttrGetType EventSettingNameFieldInfo = Maybe T.Text
type AttrLabel EventSettingNameFieldInfo = "name"
type AttrOrigin EventSettingNameFieldInfo = EventSetting
attrGet = getEventSettingName
attrSet = setEventSettingName
attrConstruct = undefined
attrClear = clearEventSettingName
attrTransfer _ v = do
return v
eventSetting_name :: AttrLabelProxy "name"
eventSetting_name = AttrLabelProxy
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList EventSetting
type instance O.AttributeList EventSetting = EventSettingAttributeList
type EventSettingAttributeList = ('[ '("type", EventSettingTypeFieldInfo), '("window", EventSettingWindowFieldInfo), '("sendEvent", EventSettingSendEventFieldInfo), '("action", EventSettingActionFieldInfo), '("name", EventSettingNameFieldInfo)] :: [(Symbol, *)])
#endif
#if defined(ENABLE_OVERLOADING)
type family ResolveEventSettingMethod (t :: Symbol) (o :: *) :: * where
ResolveEventSettingMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolveEventSettingMethod t EventSetting, O.MethodInfo info EventSetting p) => OL.IsLabel t (EventSetting -> p) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.overloadedMethod @info
#else
fromLabel _ = O.overloadedMethod @info
#endif
#endif