xmonad-0.16.99999: A tiling window manager
Copyright(c) Don Stewart
LicenseBSD3
MaintainerDon Stewart <dons@galois.com>
Stabilityprovisional
Portability
Safe HaskellNone
LanguageHaskell98

XMonad

Description

 
Synopsis

Documentation

restackWindows :: Display -> [Window] -> IO () #

interface to the X11 library function XRestackWindows().

withdrawWindow :: Display -> Window -> ScreenNumber -> IO () #

interface to the X11 library function XWithdrawWindow().

iconifyWindow :: Display -> Window -> ScreenNumber -> IO () #

interface to the X11 library function XIconifyWindow().

translateCoordinates :: Display -> Window -> Window -> Position -> Position -> IO (Bool, Position, Position, Window) #

interface to the X11 library function XTranslateCoordinates().

storeName :: Display -> Window -> String -> IO () #

interface to the X11 library function XStoreName().

createSimpleWindow :: Display -> Window -> Position -> Position -> Dimension -> Dimension -> CInt -> Pixel -> Pixel -> IO Window #

interface to the X11 library function XCreateSimpleWindow().

createWindow :: Display -> Window -> Position -> Position -> Dimension -> Dimension -> CInt -> CInt -> WindowClass -> Visual -> AttributeMask -> Ptr SetWindowAttributes -> IO Window #

interface to the X11 library function XCreateWindow().

moveResizeWindow :: Display -> Window -> Position -> Position -> Dimension -> Dimension -> IO () #

interface to the X11 library function XMoveResizeWindow().

resizeWindow :: Display -> Window -> Dimension -> Dimension -> IO () #

interface to the X11 library function XResizeWindow().

moveWindow :: Display -> Window -> Position -> Position -> IO () #

interface to the X11 library function XMoveWindow().

reparentWindow :: Display -> Window -> Window -> Position -> Position -> IO () #

interface to the X11 library function XReparentWindow().

mapSubwindows :: Display -> Window -> IO () #

interface to the X11 library function XMapSubwindows().

unmapSubwindows :: Display -> Window -> IO () #

interface to the X11 library function XUnmapSubwindows().

mapWindow :: Display -> Window -> IO () #

interface to the X11 library function XMapWindow().

lowerWindow :: Display -> Window -> IO () #

interface to the X11 library function XLowerWindow().

raiseWindow :: Display -> Window -> IO () #

interface to the X11 library function XRaiseWindow().

circulateSubwindowsDown :: Display -> Window -> IO () #

interface to the X11 library function XCirculateSubwindowsDown().

circulateSubwindowsUp :: Display -> Window -> IO () #

interface to the X11 library function XCirculateSubwindowsUp().

circulateSubwindows :: Display -> Window -> CirculationDirection -> IO () #

interface to the X11 library function XCirculateSubwindows().

destroyWindow :: Display -> Window -> IO () #

interface to the X11 library function XDestroyWindow().

destroySubwindows :: Display -> Window -> IO () #

interface to the X11 library function XDestroySubwindows().

setWindowBorder :: Display -> Window -> Pixel -> IO () #

interface to the X11 library function XSetWindowBorder().

setWindowBorderPixmap :: Display -> Window -> Pixmap -> IO () #

interface to the X11 library function XSetWindowBorderPixmap().

setWindowBorderWidth :: Display -> Window -> Dimension -> IO () #

interface to the X11 library function XSetWindowBorderWidth().

setWindowBackground :: Display -> Window -> Pixel -> IO () #

interface to the X11 library function XSetWindowBackground().

setWindowBackgroundPixmap :: Display -> Window -> Pixmap -> IO () #

interface to the X11 library function XSetWindowBackgroundPixmap().

setWindowColormap :: Display -> Window -> Colormap -> IO () #

interface to the X11 library function XSetWindowColormap().

addToSaveSet :: Display -> Window -> IO () #

interface to the X11 library function XAddToSaveSet().

removeFromSaveSet :: Display -> Window -> IO () #

interface to the X11 library function XRemoveFromSaveSet().

changeSaveSet :: Display -> Window -> ChangeSaveSetMode -> IO () #

interface to the X11 library function XChangeSaveSet().

clearWindow :: Display -> Window -> IO () #

interface to the X11 library function XClearWindow().

clearArea :: Display -> Window -> Position -> Position -> Dimension -> Dimension -> Bool -> IO () #

interface to the X11 library function XClearArea().

setTextProperty :: Display -> Window -> String -> Atom -> IO () #

interface to the X11 library function XSetTextProperty().

rotateBuffers :: Display -> CInt -> IO () #

interface to the X11 library function XRotateBuffers().

fetchBytes :: Display -> IO String #

interface to the X11 library function XFetchBytes().

fetchBuffer :: Display -> CInt -> IO String #

interface to the X11 library function XFetchBuffer().

storeBytes :: Display -> String -> IO () #

interface to the X11 library function XStoreBytes().

storeBuffer :: Display -> String -> CInt -> IO () #

interface to the X11 library function XStoreBuffer().

drawImageString :: Display -> Drawable -> GC -> Position -> Position -> String -> IO () #

interface to the X11 library function XDrawImageString().

drawString :: Display -> Drawable -> GC -> Position -> Position -> String -> IO () #

interface to the X11 library function XDrawString().

fillArcs :: Display -> Drawable -> GC -> [Arc] -> IO () #

interface to the X11 library function XFillArcs().

fillPolygon :: Display -> Drawable -> GC -> [Point] -> PolygonShape -> CoordinateMode -> IO () #

interface to the X11 library function XFillPolygon().

fillRectangles :: Display -> Drawable -> GC -> [Rectangle] -> IO () #

interface to the X11 library function XFillRectangles().

drawArcs :: Display -> Drawable -> GC -> [Arc] -> IO () #

