X11-1.9.2: A binding to the X11 graphics library

Copyright(c) Alastair Reid 1999-2003
LicenseBSD-style (see the file libraries/base/LICENSE)
Maintainerlibraries@haskell.org
Stabilityprovisional
Portabilityportable
Safe HaskellNone
LanguageHaskell98

Graphics.X11.Xlib.Event

Description

A collection of FFI declarations for interfacing with Xlib Events.

Synopsis

Documentation

newtype XEvent Source #

Constructors

XEvent XEventPtr 
Instances
Eq XEvent Source # 
Instance details

Defined in Graphics.X11.Xlib.Event

Methods

(==) :: XEvent -> XEvent -> Bool #

(/=) :: XEvent -> XEvent -> Bool #

Data XEvent Source # 
Instance details

Defined in Graphics.X11.Xlib.Event

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> XEvent -> c XEvent #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c XEvent #

toConstr :: XEvent -> Constr #

dataTypeOf :: XEvent -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c XEvent) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c XEvent) #

gmapT :: (forall b. Data b => b -> b) -> XEvent -> XEvent #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> XEvent -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> XEvent -> r #

gmapQ :: (forall d. Data d => d -> u) -> XEvent -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> XEvent -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> XEvent -> m XEvent #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> XEvent -> m XEvent #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> XEvent -> m XEvent #

Ord XEvent Source # 
Instance details

Defined in Graphics.X11.Xlib.Event

Show XEvent Source # 
Instance details

Defined in Graphics.X11.Xlib.Event

waitForEvent :: Display -> Word32 -> IO Bool Source #

Reads an event with a timeout (in microseconds). Returns True if timeout occurs.

gettimeofday_in_milliseconds :: IO Integer Source #

This function is somewhat compatible with Win32's TimeGetTime()

flush :: Display -> IO () Source #

interface to the X11 library function XFlush().

sync :: Display -> Bool -> IO () Source #

interface to the X11 library function XSync().

pending :: Display -> IO CInt Source #

interface to the X11 library function XPending().

eventsQueued :: Display -> QueuedMode -> IO CInt Source #

interface to the X11 library function XEventsQueued().

nextEvent :: Display -> XEventPtr -> IO () Source #

interface to the X11 library function XNextEvent().

allowEvents :: Display -> AllowEvents -> Time -> IO () Source #

interface to the X11 library function XAllowEvents().

selectInput :: Display -> Window -> EventMask -> IO () Source #

interface to the X11 library function XSelectInput().

sendEvent :: Display -> Window -> Bool -> EventMask -> XEventPtr -> IO () Source #

interface to the X11 library function XSendEvent().

windowEvent :: Display -> Window -> EventMask -> XEventPtr -> IO () Source #

interface to the X11 library function XWindowEvent().

checkWindowEvent :: Display -> Window -> EventMask -> XEventPtr -> IO Bool Source #

interface to the X11 library function XCheckWindowEvent().

maskEvent :: Display -> EventMask -> XEventPtr -> IO () Source #

interface to the X11 library function XMaskEvent().

checkMaskEvent :: Display -> EventMask -> XEventPtr -> IO Bool Source #

interface to the X11 library function XCheckMaskEvent().

checkTypedEvent :: Display -> EventType -> XEventPtr -> IO Bool Source #

interface to the X11 library function XCheckTypedEvent().

checkTypedWindowEvent :: Display -> Window -> EventType -> XEventPtr -> IO Bool Source #

interface to the X11 library function XCheckTypedWindowEvent().

putBackEvent :: Display -> XEventPtr -> IO () Source #

interface to the X11 library function XPutBackEvent().

peekEvent :: Display -> XEventPtr -> IO () Source #

interface to the X11 library function XPeekEvent().

refreshKeyboardMapping :: XMappingEvent -> IO () Source #

interface to the X11 library function XRefreshKeyboardMapping().