{-# LANGUAGE TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.Gdk.Structs.EventTouch
(
EventTouch(..) ,
newZeroEventTouch ,
noEventTouch ,
#if defined(ENABLE_OVERLOADING)
ResolveEventTouchMethod ,
#endif
#if defined(ENABLE_OVERLOADING)
eventTouch_axes ,
#endif
getEventTouchAxes ,
setEventTouchAxes ,
clearEventTouchDevice ,
#if defined(ENABLE_OVERLOADING)
eventTouch_device ,
#endif
getEventTouchDevice ,
setEventTouchDevice ,
#if defined(ENABLE_OVERLOADING)
eventTouch_emulatingPointer ,
#endif
getEventTouchEmulatingPointer ,
setEventTouchEmulatingPointer ,
#if defined(ENABLE_OVERLOADING)
eventTouch_sendEvent ,
#endif
getEventTouchSendEvent ,
setEventTouchSendEvent ,
clearEventTouchSequence ,
#if defined(ENABLE_OVERLOADING)
eventTouch_sequence ,
#endif
getEventTouchSequence ,
setEventTouchSequence ,
#if defined(ENABLE_OVERLOADING)
eventTouch_state ,
#endif
getEventTouchState ,
setEventTouchState ,
#if defined(ENABLE_OVERLOADING)
eventTouch_time ,
#endif
getEventTouchTime ,
setEventTouchTime ,
#if defined(ENABLE_OVERLOADING)
eventTouch_type ,
#endif
getEventTouchType ,
setEventTouchType ,
clearEventTouchWindow ,
#if defined(ENABLE_OVERLOADING)
eventTouch_window ,
#endif
getEventTouchWindow ,
setEventTouchWindow ,
#if defined(ENABLE_OVERLOADING)
eventTouch_x ,
#endif
getEventTouchX ,
setEventTouchX ,
#if defined(ENABLE_OVERLOADING)
eventTouch_xRoot ,
#endif
getEventTouchXRoot ,
setEventTouchXRoot ,
#if defined(ENABLE_OVERLOADING)
eventTouch_y ,
#endif
getEventTouchY ,
setEventTouchY ,
#if defined(ENABLE_OVERLOADING)
eventTouch_yRoot ,
#endif
getEventTouchYRoot ,
setEventTouchYRoot ,
) 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.Flags as Gdk.Flags
import {-# SOURCE #-} qualified GI.Gdk.Objects.Device as Gdk.Device
import {-# SOURCE #-} qualified GI.Gdk.Objects.Window as Gdk.Window
import {-# SOURCE #-} qualified GI.Gdk.Structs.EventSequence as Gdk.EventSequence
newtype EventTouch = EventTouch (ManagedPtr EventTouch)
deriving (Eq)
instance WrappedPtr EventTouch where
wrappedPtrCalloc = callocBytes 96
wrappedPtrCopy = \p -> withManagedPtr p (copyBytes 96 >=> wrapPtr EventTouch)
wrappedPtrFree = Just ptr_to_g_free
newZeroEventTouch :: MonadIO m => m EventTouch
newZeroEventTouch = liftIO $ wrappedPtrCalloc >>= wrapPtr EventTouch
instance tag ~ 'AttrSet => Constructible EventTouch tag where
new _ attrs = do
o <- newZeroEventTouch
GI.Attributes.set o attrs
return o
noEventTouch :: Maybe EventTouch
noEventTouch = Nothing
getEventTouchType :: MonadIO m => EventTouch -> m Gdk.Enums.EventType
getEventTouchType s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 0) :: IO CInt
let val' = (toEnum . fromIntegral) val
return val'
setEventTouchType :: MonadIO m => EventTouch -> Gdk.Enums.EventType -> m ()
setEventTouchType s val = liftIO $ withManagedPtr s $ \ptr -> do
let val' = (fromIntegral . fromEnum) val
poke (ptr `plusPtr` 0) (val' :: CInt)
#if defined(ENABLE_OVERLOADING)
data EventTouchTypeFieldInfo
instance AttrInfo EventTouchTypeFieldInfo where
type AttrBaseTypeConstraint EventTouchTypeFieldInfo = (~) EventTouch
type AttrAllowedOps EventTouchTypeFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventTouchTypeFieldInfo = (~) Gdk.Enums.EventType
type AttrTransferTypeConstraint EventTouchTypeFieldInfo = (~)Gdk.Enums.EventType
type AttrTransferType EventTouchTypeFieldInfo = Gdk.Enums.EventType
type AttrGetType EventTouchTypeFieldInfo = Gdk.Enums.EventType
type AttrLabel EventTouchTypeFieldInfo = "type"
type AttrOrigin EventTouchTypeFieldInfo = EventTouch
attrGet = getEventTouchType
attrSet = setEventTouchType
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventTouch_type :: AttrLabelProxy "type"
eventTouch_type = AttrLabelProxy
#endif
getEventTouchWindow :: MonadIO m => EventTouch -> m (Maybe Gdk.Window.Window)
getEventTouchWindow 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
setEventTouchWindow :: MonadIO m => EventTouch -> Ptr Gdk.Window.Window -> m ()
setEventTouchWindow s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 8) (val :: Ptr Gdk.Window.Window)
clearEventTouchWindow :: MonadIO m => EventTouch -> m ()
clearEventTouchWindow s = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 8) (FP.nullPtr :: Ptr Gdk.Window.Window)
#if defined(ENABLE_OVERLOADING)
data EventTouchWindowFieldInfo
instance AttrInfo EventTouchWindowFieldInfo where
type AttrBaseTypeConstraint EventTouchWindowFieldInfo = (~) EventTouch
type AttrAllowedOps EventTouchWindowFieldInfo = '[ 'AttrSet, 'AttrGet, 'AttrClear]
type AttrSetTypeConstraint EventTouchWindowFieldInfo = (~) (Ptr Gdk.Window.Window)
type AttrTransferTypeConstraint EventTouchWindowFieldInfo = (~)(Ptr Gdk.Window.Window)
type AttrTransferType EventTouchWindowFieldInfo = (Ptr Gdk.Window.Window)
type AttrGetType EventTouchWindowFieldInfo = Maybe Gdk.Window.Window
type AttrLabel EventTouchWindowFieldInfo = "window"
type AttrOrigin EventTouchWindowFieldInfo = EventTouch
attrGet = getEventTouchWindow
attrSet = setEventTouchWindow
attrConstruct = undefined
attrClear = clearEventTouchWindow
attrTransfer _ v = do
return v
eventTouch_window :: AttrLabelProxy "window"
eventTouch_window = AttrLabelProxy
#endif
getEventTouchSendEvent :: MonadIO m => EventTouch -> m Int8
getEventTouchSendEvent s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 16) :: IO Int8
return val
setEventTouchSendEvent :: MonadIO m => EventTouch -> Int8 -> m ()
setEventTouchSendEvent s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 16) (val :: Int8)
#if defined(ENABLE_OVERLOADING)
data EventTouchSendEventFieldInfo
instance AttrInfo EventTouchSendEventFieldInfo where
type AttrBaseTypeConstraint EventTouchSendEventFieldInfo = (~) EventTouch
type AttrAllowedOps EventTouchSendEventFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventTouchSendEventFieldInfo = (~) Int8
type AttrTransferTypeConstraint EventTouchSendEventFieldInfo = (~)Int8
type AttrTransferType EventTouchSendEventFieldInfo = Int8
type AttrGetType EventTouchSendEventFieldInfo = Int8
type AttrLabel EventTouchSendEventFieldInfo = "send_event"
type AttrOrigin EventTouchSendEventFieldInfo = EventTouch
attrGet = getEventTouchSendEvent
attrSet = setEventTouchSendEvent
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventTouch_sendEvent :: AttrLabelProxy "sendEvent"
eventTouch_sendEvent = AttrLabelProxy
#endif
getEventTouchTime :: MonadIO m => EventTouch -> m Word32
getEventTouchTime s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 20) :: IO Word32
return val
setEventTouchTime :: MonadIO m => EventTouch -> Word32 -> m ()
setEventTouchTime s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 20) (val :: Word32)
#if defined(ENABLE_OVERLOADING)
data EventTouchTimeFieldInfo
instance AttrInfo EventTouchTimeFieldInfo where
type AttrBaseTypeConstraint EventTouchTimeFieldInfo = (~) EventTouch
type AttrAllowedOps EventTouchTimeFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventTouchTimeFieldInfo = (~) Word32
type AttrTransferTypeConstraint EventTouchTimeFieldInfo = (~)Word32
type AttrTransferType EventTouchTimeFieldInfo = Word32
type AttrGetType EventTouchTimeFieldInfo = Word32
type AttrLabel EventTouchTimeFieldInfo = "time"
type AttrOrigin EventTouchTimeFieldInfo = EventTouch
attrGet = getEventTouchTime
attrSet = setEventTouchTime
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventTouch_time :: AttrLabelProxy "time"
eventTouch_time = AttrLabelProxy
#endif
getEventTouchX :: MonadIO m => EventTouch -> m Double
getEventTouchX s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 24) :: IO CDouble
let val' = realToFrac val
return val'
setEventTouchX :: MonadIO m => EventTouch -> Double -> m ()
setEventTouchX s val = liftIO $ withManagedPtr s $ \ptr -> do
let val' = realToFrac val
poke (ptr `plusPtr` 24) (val' :: CDouble)
#if defined(ENABLE_OVERLOADING)
data EventTouchXFieldInfo
instance AttrInfo EventTouchXFieldInfo where
type AttrBaseTypeConstraint EventTouchXFieldInfo = (~) EventTouch
type AttrAllowedOps EventTouchXFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventTouchXFieldInfo = (~) Double
type AttrTransferTypeConstraint EventTouchXFieldInfo = (~)Double
type AttrTransferType EventTouchXFieldInfo = Double
type AttrGetType EventTouchXFieldInfo = Double
type AttrLabel EventTouchXFieldInfo = "x"
type AttrOrigin EventTouchXFieldInfo = EventTouch
attrGet = getEventTouchX
attrSet = setEventTouchX
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventTouch_x :: AttrLabelProxy "x"
eventTouch_x = AttrLabelProxy
#endif
getEventTouchY :: MonadIO m => EventTouch -> m Double
getEventTouchY s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 32) :: IO CDouble
let val' = realToFrac val
return val'
setEventTouchY :: MonadIO m => EventTouch -> Double -> m ()
setEventTouchY s val = liftIO $ withManagedPtr s $ \ptr -> do
let val' = realToFrac val
poke (ptr `plusPtr` 32) (val' :: CDouble)
#if defined(ENABLE_OVERLOADING)
data EventTouchYFieldInfo
instance AttrInfo EventTouchYFieldInfo where
type AttrBaseTypeConstraint EventTouchYFieldInfo = (~) EventTouch
type AttrAllowedOps EventTouchYFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventTouchYFieldInfo = (~) Double
type AttrTransferTypeConstraint EventTouchYFieldInfo = (~)Double
type AttrTransferType EventTouchYFieldInfo = Double
type AttrGetType EventTouchYFieldInfo = Double
type AttrLabel EventTouchYFieldInfo = "y"
type AttrOrigin EventTouchYFieldInfo = EventTouch
attrGet = getEventTouchY
attrSet = setEventTouchY
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventTouch_y :: AttrLabelProxy "y"
eventTouch_y = AttrLabelProxy
#endif
getEventTouchAxes :: MonadIO m => EventTouch -> m Double
getEventTouchAxes s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 40) :: IO CDouble
let val' = realToFrac val
return val'
setEventTouchAxes :: MonadIO m => EventTouch -> Double -> m ()
setEventTouchAxes s val = liftIO $ withManagedPtr s $ \ptr -> do
let val' = realToFrac val
poke (ptr `plusPtr` 40) (val' :: CDouble)
#if defined(ENABLE_OVERLOADING)
data EventTouchAxesFieldInfo
instance AttrInfo EventTouchAxesFieldInfo where
type AttrBaseTypeConstraint EventTouchAxesFieldInfo = (~) EventTouch
type AttrAllowedOps EventTouchAxesFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventTouchAxesFieldInfo = (~) Double
type AttrTransferTypeConstraint EventTouchAxesFieldInfo = (~)Double
type AttrTransferType EventTouchAxesFieldInfo = Double
type AttrGetType EventTouchAxesFieldInfo = Double
type AttrLabel EventTouchAxesFieldInfo = "axes"
type AttrOrigin EventTouchAxesFieldInfo = EventTouch
attrGet = getEventTouchAxes
attrSet = setEventTouchAxes
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventTouch_axes :: AttrLabelProxy "axes"
eventTouch_axes = AttrLabelProxy
#endif
getEventTouchState :: MonadIO m => EventTouch -> m [Gdk.Flags.ModifierType]
getEventTouchState s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 48) :: IO CUInt
let val' = wordToGFlags val
return val'
setEventTouchState :: MonadIO m => EventTouch -> [Gdk.Flags.ModifierType] -> m ()
setEventTouchState s val = liftIO $ withManagedPtr s $ \ptr -> do
let val' = gflagsToWord val
poke (ptr `plusPtr` 48) (val' :: CUInt)
#if defined(ENABLE_OVERLOADING)
data EventTouchStateFieldInfo
instance AttrInfo EventTouchStateFieldInfo where
type AttrBaseTypeConstraint EventTouchStateFieldInfo = (~) EventTouch
type AttrAllowedOps EventTouchStateFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventTouchStateFieldInfo = (~) [Gdk.Flags.ModifierType]
type AttrTransferTypeConstraint EventTouchStateFieldInfo = (~)[Gdk.Flags.ModifierType]
type AttrTransferType EventTouchStateFieldInfo = [Gdk.Flags.ModifierType]
type AttrGetType EventTouchStateFieldInfo = [Gdk.Flags.ModifierType]
type AttrLabel EventTouchStateFieldInfo = "state"
type AttrOrigin EventTouchStateFieldInfo = EventTouch
attrGet = getEventTouchState
attrSet = setEventTouchState
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventTouch_state :: AttrLabelProxy "state"
eventTouch_state = AttrLabelProxy
#endif
getEventTouchSequence :: MonadIO m => EventTouch -> m (Maybe Gdk.EventSequence.EventSequence)
getEventTouchSequence s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 56) :: IO (Ptr Gdk.EventSequence.EventSequence)
result <- SP.convertIfNonNull val $ \val' -> do
val'' <- (newBoxed Gdk.EventSequence.EventSequence) val'
return val''
return result
setEventTouchSequence :: MonadIO m => EventTouch -> Ptr Gdk.EventSequence.EventSequence -> m ()
setEventTouchSequence s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 56) (val :: Ptr Gdk.EventSequence.EventSequence)
clearEventTouchSequence :: MonadIO m => EventTouch -> m ()
clearEventTouchSequence s = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 56) (FP.nullPtr :: Ptr Gdk.EventSequence.EventSequence)
#if defined(ENABLE_OVERLOADING)
data EventTouchSequenceFieldInfo
instance AttrInfo EventTouchSequenceFieldInfo where
type AttrBaseTypeConstraint EventTouchSequenceFieldInfo = (~) EventTouch
type AttrAllowedOps EventTouchSequenceFieldInfo = '[ 'AttrSet, 'AttrGet, 'AttrClear]
type AttrSetTypeConstraint EventTouchSequenceFieldInfo = (~) (Ptr Gdk.EventSequence.EventSequence)
type AttrTransferTypeConstraint EventTouchSequenceFieldInfo = (~)(Ptr Gdk.EventSequence.EventSequence)
type AttrTransferType EventTouchSequenceFieldInfo = (Ptr Gdk.EventSequence.EventSequence)
type AttrGetType EventTouchSequenceFieldInfo = Maybe Gdk.EventSequence.EventSequence
type AttrLabel EventTouchSequenceFieldInfo = "sequence"
type AttrOrigin EventTouchSequenceFieldInfo = EventTouch
attrGet = getEventTouchSequence
attrSet = setEventTouchSequence
attrConstruct = undefined
attrClear = clearEventTouchSequence
attrTransfer _ v = do
return v
eventTouch_sequence :: AttrLabelProxy "sequence"
eventTouch_sequence = AttrLabelProxy
#endif
getEventTouchEmulatingPointer :: MonadIO m => EventTouch -> m Bool
getEventTouchEmulatingPointer s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 64) :: IO CInt
let val' = (/= 0) val
return val'
setEventTouchEmulatingPointer :: MonadIO m => EventTouch -> Bool -> m ()
setEventTouchEmulatingPointer s val = liftIO $ withManagedPtr s $ \ptr -> do
let val' = (fromIntegral . fromEnum) val
poke (ptr `plusPtr` 64) (val' :: CInt)
#if defined(ENABLE_OVERLOADING)
data EventTouchEmulatingPointerFieldInfo
instance AttrInfo EventTouchEmulatingPointerFieldInfo where
type AttrBaseTypeConstraint EventTouchEmulatingPointerFieldInfo = (~) EventTouch
type AttrAllowedOps EventTouchEmulatingPointerFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventTouchEmulatingPointerFieldInfo = (~) Bool
type AttrTransferTypeConstraint EventTouchEmulatingPointerFieldInfo = (~)Bool
type AttrTransferType EventTouchEmulatingPointerFieldInfo = Bool
type AttrGetType EventTouchEmulatingPointerFieldInfo = Bool
type AttrLabel EventTouchEmulatingPointerFieldInfo = "emulating_pointer"
type AttrOrigin EventTouchEmulatingPointerFieldInfo = EventTouch
attrGet = getEventTouchEmulatingPointer
attrSet = setEventTouchEmulatingPointer
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventTouch_emulatingPointer :: AttrLabelProxy "emulatingPointer"
eventTouch_emulatingPointer = AttrLabelProxy
#endif
getEventTouchDevice :: MonadIO m => EventTouch -> m (Maybe Gdk.Device.Device)
getEventTouchDevice s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 72) :: IO (Ptr Gdk.Device.Device)
result <- SP.convertIfNonNull val $ \val' -> do
val'' <- (newObject Gdk.Device.Device) val'
return val''
return result
setEventTouchDevice :: MonadIO m => EventTouch -> Ptr Gdk.Device.Device -> m ()
setEventTouchDevice s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 72) (val :: Ptr Gdk.Device.Device)
clearEventTouchDevice :: MonadIO m => EventTouch -> m ()
clearEventTouchDevice s = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 72) (FP.nullPtr :: Ptr Gdk.Device.Device)
#if defined(ENABLE_OVERLOADING)
data EventTouchDeviceFieldInfo
instance AttrInfo EventTouchDeviceFieldInfo where
type AttrBaseTypeConstraint EventTouchDeviceFieldInfo = (~) EventTouch
type AttrAllowedOps EventTouchDeviceFieldInfo = '[ 'AttrSet, 'AttrGet, 'AttrClear]
type AttrSetTypeConstraint EventTouchDeviceFieldInfo = (~) (Ptr Gdk.Device.Device)
type AttrTransferTypeConstraint EventTouchDeviceFieldInfo = (~)(Ptr Gdk.Device.Device)
type AttrTransferType EventTouchDeviceFieldInfo = (Ptr Gdk.Device.Device)
type AttrGetType EventTouchDeviceFieldInfo = Maybe Gdk.Device.Device
type AttrLabel EventTouchDeviceFieldInfo = "device"
type AttrOrigin EventTouchDeviceFieldInfo = EventTouch
attrGet = getEventTouchDevice
attrSet = setEventTouchDevice
attrConstruct = undefined
attrClear = clearEventTouchDevice
attrTransfer _ v = do
return v
eventTouch_device :: AttrLabelProxy "device"
eventTouch_device = AttrLabelProxy
#endif
getEventTouchXRoot :: MonadIO m => EventTouch -> m Double
getEventTouchXRoot s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 80) :: IO CDouble
let val' = realToFrac val
return val'
setEventTouchXRoot :: MonadIO m => EventTouch -> Double -> m ()
setEventTouchXRoot s val = liftIO $ withManagedPtr s $ \ptr -> do
let val' = realToFrac val
poke (ptr `plusPtr` 80) (val' :: CDouble)
#if defined(ENABLE_OVERLOADING)
data EventTouchXRootFieldInfo
instance AttrInfo EventTouchXRootFieldInfo where
type AttrBaseTypeConstraint EventTouchXRootFieldInfo = (~) EventTouch
type AttrAllowedOps EventTouchXRootFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventTouchXRootFieldInfo = (~) Double
type AttrTransferTypeConstraint EventTouchXRootFieldInfo = (~)Double
type AttrTransferType EventTouchXRootFieldInfo = Double
type AttrGetType EventTouchXRootFieldInfo = Double
type AttrLabel EventTouchXRootFieldInfo = "x_root"
type AttrOrigin EventTouchXRootFieldInfo = EventTouch
attrGet = getEventTouchXRoot
attrSet = setEventTouchXRoot
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventTouch_xRoot :: AttrLabelProxy "xRoot"
eventTouch_xRoot = AttrLabelProxy
#endif
getEventTouchYRoot :: MonadIO m => EventTouch -> m Double
getEventTouchYRoot s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 88) :: IO CDouble
let val' = realToFrac val
return val'
setEventTouchYRoot :: MonadIO m => EventTouch -> Double -> m ()
setEventTouchYRoot s val = liftIO $ withManagedPtr s $ \ptr -> do
let val' = realToFrac val
poke (ptr `plusPtr` 88) (val' :: CDouble)
#if defined(ENABLE_OVERLOADING)
data EventTouchYRootFieldInfo
instance AttrInfo EventTouchYRootFieldInfo where
type AttrBaseTypeConstraint EventTouchYRootFieldInfo = (~) EventTouch
type AttrAllowedOps EventTouchYRootFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventTouchYRootFieldInfo = (~) Double
type AttrTransferTypeConstraint EventTouchYRootFieldInfo = (~)Double
type AttrTransferType EventTouchYRootFieldInfo = Double
type AttrGetType EventTouchYRootFieldInfo = Double
type AttrLabel EventTouchYRootFieldInfo = "y_root"
type AttrOrigin EventTouchYRootFieldInfo = EventTouch
attrGet = getEventTouchYRoot
attrSet = setEventTouchYRoot
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventTouch_yRoot :: AttrLabelProxy "yRoot"
eventTouch_yRoot = AttrLabelProxy
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList EventTouch
type instance O.AttributeList EventTouch = EventTouchAttributeList
type EventTouchAttributeList = ('[ '("type", EventTouchTypeFieldInfo), '("window", EventTouchWindowFieldInfo), '("sendEvent", EventTouchSendEventFieldInfo), '("time", EventTouchTimeFieldInfo), '("x", EventTouchXFieldInfo), '("y", EventTouchYFieldInfo), '("axes", EventTouchAxesFieldInfo), '("state", EventTouchStateFieldInfo), '("sequence", EventTouchSequenceFieldInfo), '("emulatingPointer", EventTouchEmulatingPointerFieldInfo), '("device", EventTouchDeviceFieldInfo), '("xRoot", EventTouchXRootFieldInfo), '("yRoot", EventTouchYRootFieldInfo)] :: [(Symbol, *)])
#endif
#if defined(ENABLE_OVERLOADING)
type family ResolveEventTouchMethod (t :: Symbol) (o :: *) :: * where
ResolveEventTouchMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolveEventTouchMethod t EventTouch, O.MethodInfo info EventTouch p) => OL.IsLabel t (EventTouch -> p) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.overloadedMethod @info
#else
fromLabel _ = O.overloadedMethod @info
#endif
#endif