interface to the X11 library function XDrawArcs().

drawRectangles :: Display -> Drawable -> GC -> [Rectangle] -> IO () #

interface to the X11 library function XDrawRectangles().

drawSegments :: Display -> Drawable -> GC -> [Segment] -> IO () #

interface to the X11 library function XDrawSegments().

drawLines :: Display -> Drawable -> GC -> [Point] -> CoordinateMode -> IO () #

interface to the X11 library function XDrawLines().

drawPoints :: Display -> Drawable -> GC -> [Point] -> CoordinateMode -> IO () #

interface to the X11 library function XDrawPoints().

setWMProtocols :: Display -> Window -> [Atom] -> IO () #

interface to the X11 library function XSetWMProtocols().

recolorCursor :: Display -> Cursor -> Color -> Color -> IO () #

interface to the X11 library function XRecolorCursor().

createGlyphCursor :: Display -> Font -> Font -> Glyph -> Glyph -> Color -> Color -> IO Cursor #

interface to the X11 library function XCreateGlyphCursor().

createPixmapCursor :: Display -> Pixmap -> Pixmap -> Color -> Color -> Dimension -> Dimension -> IO Cursor #

interface to the X11 library function XCreatePixmapCursor().

setIconName :: Display -> Window -> String -> IO () #

interface to the X11 library function XSetIconName().

getIconName :: Display -> Window -> IO String #

interface to the X11 library function XGetIconName().

lookupString :: XKeyEventPtr -> IO (Maybe KeySym, String) #

interface to the X11 library function XLookupString().

stringToKeysym :: String -> KeySym #

interface to the X11 library function XStringToKeysym().

keysymToString :: KeySym -> String #

interface to the X11 library function XKeysymToString().

displayKeycodes :: Display -> (CInt, CInt) #

interface to the X11 library function XDisplayKeycodes().

readBitmapFile :: Display -> Drawable -> String -> IO (Either String (Dimension, Dimension, Pixmap, Maybe CInt, Maybe CInt)) #

interface to the X11 library function XReadBitmapFile.

matchVisualInfo :: Display -> ScreenNumber -> CInt -> CInt -> IO (Maybe VisualInfo) #

interface to the X11 library function XMatchVisualInfo()

visualBlueMaskMask :: VisualInfoMask #

interface to the X11 library function XGetVisualInfo()

getPointerControl :: Display -> IO (CInt, CInt, CInt) #

interface to the X11 library function XGetPointerControl().

setLocaleModifiers :: String -> IO String #

interface to the X11 library function XSetLocaleModifiers().

getGeometry :: Display -> Drawable -> IO (Window, Position, Position, Dimension, Dimension, Dimension, CInt) #

interface to the X11 library function XGetGeometry().

geometry :: Display -> CInt -> String -> String -> Dimension -> Dimension -> Dimension -> CInt -> CInt -> IO (CInt, Position, Position, Dimension, Dimension) #

interface to the X11 library function XGeometry().

setDefaultErrorHandler :: IO () #

The Xlib library reports most errors by invoking a user-provided error handler. This function installs an error handler that prints a textual representation of the error.

displayName :: String -> String #

interface to the X11 library function XDisplayName().

queryPointer :: Display -> Window -> IO (Bool, Window, Window, CInt, CInt, CInt, CInt, Modifier) #

interface to the X11 library function XQueryPointer().

queryBestSize :: Display -> QueryBestSizeClass -> Drawable -> Dimension -> Dimension -> IO (Dimension, Dimension) #

interface to the X11 library function XQueryBestSize().

queryBestCursor :: Display -> Drawable -> Dimension -> Dimension -> IO (Dimension, Dimension) #

interface to the X11 library function XQueryBestCursor().

queryBestStipple :: Display -> Drawable -> Dimension -> Dimension -> IO (Dimension, Dimension) #

interface to the X11 library function XQueryBestStipple().

queryBestTile :: Display -> Drawable -> Dimension -> Dimension -> IO (Dimension, Dimension) #

interface to the X11 library function XQueryBestTile().

getInputFocus :: Display -> IO (Window, FocusMode) #

interface to the X11 library function XGetInputFocus().

rmInitialize :: IO () #

interface to the X11 library function XrmInitialize().

autoRepeatOff :: Display -> IO () #

interface to the X11 library function XAutoRepeatOff().

autoRepeatOn :: Display -> IO () #

interface to the X11 library function XAutoRepeatOn().

bell :: Display -> CInt -> IO () #

interface to the X11 library function XBell().

setCloseDownMode :: Display -> CloseDownMode -> IO () #

interface to the X11 library function XSetCloseDownMode().

lastKnownRequestProcessed :: Display -> IO CInt #

interface to the X11 library function XLastKnownRequestProcessed().

setInputFocus :: Display -> Window -> FocusMode -> Time -> IO () #

interface to the X11 library function XSetInputFocus().

grabButton :: Display -> Button -> ButtonMask -> Window -> Bool -> EventMask -> GrabMode -> GrabMode -> Window -> Cursor -> IO () #

interface to the X11 library function XGrabButton().

ungrabButton :: Display -> Button -> ButtonMask -> Window -> IO () #

interface to the X11 library function XUngrabButton().

grabPointer :: Display -> Window -> Bool -> EventMask -> GrabMode -> GrabMode -> Window -> Cursor -> Time -> IO GrabStatus #

interface to the X11 library function XGrabPointer().

ungrabPointer :: Display -> Time -> IO () #

interface to the X11 library function XUngrabPointer().

grabKey :: Display -> KeyCode -> KeyMask -> Window -> Bool -> GrabMode -> GrabMode -> IO () #

interface to the X11 library function XGrabKey().

ungrabKey :: Display -> KeyCode -> KeyMask -> Window -> IO () #

