{-# LANGUAGE TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.Gdk.Structs.EventWindowState
(
EventWindowState(..) ,
newZeroEventWindowState ,
noEventWindowState ,
#if defined(ENABLE_OVERLOADING)
ResolveEventWindowStateMethod ,
#endif
#if defined(ENABLE_OVERLOADING)
eventWindowState_changedMask ,
#endif
getEventWindowStateChangedMask ,
setEventWindowStateChangedMask ,
#if defined(ENABLE_OVERLOADING)
eventWindowState_newWindowState ,
#endif
getEventWindowStateNewWindowState ,
setEventWindowStateNewWindowState ,
#if defined(ENABLE_OVERLOADING)
eventWindowState_sendEvent ,
#endif
getEventWindowStateSendEvent ,
setEventWindowStateSendEvent ,
#if defined(ENABLE_OVERLOADING)
eventWindowState_type ,
#endif
getEventWindowStateType ,
setEventWindowStateType ,
clearEventWindowStateWindow ,
#if defined(ENABLE_OVERLOADING)
eventWindowState_window ,
#endif
getEventWindowStateWindow ,
setEventWindowStateWindow ,
) 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.Window as Gdk.Window
newtype EventWindowState = EventWindowState (ManagedPtr EventWindowState)
deriving (EventWindowState -> EventWindowState -> Bool
(EventWindowState -> EventWindowState -> Bool)
-> (EventWindowState -> EventWindowState -> Bool)
-> Eq EventWindowState
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: EventWindowState -> EventWindowState -> Bool
$c/= :: EventWindowState -> EventWindowState -> Bool
== :: EventWindowState -> EventWindowState -> Bool
$c== :: EventWindowState -> EventWindowState -> Bool
Eq)
instance WrappedPtr EventWindowState where
wrappedPtrCalloc :: IO (Ptr EventWindowState)
wrappedPtrCalloc = Int -> IO (Ptr EventWindowState)
forall a. Int -> IO (Ptr a)
callocBytes 32
wrappedPtrCopy :: EventWindowState -> IO EventWindowState
wrappedPtrCopy = \p :: EventWindowState
p -> EventWindowState
-> (Ptr EventWindowState -> IO EventWindowState)
-> IO EventWindowState
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr EventWindowState
p (Int -> Ptr EventWindowState -> IO (Ptr EventWindowState)
forall a. WrappedPtr a => Int -> Ptr a -> IO (Ptr a)
copyBytes 32 (Ptr EventWindowState -> IO (Ptr EventWindowState))
-> (Ptr EventWindowState -> IO EventWindowState)
-> Ptr EventWindowState
-> IO EventWindowState
forall (m :: * -> *) a b c.
Monad m =>
(a -> m b) -> (b -> m c) -> a -> m c
>=> (ManagedPtr EventWindowState -> EventWindowState)
-> Ptr EventWindowState -> IO EventWindowState
forall a.
(HasCallStack, WrappedPtr a) =>
(ManagedPtr a -> a) -> Ptr a -> IO a
wrapPtr ManagedPtr EventWindowState -> EventWindowState
EventWindowState)
wrappedPtrFree :: Maybe (GDestroyNotify EventWindowState)
wrappedPtrFree = GDestroyNotify EventWindowState
-> Maybe (GDestroyNotify EventWindowState)
forall a. a -> Maybe a
Just GDestroyNotify EventWindowState
forall a. FunPtr (Ptr a -> IO ())
ptr_to_g_free
newZeroEventWindowState :: MonadIO m => m EventWindowState
newZeroEventWindowState :: m EventWindowState
newZeroEventWindowState = IO EventWindowState -> m EventWindowState
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO EventWindowState -> m EventWindowState)
-> IO EventWindowState -> m EventWindowState
forall a b. (a -> b) -> a -> b
$ IO (Ptr EventWindowState)
forall a. WrappedPtr a => IO (Ptr a)
wrappedPtrCalloc IO (Ptr EventWindowState)
-> (Ptr EventWindowState -> IO EventWindowState)
-> IO EventWindowState
forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= (ManagedPtr EventWindowState -> EventWindowState)
-> Ptr EventWindowState -> IO EventWindowState
forall a.
(HasCallStack, WrappedPtr a) =>
(ManagedPtr a -> a) -> Ptr a -> IO a
wrapPtr ManagedPtr EventWindowState -> EventWindowState
EventWindowState
instance tag ~ 'AttrSet => Constructible EventWindowState tag where
new :: (ManagedPtr EventWindowState -> EventWindowState)
-> [AttrOp EventWindowState tag] -> m EventWindowState
new _ attrs :: [AttrOp EventWindowState tag]
attrs = do
EventWindowState
o <- m EventWindowState
forall (m :: * -> *). MonadIO m => m EventWindowState
newZeroEventWindowState
EventWindowState -> [AttrOp EventWindowState 'AttrSet] -> m ()
forall o (m :: * -> *).
MonadIO m =>
o -> [AttrOp o 'AttrSet] -> m ()
GI.Attributes.set EventWindowState
o [AttrOp EventWindowState tag]
[AttrOp EventWindowState 'AttrSet]
attrs
EventWindowState -> m EventWindowState
forall (m :: * -> *) a. Monad m => a -> m a
return EventWindowState
o
noEventWindowState :: Maybe EventWindowState
noEventWindowState :: Maybe EventWindowState
noEventWindowState = Maybe EventWindowState
forall a. Maybe a
Nothing
getEventWindowStateType :: MonadIO m => EventWindowState -> m Gdk.Enums.EventType
getEventWindowStateType :: EventWindowState -> m EventType
getEventWindowStateType s :: EventWindowState
s = IO EventType -> m EventType
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO EventType -> m EventType) -> IO EventType -> m EventType
forall a b. (a -> b) -> a -> b
$ EventWindowState
-> (Ptr EventWindowState -> IO EventType) -> IO EventType
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr EventWindowState
s ((Ptr EventWindowState -> IO EventType) -> IO EventType)
-> (Ptr EventWindowState -> IO EventType) -> IO EventType
forall a b. (a -> b) -> a -> b
$ \ptr :: Ptr EventWindowState
ptr -> do
CInt
val <- Ptr CInt -> IO CInt
forall a. Storable a => Ptr a -> IO a
peek (Ptr EventWindowState
ptr Ptr EventWindowState -> Int -> Ptr CInt
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` 0) :: IO CInt
let val' :: EventType
val' = (Int -> EventType
forall a. Enum a => Int -> a
toEnum (Int -> EventType) -> (CInt -> Int) -> CInt -> EventType
forall b c a. (b -> c) -> (a -> b) -> a -> c
. CInt -> Int
forall a b. (Integral a, Num b) => a -> b
fromIntegral) CInt
val
EventType -> IO EventType
forall (m :: * -> *) a. Monad m => a -> m a
return EventType
val'
setEventWindowStateType :: MonadIO m => EventWindowState -> Gdk.Enums.EventType -> m ()
setEventWindowStateType :: EventWindowState -> EventType -> m ()
setEventWindowStateType s :: EventWindowState
s val :: EventType
val = IO () -> m ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ EventWindowState -> (Ptr EventWindowState -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr EventWindowState
s ((Ptr EventWindowState -> IO ()) -> IO ())
-> (Ptr EventWindowState -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \ptr :: Ptr EventWindowState
ptr -> do
let val' :: CInt
val' = (Int -> CInt
forall a b. (Integral a, Num b) => a -> b
fromIntegral (Int -> CInt) -> (EventType -> Int) -> EventType -> CInt
forall b c a. (b -> c) -> (a -> b) -> a -> c
. EventType -> Int
forall a. Enum a => a -> Int
fromEnum) EventType
val
Ptr CInt -> CInt -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr EventWindowState
ptr Ptr EventWindowState -> Int -> Ptr CInt
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` 0) (CInt
val' :: CInt)
#if defined(ENABLE_OVERLOADING)
data EventWindowStateTypeFieldInfo
instance AttrInfo EventWindowStateTypeFieldInfo where
type AttrBaseTypeConstraint EventWindowStateTypeFieldInfo = (~) EventWindowState
type AttrAllowedOps EventWindowStateTypeFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventWindowStateTypeFieldInfo = (~) Gdk.Enums.EventType
type AttrTransferTypeConstraint EventWindowStateTypeFieldInfo = (~)Gdk.Enums.EventType
type AttrTransferType EventWindowStateTypeFieldInfo = Gdk.Enums.EventType
type AttrGetType EventWindowStateTypeFieldInfo = Gdk.Enums.EventType
type AttrLabel EventWindowStateTypeFieldInfo = "type"
type AttrOrigin EventWindowStateTypeFieldInfo = EventWindowState
attrGet = getEventWindowStateType
attrSet = setEventWindowStateType
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventWindowState_type :: AttrLabelProxy "type"
eventWindowState_type = AttrLabelProxy
#endif
getEventWindowStateWindow :: MonadIO m => EventWindowState -> m (Maybe Gdk.Window.Window)
getEventWindowStateWindow :: EventWindowState -> m (Maybe Window)
getEventWindowStateWindow s :: EventWindowState
s = IO (Maybe Window) -> m (Maybe Window)
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO (Maybe Window) -> m (Maybe Window))
-> IO (Maybe Window) -> m (Maybe Window)
forall a b. (a -> b) -> a -> b
$ EventWindowState
-> (Ptr EventWindowState -> IO (Maybe Window)) -> IO (Maybe Window)
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr EventWindowState
s ((Ptr EventWindowState -> IO (Maybe Window)) -> IO (Maybe Window))
-> (Ptr EventWindowState -> IO (Maybe Window)) -> IO (Maybe Window)
forall a b. (a -> b) -> a -> b
$ \ptr :: Ptr EventWindowState
ptr -> do
Ptr Window
val <- Ptr (Ptr Window) -> IO (Ptr Window)
forall a. Storable a => Ptr a -> IO a
peek (Ptr EventWindowState
ptr Ptr EventWindowState -> Int -> Ptr (Ptr Window)
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` 8) :: IO (Ptr Gdk.Window.Window)
Maybe Window
result <- Ptr Window -> (Ptr Window -> IO Window) -> IO (Maybe Window)
forall a b. Ptr a -> (Ptr a -> IO b) -> IO (Maybe b)
SP.convertIfNonNull Ptr Window
val ((Ptr Window -> IO Window) -> IO (Maybe Window))
-> (Ptr Window -> IO Window) -> IO (Maybe Window)
forall a b. (a -> b) -> a -> b
$ \val' :: Ptr Window
val' -> do
Window
val'' <- ((ManagedPtr Window -> Window) -> Ptr Window -> IO Window
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
newObject ManagedPtr Window -> Window
Gdk.Window.Window) Ptr Window
val'
Window -> IO Window
forall (m :: * -> *) a. Monad m => a -> m a
return Window
val''
Maybe Window -> IO (Maybe Window)
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe Window
result
setEventWindowStateWindow :: MonadIO m => EventWindowState -> Ptr Gdk.Window.Window -> m ()
setEventWindowStateWindow :: EventWindowState -> Ptr Window -> m ()
setEventWindowStateWindow s :: EventWindowState
s val :: Ptr Window
val = IO () -> m ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ EventWindowState -> (Ptr EventWindowState -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr EventWindowState
s ((Ptr EventWindowState -> IO ()) -> IO ())
-> (Ptr EventWindowState -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \ptr :: Ptr EventWindowState
ptr -> do
Ptr (Ptr Window) -> Ptr Window -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr EventWindowState
ptr Ptr EventWindowState -> Int -> Ptr (Ptr Window)
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` 8) (Ptr Window
val :: Ptr Gdk.Window.Window)
clearEventWindowStateWindow :: MonadIO m => EventWindowState -> m ()
clearEventWindowStateWindow :: EventWindowState -> m ()
clearEventWindowStateWindow s :: EventWindowState
s = IO () -> m ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ EventWindowState -> (Ptr EventWindowState -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr EventWindowState
s ((Ptr EventWindowState -> IO ()) -> IO ())
-> (Ptr EventWindowState -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \ptr :: Ptr EventWindowState
ptr -> do
Ptr (Ptr Window) -> Ptr Window -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr EventWindowState
ptr Ptr EventWindowState -> Int -> Ptr (Ptr Window)
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` 8) (Ptr Window
forall a. Ptr a
FP.nullPtr :: Ptr Gdk.Window.Window)
#if defined(ENABLE_OVERLOADING)
data EventWindowStateWindowFieldInfo
instance AttrInfo EventWindowStateWindowFieldInfo where
type AttrBaseTypeConstraint EventWindowStateWindowFieldInfo = (~) EventWindowState
type AttrAllowedOps EventWindowStateWindowFieldInfo = '[ 'AttrSet, 'AttrGet, 'AttrClear]
type AttrSetTypeConstraint EventWindowStateWindowFieldInfo = (~) (Ptr Gdk.Window.Window)
type AttrTransferTypeConstraint EventWindowStateWindowFieldInfo = (~)(Ptr Gdk.Window.Window)
type AttrTransferType EventWindowStateWindowFieldInfo = (Ptr Gdk.Window.Window)
type AttrGetType EventWindowStateWindowFieldInfo = Maybe Gdk.Window.Window
type AttrLabel EventWindowStateWindowFieldInfo = "window"
type AttrOrigin EventWindowStateWindowFieldInfo = EventWindowState
attrGet = getEventWindowStateWindow
attrSet = setEventWindowStateWindow
attrConstruct = undefined
attrClear = clearEventWindowStateWindow
attrTransfer _ v = do
return v
eventWindowState_window :: AttrLabelProxy "window"
eventWindowState_window = AttrLabelProxy
#endif
getEventWindowStateSendEvent :: MonadIO m => EventWindowState -> m Int8
getEventWindowStateSendEvent :: EventWindowState -> m Int8
getEventWindowStateSendEvent s :: EventWindowState
s = IO Int8 -> m Int8
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Int8 -> m Int8) -> IO Int8 -> m Int8
forall a b. (a -> b) -> a -> b
$ EventWindowState -> (Ptr EventWindowState -> IO Int8) -> IO Int8
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr EventWindowState
s ((Ptr EventWindowState -> IO Int8) -> IO Int8)
-> (Ptr EventWindowState -> IO Int8) -> IO Int8
forall a b. (a -> b) -> a -> b
$ \ptr :: Ptr EventWindowState
ptr -> do
Int8
val <- Ptr Int8 -> IO Int8
forall a. Storable a => Ptr a -> IO a
peek (Ptr EventWindowState
ptr Ptr EventWindowState -> Int -> Ptr Int8
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` 16) :: IO Int8
Int8 -> IO Int8
forall (m :: * -> *) a. Monad m => a -> m a
return Int8
val
setEventWindowStateSendEvent :: MonadIO m => EventWindowState -> Int8 -> m ()
setEventWindowStateSendEvent :: EventWindowState -> Int8 -> m ()
setEventWindowStateSendEvent s :: EventWindowState
s val :: Int8
val = IO () -> m ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ EventWindowState -> (Ptr EventWindowState -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr EventWindowState
s ((Ptr EventWindowState -> IO ()) -> IO ())
-> (Ptr EventWindowState -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \ptr :: Ptr EventWindowState
ptr -> do
Ptr Int8 -> Int8 -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr EventWindowState
ptr Ptr EventWindowState -> Int -> Ptr Int8
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` 16) (Int8
val :: Int8)
#if defined(ENABLE_OVERLOADING)
data EventWindowStateSendEventFieldInfo
instance AttrInfo EventWindowStateSendEventFieldInfo where
type AttrBaseTypeConstraint EventWindowStateSendEventFieldInfo = (~) EventWindowState
type AttrAllowedOps EventWindowStateSendEventFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventWindowStateSendEventFieldInfo = (~) Int8
type AttrTransferTypeConstraint EventWindowStateSendEventFieldInfo = (~)Int8
type AttrTransferType EventWindowStateSendEventFieldInfo = Int8
type AttrGetType EventWindowStateSendEventFieldInfo = Int8
type AttrLabel EventWindowStateSendEventFieldInfo = "send_event"
type AttrOrigin EventWindowStateSendEventFieldInfo = EventWindowState
attrGet = getEventWindowStateSendEvent
attrSet = setEventWindowStateSendEvent
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventWindowState_sendEvent :: AttrLabelProxy "sendEvent"
eventWindowState_sendEvent = AttrLabelProxy
#endif
getEventWindowStateChangedMask :: MonadIO m => EventWindowState -> m [Gdk.Flags.WindowState]
getEventWindowStateChangedMask :: EventWindowState -> m [WindowState]
getEventWindowStateChangedMask s :: EventWindowState
s = IO [WindowState] -> m [WindowState]
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO [WindowState] -> m [WindowState])
-> IO [WindowState] -> m [WindowState]
forall a b. (a -> b) -> a -> b
$ EventWindowState
-> (Ptr EventWindowState -> IO [WindowState]) -> IO [WindowState]
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr EventWindowState
s ((Ptr EventWindowState -> IO [WindowState]) -> IO [WindowState])
-> (Ptr EventWindowState -> IO [WindowState]) -> IO [WindowState]
forall a b. (a -> b) -> a -> b
$ \ptr :: Ptr EventWindowState
ptr -> do
CUInt
val <- Ptr CUInt -> IO CUInt
forall a. Storable a => Ptr a -> IO a
peek (Ptr EventWindowState
ptr Ptr EventWindowState -> Int -> Ptr CUInt
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` 20) :: IO CUInt
let val' :: [WindowState]
val' = CUInt -> [WindowState]
forall a b. (Storable a, Integral a, Bits a, IsGFlag b) => a -> [b]
wordToGFlags CUInt
val
[WindowState] -> IO [WindowState]
forall (m :: * -> *) a. Monad m => a -> m a
return [WindowState]
val'
setEventWindowStateChangedMask :: MonadIO m => EventWindowState -> [Gdk.Flags.WindowState] -> m ()
setEventWindowStateChangedMask :: EventWindowState -> [WindowState] -> m ()
setEventWindowStateChangedMask s :: EventWindowState
s val :: [WindowState]
val = IO () -> m ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ EventWindowState -> (Ptr EventWindowState -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr EventWindowState
s ((Ptr EventWindowState -> IO ()) -> IO ())
-> (Ptr EventWindowState -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \ptr :: Ptr EventWindowState
ptr -> do
let val' :: CUInt
val' = [WindowState] -> CUInt
forall b a. (Num b, IsGFlag a) => [a] -> b
gflagsToWord [WindowState]
val
Ptr CUInt -> CUInt -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr EventWindowState
ptr Ptr EventWindowState -> Int -> Ptr CUInt
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` 20) (CUInt
val' :: CUInt)
#if defined(ENABLE_OVERLOADING)
data EventWindowStateChangedMaskFieldInfo
instance AttrInfo EventWindowStateChangedMaskFieldInfo where
type AttrBaseTypeConstraint EventWindowStateChangedMaskFieldInfo = (~) EventWindowState
type AttrAllowedOps EventWindowStateChangedMaskFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventWindowStateChangedMaskFieldInfo = (~) [Gdk.Flags.WindowState]
type AttrTransferTypeConstraint EventWindowStateChangedMaskFieldInfo = (~)[Gdk.Flags.WindowState]
type AttrTransferType EventWindowStateChangedMaskFieldInfo = [Gdk.Flags.WindowState]
type AttrGetType EventWindowStateChangedMaskFieldInfo = [Gdk.Flags.WindowState]
type AttrLabel EventWindowStateChangedMaskFieldInfo = "changed_mask"
type AttrOrigin EventWindowStateChangedMaskFieldInfo = EventWindowState
attrGet = getEventWindowStateChangedMask
attrSet = setEventWindowStateChangedMask
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventWindowState_changedMask :: AttrLabelProxy "changedMask"
eventWindowState_changedMask = AttrLabelProxy
#endif
getEventWindowStateNewWindowState :: MonadIO m => EventWindowState -> m [Gdk.Flags.WindowState]
getEventWindowStateNewWindowState :: EventWindowState -> m [WindowState]
getEventWindowStateNewWindowState s :: EventWindowState
s = IO [WindowState] -> m [WindowState]
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO [WindowState] -> m [WindowState])
-> IO [WindowState] -> m [WindowState]
forall a b. (a -> b) -> a -> b
$ EventWindowState
-> (Ptr EventWindowState -> IO [WindowState]) -> IO [WindowState]
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr EventWindowState
s ((Ptr EventWindowState -> IO [WindowState]) -> IO [WindowState])
-> (Ptr EventWindowState -> IO [WindowState]) -> IO [WindowState]
forall a b. (a -> b) -> a -> b
$ \ptr :: Ptr EventWindowState
ptr -> do
CUInt
val <- Ptr CUInt -> IO CUInt
forall a. Storable a => Ptr a -> IO a
peek (Ptr EventWindowState
ptr Ptr EventWindowState -> Int -> Ptr CUInt
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` 24) :: IO CUInt
let val' :: [WindowState]
val' = CUInt -> [WindowState]
forall a b. (Storable a, Integral a, Bits a, IsGFlag b) => a -> [b]
wordToGFlags CUInt
val
[WindowState] -> IO [WindowState]
forall (m :: * -> *) a. Monad m => a -> m a
return [WindowState]
val'
setEventWindowStateNewWindowState :: MonadIO m => EventWindowState -> [Gdk.Flags.WindowState] -> m ()
setEventWindowStateNewWindowState :: EventWindowState -> [WindowState] -> m ()
setEventWindowStateNewWindowState s :: EventWindowState
s val :: [WindowState]
val = IO () -> m ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ EventWindowState -> (Ptr EventWindowState -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr EventWindowState
s ((Ptr EventWindowState -> IO ()) -> IO ())
-> (Ptr EventWindowState -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \ptr :: Ptr EventWindowState
ptr -> do
let val' :: CUInt
val' = [WindowState] -> CUInt
forall b a. (Num b, IsGFlag a) => [a] -> b
gflagsToWord [WindowState]
val
Ptr CUInt -> CUInt -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr EventWindowState
ptr Ptr EventWindowState -> Int -> Ptr CUInt
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` 24) (CUInt
val' :: CUInt)
#if defined(ENABLE_OVERLOADING)
data EventWindowStateNewWindowStateFieldInfo
instance AttrInfo EventWindowStateNewWindowStateFieldInfo where
type AttrBaseTypeConstraint EventWindowStateNewWindowStateFieldInfo = (~) EventWindowState
type AttrAllowedOps EventWindowStateNewWindowStateFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint EventWindowStateNewWindowStateFieldInfo = (~) [Gdk.Flags.WindowState]
type AttrTransferTypeConstraint EventWindowStateNewWindowStateFieldInfo = (~)[Gdk.Flags.WindowState]
type AttrTransferType EventWindowStateNewWindowStateFieldInfo = [Gdk.Flags.WindowState]
type AttrGetType EventWindowStateNewWindowStateFieldInfo = [Gdk.Flags.WindowState]
type AttrLabel EventWindowStateNewWindowStateFieldInfo = "new_window_state"
type AttrOrigin EventWindowStateNewWindowStateFieldInfo = EventWindowState
attrGet = getEventWindowStateNewWindowState
attrSet = setEventWindowStateNewWindowState
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
eventWindowState_newWindowState :: AttrLabelProxy "newWindowState"
eventWindowState_newWindowState = AttrLabelProxy
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList EventWindowState
type instance O.AttributeList EventWindowState = EventWindowStateAttributeList
type EventWindowStateAttributeList = ('[ '("type", EventWindowStateTypeFieldInfo), '("window", EventWindowStateWindowFieldInfo), '("sendEvent", EventWindowStateSendEventFieldInfo), '("changedMask", EventWindowStateChangedMaskFieldInfo), '("newWindowState", EventWindowStateNewWindowStateFieldInfo)] :: [(Symbol, *)])
#endif
#if defined(ENABLE_OVERLOADING)
type family ResolveEventWindowStateMethod (t :: Symbol) (o :: *) :: * where
ResolveEventWindowStateMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolveEventWindowStateMethod t EventWindowState, O.MethodInfo info EventWindowState p) => OL.IsLabel t (EventWindowState -> p) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.overloadedMethod @info
#else
fromLabel _ = O.overloadedMethod @info
#endif
#endif