interface to the X11 library function XUngrabKey().

grabKeyboard :: Display -> Window -> Bool -> GrabMode -> GrabMode -> Time -> IO GrabStatus #

interface to the X11 library function XGrabKeyboard().

ungrabKeyboard :: Display -> Time -> IO () #

interface to the X11 library function XUngrabKeyboard().

grabServer :: Display -> IO () #

interface to the X11 library function XGrabServer().

ungrabServer :: Display -> IO () #

interface to the X11 library function XUngrabServer().

supportsLocale :: IO Bool #

interface to the X11 library function XSupportsLocale().

setScreenSaver :: Display -> CInt -> CInt -> PreferBlankingMode -> AllowExposuresMode -> IO () #

interface to the X11 library function XSetScreenSaver().

activateScreenSaver :: Display -> IO () #

interface to the X11 library function XActivateScreenSaver().

resetScreenSaver :: Display -> IO () #

interface to the X11 library function XResetScreenSaver().

forceScreenSaver :: Display -> ScreenSaverMode -> IO () #

interface to the X11 library function XForceScreenSaver().

warpPointer :: Display -> Window -> Window -> Position -> Position -> Dimension -> Dimension -> Position -> Position -> IO () #

interface to the X11 library function XWarpPointer().

visualIDFromVisual :: Visual -> IO VisualID #

see XVisualIDFromVisual()

createPixmap :: Display -> Drawable -> Dimension -> Dimension -> CInt -> IO Pixmap #

interface to the X11 library function XCreatePixmap().

freePixmap :: Display -> Pixmap -> IO () #

interface to the X11 library function XFreePixmap().

bitmapBitOrder :: Display -> ByteOrder #

interface to the X11 library function XBitmapBitOrder().

bitmapUnit :: Display -> CInt #

interface to the X11 library function XBitmapUnit().

bitmapPad :: Display -> CInt #

interface to the X11 library function XBitmapPad().

lookupKeysym :: XKeyEventPtr -> CInt -> IO KeySym #

interface to the X11 library function XLookupKeysym().

keycodeToKeysym :: Display -> KeyCode -> CInt -> IO KeySym #

interface to the X11 library function XKeycodeToKeysym().

keysymToKeycode :: Display -> KeySym -> IO KeyCode #

interface to the X11 library function XKeysymToKeycode().

defineCursor :: Display -> Window -> Cursor -> IO () #

interface to the X11 library function XDefineCursor().

undefineCursor :: Display -> Window -> IO () #

interface to the X11 library function XUndefineCursor().

createFontCursor :: Display -> Glyph -> IO Cursor #

interface to the X11 library function XCreateFontCursor().

freeCursor :: Display -> Font -> IO () #

interface to the X11 library function XFreeCursor().

drawPoint :: Display -> Drawable -> GC -> Position -> Position -> IO () #

interface to the X11 library function XDrawPoint().

drawLine :: Display -> Drawable -> GC -> Position -> Position -> Position -> Position -> IO () #

interface to the X11 library function XDrawLine().

drawRectangle :: Display -> Drawable -> GC -> Position -> Position -> Dimension -> Dimension -> IO () #

interface to the X11 library function XDrawRectangle().

drawArc :: Display -> Drawable -> GC -> Position -> Position -> Dimension -> Dimension -> Angle -> Angle -> IO () #

interface to the X11 library function XDrawArc().

fillRectangle :: Display -> Drawable -> GC -> Position -> Position -> Dimension -> Dimension -> IO () #

interface to the X11 library function XFillRectangle().

fillArc :: Display -> Drawable -> GC -> Position -> Position -> Dimension -> Dimension -> Angle -> Angle -> IO () #

interface to the X11 library function XFillArc().

copyArea :: Display -> Drawable -> Drawable -> GC -> Position -> Position -> Dimension -> Dimension -> Position -> Position -> IO () #

interface to the X11 library function XCopyArea().

copyPlane :: Display -> Drawable -> Drawable -> GC -> Position -> Position -> Dimension -> Dimension -> Position -> Position -> Pixel -> IO () #

interface to the X11 library function XCopyPlane().

internAtom :: Display -> String -> Bool -> IO Atom #

interface to the X11 library function XInternAtom().

queryColors :: Display -> Colormap -> [Color] -> IO [Color] #

interface to the X11 library function XQueryColors().

queryColor :: Display -> Colormap -> Color -> IO Color #

interface to the X11 library function XQueryColor().

storeColor :: Display -> Colormap -> Color -> IO () #

interface to the X11 library function XStoreColor().

freeColors :: Display -> Colormap -> [Pixel] -> Pixel -> IO () #

interface to the X11 library function XFreeColors().

parseColor :: Display -> Colormap -> String -> IO Color #

interface to the X11 library function XParseColor().

allocColor :: Display -> Colormap -> Color -> IO Color #

interface to the X11 library function XAllocColor().

allocNamedColor :: Display -> Colormap -> String -> IO (Color, Color) #

interface to the X11 library function XAllocNamedColor().

lookupColor :: Display -> Colormap -> String -> IO (Color, Color) #

interface to the X11 library function XLookupColor().

installColormap :: Display -> Colormap -> IO () #

interface to the X11 library function XInstallColormap().

uninstallColormap :: Display -> Colormap -> IO () #

interface to the X11 library function XUninstallColormap().

copyColormapAndFree :: Display -> Colormap -> IO Colormap #

interface to the X11 library function XCopyColormapAndFree().

createColormap :: Display -> Window -> Visual -> ColormapAlloc -> IO Colormap #

interface to the X11 library function XCreateColormap().

freeColormap :: Display -> Colormap -> IO () #

interface to the X11 library function XFreeColormap().

createGC :: Display -> Drawable -> IO GC #

partial interface to the X11 library function XCreateGC().

setDashes :: Display -> GC -> CInt -> String -> CInt -> IO () #

interface to the X11 library function XSetDashes().

setArcMode :: Display -> GC -> ArcMode -> IO () #

interface to the X11 library function XSetArcMode().

setBackground :: Display -> GC -> Pixel -> IO () #

interface to the X11 library function XSetBackground().

setForeground :: Display -> GC -> Pixel -> IO () #

interface to the X11 library function XSetForeground().

setFunction :: Display -> GC -> GXFunction -> IO () #

interface to the X11 library function XSetFunction().

setGraphicsExposures :: Display -> GC -> Bool -> IO () #

interface to the X11 library function XSetGraphicsExposures().

setClipMask :: Display -> GC -> Pixmap -> IO () #

interface to the X11 library function XSetClipMask().

setClipOrigin :: Display -> GC -> Position -> Position -> IO () #

interface to the X11 library function XSetClipOrigin().

setFillRule :: Display -> GC -> FillRule -> IO () #

interface to the X11 library function XSetFillRule().

setFillStyle :: Display -> GC -> FillStyle -> IO () #

interface to the X11 library function XSetFillStyle().

setFont :: Display -> GC -> Font -> IO () #

interface to the X11 library function XSetFont().

setLineAttributes :: Display -> GC -> CInt -> LineStyle -> CapStyle -> JoinStyle -> IO () #

interface to the X11 library function XSetLineAttributes().

setPlaneMask :: Display -> GC -> Pixel -> IO () #

interface to the X11 library function XSetPlaneMask().

setState :: Display -> GC -> Pixel -> Pixel -> GXFunction -> Pixel -> IO () #

interface to the X11 library function XSetState().

setStipple :: Display -> GC -> Pixmap -> IO () #

interface to the X11 library function XSetStipple().

setSubwindowMode :: Display -> GC -> SubWindowMode -> IO () #

interface to the X11 library function XSetSubwindowMode().

setTSOrigin :: Display -> GC -> Position -> Position -> IO () #

interface to the X11 library function XSetTSOrigin().

setTile :: Display -> GC -> Pixmap -> IO () #

interface to the X11 library function XSetTile().

gContextFromGC :: GC -> GContext #

interface to the X11 library function XGContextFromGC().

freeGC :: Display -> GC -> IO () #

interface to the X11 library function XFreeGC().

flushGC :: Display -> GC -> IO () #

interface to the X11 library function XFlushGC().

copyGC :: Display -> GC -> Mask -> GC -> IO () #

interface to the X11 library function XCopyGC().

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

interface to the X11 library function XSendEvent().

gettimeofday_in_milliseconds :: IO Integer #

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

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

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

allocaXEvent :: (XEventPtr -> IO a) -> IO a #

flush :: Display -> IO () #

interface to the X11 library function XFlush().

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

interface to the X11 library function XSync().

pending :: Display -> IO CInt #

interface to the X11 library function XPending().

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

interface to the X11 library function XEventsQueued().

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

interface to the X11 library function XNextEvent().

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

interface to the X11 library function XAllowEvents().

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

interface to the X11 library function XSelectInput().

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

interface to the X11 library function XWindowEvent().

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

interface to the X11 library function XCheckWindowEvent().

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

interface to the X11 library function XMaskEvent().

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

interface to the X11 library function XCheckMaskEvent().

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

interface to the X11 library function XCheckTypedEvent().

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

interface to the X11 library function XCheckTypedWindowEvent().

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

interface to the X11 library function XPutBackEvent().

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

interface to the X11 library function XPeekEvent().

newtype XEvent #

Constructors

XEvent XEventPtr 

Instances

Instances details
Eq XEvent 
Instance details

Defined in Graphics.X11.Xlib.Event

Methods

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

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

Data XEvent 
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 :: forall r r'. (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 
Instance details

Defined in Graphics.X11.Xlib.Event

Show XEvent 
Instance details

Defined in Graphics.X11.Xlib.Event

openDisplay :: String -> IO Display #

interface to the X11 library function XOpenDisplay().

serverVendor :: Display -> String #

interface to the X11 library function XServerVendor().

displayString :: Display -> String #

interface to the X11 library function XDisplayString().

screenResourceString :: Screen -> String #

interface to the X11 library function XScreenResourceString().

resourceManagerString :: Display -> String #

interface to the X11 library function XResourceManagerString().

allPlanes_aux :: Pixel #

interface to the X11 library function XAllPlanes().

blackPixel :: Display -> ScreenNumber -> Pixel #

interface to the X11 library function XBlackPixel().

whitePixel :: Display -> ScreenNumber -> Pixel #

interface to the X11 library function XWhitePixel().

connectionNumber :: Display -> CInt #

interface to the X11 library function XConnectionNumber().

defaultColormap :: Display -> ScreenNumber -> Colormap #

interface to the X11 library function XDefaultColormap().

defaultGC :: Display -> ScreenNumber -> GC #

interface to the X11 library function XDefaultGC().

defaultDepth :: Display -> ScreenNumber -> CInt #

interface to the X11 library function XDefaultDepth().

defaultScreen :: Display -> ScreenNumber #

interface to the X11 library function XDefaultScreen().

defaultScreenOfDisplay :: Display -> Screen #

interface to the X11 library function XDefaultScreenOfDisplay().

displayHeight :: Display -> ScreenNumber -> CInt #

interface to the X11 library function XDisplayHeight().

displayHeightMM :: Display -> ScreenNumber -> CInt #

interface to the X11 library function XDisplayHeightMM().

displayWidth :: Display -> ScreenNumber -> CInt #

interface to the X11 library function XDisplayWidth().

displayWidthMM :: Display -> ScreenNumber -> CInt #

interface to the X11 library function XDisplayWidthMM().

maxRequestSize :: Display -> CInt #

interface to the X11 library function XMaxRequestSize().

displayMotionBufferSize :: Display -> CInt #

interface to the X11 library function XDisplayMotionBufferSize().

imageByteOrder :: Display -> CInt #

interface to the X11 library function XImageByteOrder().

protocolRevision :: Display -> CInt #

interface to the X11 library function XProtocolRevision().

protocolVersion :: Display -> CInt #

interface to the X11 library function XProtocolVersion().

screenCount :: Display -> CInt #

interface to the X11 library function XScreenCount().

defaultVisual :: Display -> ScreenNumber -> Visual #

interface to the X11 library function XDefaultVisual().

displayCells :: Display -> ScreenNumber -> CInt #

interface to the X11 library function XDisplayCells().

displayPlanes :: Display -> ScreenNumber -> CInt #

interface to the X11 library function XDisplayPlanes().

screenOfDisplay :: Display -> ScreenNumber -> Screen #

interface to the X11 library function XScreenOfDisplay().

defaultRootWindow :: Display -> Window #

interface to the X11 library function XDefaultRootWindow().

rootWindow :: Display -> ScreenNumber -> IO Window #

interface to the X11 library function XRootWindow().

qLength :: Display -> IO CInt #

interface to the X11 library function XQLength().

noOp :: Display -> IO () #

interface to the X11 library function XNoOp().

closeDisplay :: Display -> IO () #

interface to the X11 library function XCloseDisplay().

textWidth :: FontStruct -> String -> Int32 #

interface to the X11 library function XTextWidth().

textExtents :: FontStruct -> String -> (FontDirection, Int32, Int32, CharStruct) #

interface to the X11 library function XTextExtents().

loadQueryFont :: Display -> String -> IO FontStruct #

interface to the X11 library function XLoadQueryFont().

fontFromGC :: Display -> GC -> IO Font #

interface to the X11 library function XGetGCValues().

queryFont :: Display -> Font -> IO FontStruct #

interface to the X11 library function XQueryFont().

freeFont :: Display -> FontStruct -> IO () #

interface to the X11 library function XFreeFont().

type Glyph = Word16 #

data FontStruct #

pointer to an X11 XFontStruct structure

Instances

Instances details
Eq FontStruct 
Instance details

Defined in Graphics.X11.Xlib.Font

Data FontStruct 
Instance details

Defined in Graphics.X11.Xlib.Font

Methods

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

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

toConstr :: FontStruct -> Constr #

dataTypeOf :: FontStruct -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord FontStruct 
Instance details

Defined in Graphics.X11.Xlib.Font

Show FontStruct 
Instance details

Defined in Graphics.X11.Xlib.Font

getPixel :: Image -> CInt -> CInt -> CULong #

interface to the X11 library function XGetPixel().

getImage :: Display -> Drawable -> CInt -> CInt -> CUInt -> CUInt -> CULong -> ImageFormat -> IO Image #

interface to the X11 library function XGetImage().

createImage :: Display -> Visual -> CInt -> ImageFormat -> CInt -> Ptr CChar -> Dimension -> Dimension -> CInt -> CInt -> IO Image #

interface to the X11 library function XCreateImage().

putImage :: Display -> Drawable -> GC -> Image -> Position -> Position -> Position -> Position -> Dimension -> Dimension -> IO () #

interface to the X11 library function XPutImage().

destroyImage :: Image -> IO () #

interface to the X11 library function XDestroyImage().

setRegion :: Display -> GC -> Region -> IO CInt #

interface to the X11 library function XSetRegion().

shrinkRegion :: Region -> Point -> IO CInt #

interface to the X11 library function XShrinkRegion().

offsetRegion :: Region -> Point -> IO CInt #

interface to the X11 library function XOffsetRegion().

clipBox :: Region -> IO (Rectangle, CInt) #

interface to the X11 library function XClipBox().

rectInRegion :: Region -> Rectangle -> IO RectInRegionResult #

interface to the X11 library function XRectInRegion().

pointInRegion :: Region -> Point -> IO Bool #

interface to the X11 library function XPointInRegion().

equalRegion :: Region -> Region -> IO Bool #

interface to the X11 library function XEqualRegion().

emptyRegion :: Region -> IO Bool #

interface to the X11 library function XEmptyRegion().

xorRegion :: Region -> Region -> Region -> IO CInt #

interface to the X11 library function XXorRegion().

unionRegion :: Region -> Region -> Region -> IO CInt #

interface to the X11 library function XUnionRegion().

unionRectWithRegion :: Rectangle -> Region -> Region -> IO CInt #

interface to the X11 library function XUnionRectWithRegion().

subtractRegion :: Region -> Region -> Region -> IO CInt #

interface to the X11 library function XSubtractRegion().

intersectRegion :: Region -> Region -> Region -> IO CInt #

interface to the X11 library function XIntersectRegion().

polygonRegion :: [Point] -> FillRule -> IO Region #

interface to the X11 library function XPolygonRegion().

createRegion :: IO Region #

interface to the X11 library function XCreateRegion().

data Region #

Instances

Instances details
Eq Region 
Instance details

Defined in Graphics.X11.Xlib.Region

Methods

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

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

Data Region 
Instance details

Defined in Graphics.X11.Xlib.Region

Methods

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

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

toConstr :: Region -> Constr #

dataTypeOf :: Region -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Region 
Instance details

Defined in Graphics.X11.Xlib.Region

Show Region 
Instance details

Defined in Graphics.X11.Xlib.Region

blackPixelOfScreen :: Screen -> Pixel #

interface to the X11 library function XBlackPixelOfScreen().

whitePixelOfScreen :: Screen -> Pixel #

interface to the X11 library function XWhitePixelOfScreen().

cellsOfScreen :: Screen -> CInt #

interface to the X11 library function XCellsOfScreen().

defaultColormapOfScreen :: Screen -> Colormap #

interface to the X11 library function XDefaultColormapOfScreen().

defaultDepthOfScreen :: Screen -> CInt #

interface to the X11 library function XDefaultDepthOfScreen().

defaultGCOfScreen :: Screen -> GC #

interface to the X11 library function XDefaultGCOfScreen().

defaultVisualOfScreen :: Screen -> Visual #

interface to the X11 library function XDefaultVisualOfScreen().

doesBackingStore :: Screen -> Bool #

interface to the X11 library function XDoesBackingStore().

doesSaveUnders :: Screen -> Bool #

interface to the X11 library function XDoesSaveUnders().

displayOfScreen :: Screen -> Display #

interface to the X11 library function XDisplayOfScreen().

eventMaskOfScreen :: Screen -> EventMask #

interface to the X11 library function XEventMaskOfScreen(). Event mask at connection setup time - not current event mask!

minCmapsOfScreen :: Screen -> CInt #

interface to the X11 library function XMinCmapsOfScreen().

maxCmapsOfScreen :: Screen -> CInt #

interface to the X11 library function XMaxCmapsOfScreen().

rootWindowOfScreen :: Screen -> Window #

interface to the X11 library function XRootWindowOfScreen().

widthOfScreen :: Screen -> Dimension #

interface to the X11 library function XWidthOfScreen().

widthMMOfScreen :: Screen -> Dimension #

interface to the X11 library function XWidthMMOfScreen().

heightOfScreen :: Screen -> Dimension #

interface to the X11 library function XHeightOfScreen().

heightMMOfScreen :: Screen -> Dimension #

interface to the X11 library function XHeightMMOfScreen().

planesOfScreen :: Screen -> CInt #

interface to the X11 library function XPlanesOfScreen().

screenNumberOfScreen :: Screen -> ScreenNumber #

interface to the X11 library function XScreenNumberOfScreen().

newtype Display #

pointer to an X11 Display structure

Constructors

Display (Ptr Display) 

Instances

Instances details
Eq Display 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

Data Display 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

toConstr :: Display -> Constr #

dataTypeOf :: Display -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Display 
Instance details

Defined in Graphics.X11.Xlib.Types

Show Display 
Instance details

Defined in Graphics.X11.Xlib.Types

data Screen #

pointer to an X11 Screen structure

Instances

Instances details
Eq Screen 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

Data Screen 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

toConstr :: Screen -> Constr #

dataTypeOf :: Screen -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Screen 
Instance details

Defined in Graphics.X11.Xlib.Types

Show Screen 
Instance details

Defined in Graphics.X11.Xlib.Types

data Visual #

pointer to an X11 Visual structure

Instances

Instances details
Eq Visual 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

Data Visual 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

toConstr :: Visual -> Constr #

dataTypeOf :: Visual -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Visual 
Instance details

Defined in Graphics.X11.Xlib.Types

Show Visual 
Instance details

Defined in Graphics.X11.Xlib.Types

data GC #

pointer to an X11 GC structure

Instances

Instances details
Eq GC 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

Data GC 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

toConstr :: GC -> Constr #

dataTypeOf :: GC -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord GC 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

compare :: GC -> GC -> Ordering #

(<) :: GC -> GC -> Bool #

(<=) :: GC -> GC -> Bool #

(>) :: GC -> GC -> Bool #

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

max :: GC -> GC -> GC #

min :: GC -> GC -> GC #

Show GC 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> GC -> ShowS #

show :: GC -> String #

showList :: [GC] -> ShowS #

data SetWindowAttributes #

pointer to an X11 XSetWindowAttributes structure

Instances

Instances details
Eq SetWindowAttributes 
Instance details

Defined in Graphics.X11.Xlib.Types

Data SetWindowAttributes 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

toConstr :: SetWindowAttributes -> Constr #

dataTypeOf :: SetWindowAttributes -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SetWindowAttributes 
Instance details

Defined in Graphics.X11.Xlib.Types

Show SetWindowAttributes 
Instance details

Defined in Graphics.X11.Xlib.Types

data Image #

pointer to an X11 XImage structure

Instances

Instances details
Eq Image 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

Data Image 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

toConstr :: Image -> Constr #

dataTypeOf :: Image -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Image 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

compare :: Image -> Image -> Ordering #

(<) :: Image -> Image -> Bool #

(<=) :: Image -> Image -> Bool #

(>) :: Image -> Image -> Bool #

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

max :: Image -> Image -> Image #

min :: Image -> Image -> Image #

Show Image 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> Image -> ShowS #

show :: Image -> String #

showList :: [Image] -> ShowS #

type Pixel = Word64 #

type Angle = CInt #

type Buffer = CInt #

data Point #

counterpart of an X11 XPoint structure

Constructors

Point 

Fields

Instances

Instances details
Eq Point 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

Data Point 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

toConstr :: Point -> Constr #

dataTypeOf :: Point -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Point 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> Point -> ShowS #

show :: Point -> String #

showList :: [Point] -> ShowS #

Storable Point 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

sizeOf :: Point -> Int #

alignment :: Point -> Int #

peekElemOff :: Ptr Point -> Int -> IO Point #

pokeElemOff :: Ptr Point -> Int -> Point -> IO () #

peekByteOff :: Ptr b -> Int -> IO Point #

pokeByteOff :: Ptr b -> Int -> Point -> IO () #

peek :: Ptr Point -> IO Point #

poke :: Ptr Point -> Point -> IO () #

data Rectangle #

counterpart of an X11 XRectangle structure

Instances

Instances details
Eq Rectangle 
Instance details

Defined in Graphics.X11.Xlib.Types

Data Rectangle 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

toConstr :: Rectangle -> Constr #

dataTypeOf :: Rectangle -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Rectangle 
Instance details

Defined in Graphics.X11.Xlib.Types

Show Rectangle 
Instance details

Defined in Graphics.X11.Xlib.Types

Storable Rectangle 
Instance details

Defined in Graphics.X11.Xlib.Types

data Arc #

counterpart of an X11 XArc structure

Instances

Instances details
Eq Arc 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

Show Arc 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> Arc -> ShowS #

show :: Arc -> String #

showList :: [Arc] -> ShowS #

Storable Arc 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

sizeOf :: Arc -> Int #

alignment :: Arc -> Int #

peekElemOff :: Ptr Arc -> Int -> IO Arc #

pokeElemOff :: Ptr Arc -> Int -> Arc -> IO () #

peekByteOff :: Ptr b -> Int -> IO Arc #

pokeByteOff :: Ptr b -> Int -> Arc -> IO () #

peek :: Ptr Arc -> IO Arc #

poke :: Ptr Arc -> Arc -> IO () #

data Segment #

counterpart of an X11 XSegment structure

Constructors

Segment 

Instances

Instances details
Eq Segment 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

Data Segment 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

toConstr :: Segment -> Constr #

dataTypeOf :: Segment -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Segment 
Instance details

Defined in Graphics.X11.Xlib.Types

Storable Segment 
Instance details

Defined in Graphics.X11.Xlib.Types

data Color #

counterpart of an X11 XColor structure

Instances

Instances details
Eq Color 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

Data Color 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

toConstr :: Color -> Constr #

dataTypeOf :: Color -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Color 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> Color -> ShowS #

show :: Color -> String #

showList :: [Color] -> ShowS #

Storable Color 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

sizeOf :: Color -> Int #

alignment :: Color -> Int #

peekElemOff :: Ptr Color -> Int -> IO Color #

pokeElemOff :: Ptr Color -> Int -> Color -> IO () #

peekByteOff :: Ptr b -> Int -> IO Color #

pokeByteOff :: Ptr b -> Int -> Color -> IO () #

peek :: Ptr Color -> IO Color #

poke :: Ptr Color -> Color -> IO () #

badGC :: ErrorCode #

Xlib functions with return values of type Status return zero on failure and nonzero on success.

type XID = Word64 #

type Mask = Word64 #

type Atom = Word64 #

type Time = Word64 #

type Window = XID #

type Drawable = XID #

type Font = XID #

type Pixmap = XID #

type Cursor = XID #

type Colormap = XID #

type GContext = XID #

type KeyCode = Word8 #

type KeySym = XID #

type Button = Word32 #

type Place = CInt #

Place of window relative to siblings (used in Circulation requests or events)

type Protocol = CInt #

type GrabMode = CInt #

type Status = CInt #

type CapStyle = CInt #

type FillRule = CInt #

type ArcMode = CInt #

type GCMask = CInt #

type SizeID = Word16 #

type RRCrtc = Word64 #

type RRMode = Word64 #

(.|.) :: Bits a => a -> a -> a infixl 5 #

Bitwise "or"

class Monad m => MonadState s (m :: Type -> Type) | m -> s where #

Minimal definition is either both of get and put or just state

Minimal complete definition

state | get, put

Methods

get :: m s #

Return the state from the internals of the monad.

put :: s -> m () #

Replace the state inside the monad.

state :: (s -> (a, s)) -> m a #

Embed a simple state action into the monad.

Instances

Instances details
MonadState XState X Source # 
Instance details

Defined in XMonad.Core

Methods

get :: X XState #

put :: XState -> X () #

state :: (XState -> (a, XState)) -> X a #

MonadState s m => MonadState s (MaybeT m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: MaybeT m s #

put :: s -> MaybeT m () #

state :: (s -> (a, s)) -> MaybeT m a #

MonadState s m => MonadState s (ListT m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: ListT m s #

put :: s -> ListT m () #

state :: (s -> (a, s)) -> ListT m a #

MonadState s m => MonadState s (ReaderT r m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: ReaderT r m s #

put :: s -> ReaderT r m () #

state :: (s -> (a, s)) -> ReaderT r m a #

Monad m => MonadState s (StateT s m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: StateT s m s #

put :: s -> StateT s m () #

state :: (s -> (a, s)) -> StateT s m a #

(Monoid w, MonadState s m) => MonadState s (WriterT w m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: WriterT w m s #

put :: s -> WriterT w m () #

state :: (s -> (a, s)) -> WriterT w m a #

(Monoid w, MonadState s m) => MonadState s (WriterT w m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: WriterT w m s #

put :: s -> WriterT w m () #

state :: (s -> (a, s)) -> WriterT w m a #

Monad m => MonadState s (StateT s m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: StateT s m s #

put :: s -> StateT s m () #

state :: (s -> (a, s)) -> StateT s m a #

MonadState s m => MonadState s (IdentityT m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: IdentityT m s #

put :: s -> IdentityT m () #

state :: (s -> (a, s)) -> IdentityT m a #

MonadState s m => MonadState s (ExceptT e m)

Since: mtl-2.2

Instance details

Defined in Control.Monad.State.Class

Methods

get :: ExceptT e m s #

put :: s -> ExceptT e m () #

state :: (s -> (a, s)) -> ExceptT e m a #

(Error e, MonadState s m) => MonadState s (ErrorT e m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: ErrorT e m s #

put :: s -> ErrorT e m () #

state :: (s -> (a, s)) -> ErrorT e m a #

MonadState s m => MonadState s (ContT r m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: ContT r m s #

put :: s -> ContT r m () #

state :: (s -> (a, s)) -> ContT r m a #

(Monad m, Monoid w) => MonadState s (RWST r w s m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: RWST r w s m s #

put :: s -> RWST r w s m () #

state :: (s -> (a, s)) -> RWST r w s m a #

(Monad m, Monoid w) => MonadState s (RWST r w s m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: RWST r w s m s #

put :: s -> RWST r w s m () #

state :: (s -> (a, s)) -> RWST r w s m a #

gets :: MonadState s m => (s -> a) -> m a #

Gets specific component of the state, using a projection function supplied.

modify :: MonadState s m => (s -> s) -> m () #

Monadic state transformer.

Maps an old state to a new state inside a state monad. The old state is thrown away.

     Main> :t modify ((+1) :: Int -> Int)
     modify (...) :: (MonadState Int a) => a ()

This says that modify (+1) acts over any Monad that is a member of the MonadState class, with an Int state.

class Monad m => MonadReader r (m :: Type -> Type) | m -> r where #

See examples in Control.Monad.Reader. Note, the partially applied function type (->) r is a simple reader monad. See the instance declaration below.

Minimal complete definition

(ask | reader), local

Methods

ask :: m r #

Retrieves the monad environment.

local #

Arguments

:: (r -> r)

The function to modify the environment.

-> m a

Reader to run in the modified environment.

-> m a 

Executes a computation in a modified environment.

reader #

Arguments

:: (r -> a)

The selector function to apply to the environment.

-> m a 

Retrieves a function of the current environment.

Instances

Instances details
MonadReader Window Query Source # 
Instance details

Defined in XMonad.Core

Methods

ask :: Query Window #

local :: (Window -> Window) -> Query a -> Query a #

reader :: (Window -> a) -> Query a #

MonadReader XConf X Source # 
Instance details

Defined in XMonad.Core

Methods

ask :: X XConf #

local :: (XConf -> XConf) -> X a -> X a #

reader :: (XConf -> a) -> X a #

MonadReader r m => MonadReader r (MaybeT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: MaybeT m r #

local :: (r -> r) -> MaybeT m a -> MaybeT m a #

reader :: (r -> a) -> MaybeT m a #

MonadReader r m => MonadReader r (ListT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ListT m r #

local :: (r -> r) -> ListT m a -> ListT m a #

reader :: (r -> a) -> ListT m a #

Monad m => MonadReader r (ReaderT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ReaderT r m r #

local :: (r -> r) -> ReaderT r m a -> ReaderT r m a #

reader :: (r -> a) -> ReaderT r m a #

(Monoid w, MonadReader r m) => MonadReader r (WriterT w m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: WriterT w m r #

local :: (r -> r) -> WriterT w m a -> WriterT w m a #

reader :: (r -> a) -> WriterT w m a #

(Monoid w, MonadReader r m) => MonadReader r (WriterT w m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: WriterT w m r #

local :: (r -> r) -> WriterT w m a -> WriterT w m a #

reader :: (r -> a) -> WriterT w m a #

MonadReader r m => MonadReader r (StateT s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: StateT s m r #

local :: (r -> r) -> StateT s m a -> StateT s m a #

reader :: (r -> a) -> StateT s m a #

MonadReader r m => MonadReader r (StateT s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: StateT s m r #

local :: (r -> r) -> StateT s m a -> StateT s m a #

reader :: (r -> a) -> StateT s m a #

MonadReader r m => MonadReader r (IdentityT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: IdentityT m r #

local :: (r -> r) -> IdentityT m a -> IdentityT m a #

reader :: (r -> a) -> IdentityT m a #

MonadReader r m => MonadReader r (ExceptT e m)

Since: mtl-2.2

Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ExceptT e m r #

local :: (r -> r) -> ExceptT e m a -> ExceptT e m a #

reader :: (r -> a) -> ExceptT e m a #

(Error e, MonadReader r m) => MonadReader r (ErrorT e m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ErrorT e m r #

local :: (r -> r) -> ErrorT e m a -> ErrorT e m a #

reader :: (r -> a) -> ErrorT e m a #

MonadReader r ((->) r :: Type -> Type) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: r -> r #

local :: (r -> r) -> (r -> a) -> r -> a #

reader :: (r -> a) -> r -> a #

MonadReader r' m => MonadReader r' (ContT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ContT r m r' #

local :: (r' -> r') -> ContT r m a -> ContT r m a #

reader :: (r' -> a) -> ContT r m a #

(Monad m, Monoid w) => MonadReader r (RWST r w s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: RWST r w s m r #

local :: (r -> r) -> RWST r w s m a -> RWST r w s m a #

reader :: (r -> a) -> RWST r w s m a #

(Monad m, Monoid w) => MonadReader r (RWST r w s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: RWST r w s m r #

local :: (r -> r) -> RWST r w s m a -> RWST r w s m a #

reader :: (r -> a) -> RWST r w s m a #

asks #

Arguments

:: MonadReader r m 
=> (r -> a)

The selector function to apply to the environment.

-> m a 

Retrieves a function of the current environment.

class Monad m => MonadIO (m :: Type -> Type) where #

Monads in which IO computations may be embedded. Any monad built by applying a sequence of monad transformers to the IO monad will be an instance of this class.

Instances should satisfy the following laws, which state that liftIO is a transformer of monads:

Methods

liftIO :: IO a -> m a #

Lift a computation from the IO monad.

Instances

Instances details
MonadIO IO

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.IO.Class

Methods

liftIO :: IO a -> IO a #

MonadIO Query Source # 
Instance details

Defined in XMonad.Core

Methods

liftIO :: IO a -> Query a #

MonadIO X Source # 
Instance details

Defined in XMonad.Core

Methods

liftIO :: IO a -> X a #

(Error e, MonadIO m) => MonadIO (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

liftIO :: IO a -> ErrorT e m a #

MonadIO m => MonadIO (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

liftIO :: IO a -> ReaderT r m a #

MonadIO m => MonadIO (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

liftIO :: IO a -> StateT s m a #