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

XMonad

Description

 

Documentation

data Rectangle #

Instances

Instances details
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

Storable Rectangle 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

sizeOf :: Rectangle -> Int

alignment :: Rectangle -> Int

peekElemOff :: Ptr Rectangle -> Int -> IO Rectangle

pokeElemOff :: Ptr Rectangle -> Int -> Rectangle -> IO ()

peekByteOff :: Ptr b -> Int -> IO Rectangle

pokeByteOff :: Ptr b -> Int -> Rectangle -> IO ()

peek :: Ptr Rectangle -> IO Rectangle

poke :: Ptr Rectangle -> Rectangle -> IO ()

Read Rectangle 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

readsPrec :: Int -> ReadS Rectangle

readList :: ReadS [Rectangle]

readPrec :: ReadPrec Rectangle

readListPrec :: ReadPrec [Rectangle]

Show Rectangle 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> Rectangle -> ShowS

show :: Rectangle -> String

showList :: [Rectangle] -> ShowS

Eq Rectangle 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

(==) :: Rectangle -> Rectangle -> Bool

(/=) :: Rectangle -> Rectangle -> Bool

newtype Display #

Constructors

Display (Ptr Display) 

Instances

Instances details
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

Show Display 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> Display -> ShowS

show :: Display -> String

showList :: [Display] -> ShowS

Eq Display 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

Ord Display 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

compare :: Display -> Display -> Ordering

(<) :: Display -> Display -> Bool

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

(>) :: Display -> Display -> Bool

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

max :: Display -> Display -> Display

min :: Display -> Display -> Display

type Window = XID #

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

data Screen #

Instances

Instances details
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

Show Screen 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> Screen -> ShowS

show :: Screen -> String

showList :: [Screen] -> ShowS

Eq Screen 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

Ord Screen 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

compare :: Screen -> Screen -> Ordering

(<) :: Screen -> Screen -> Bool

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

(>) :: Screen -> Screen -> Bool

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

max :: Screen -> Screen -> Screen

min :: Screen -> Screen -> Screen

type Position = Int32 #

type Pixel = Word64 #

type KeySym = XID #

type Button = Word32 #

type Dimension = Word32 #

type Atom = Word64 #

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

type AllowEvents = CInt #

type ArcMode = CInt #

type BackingStore = CInt #

type BitGravity = CInt #

type ByteOrder = CInt #

type CapStyle = CInt #

type ChangeSaveSetMode = CInt #

type CloseDownMode = CInt #

type Colormap = XID #

type ColormapAlloc = CInt #

type Connection = Word16 #

type CoordinateMode = CInt #

type Cursor = XID #

type Drawable = XID #

type ErrorCode = CInt #

type EventType = Word32 #

type FillRule = CInt #

type FillStyle = CInt #

type FocusMode = CInt #

type Font = XID #

type FontDirection = CInt #

type GCMask = CInt #

type GContext = XID #

type GXFunction = CInt #

type GrabMode = CInt #

type GrabStatus = CInt #

type ImageFormat = CInt #

type JoinStyle = CInt #

type KeyCode = Word8 #

type LineStyle = CInt #

type MappingRequest = CInt #

type Mask = Word64 #

type Modifier = CUInt #

type NotifyDetail = CInt #

type NotifyMode = CInt #

type Pixmap = XID #

type Place = CInt #

type PolygonShape = CInt #

type Protocol = CInt #

type QueryBestSizeClass = CInt #

type RRCrtc = Word64 #

type RRMode = Word64 #

type RROutput = Word64 #

type Reflection = Word16 #

type Rotation = Word16 #

type SizeID = Word16 #

type Status = CInt #

type SubWindowMode = CInt #

type SubpixelOrder = Word16 #

type Time = Word64 #

type Visibility = CInt #

type VisualID = Word64 #

type WindowClass = CInt #

type WindowGravity = CInt #

type XID = Word64 #

type XRRModeFlags = Word64 #

doBlue :: Word8 #

doGreen :: Word8 #

doRed :: Word8 #

throwIfZero :: String -> IO Status -> IO () #

getAtomName :: Display -> Atom -> IO (Maybe String) #

getAtomNames :: Display -> [Atom] -> IO [String] #

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

closeDisplay :: Display -> IO () #

displayString :: Display -> String #

noOp :: Display -> IO () #

openDisplay :: String -> IO Display #

qLength :: Display -> IO CInt #

screenCount :: Display -> CInt #

serverVendor :: Display -> String #

type QueuedMode = CInt #

type XButtonEvent = (Window, Window, Time, CInt, CInt, CInt, CInt, Modifier, Button, Bool) #

newtype XEvent #

Constructors

XEvent XEventPtr 

Instances

Instances details
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

Show XEvent 
Instance details

Defined in Graphics.X11.Xlib.Event

Methods

showsPrec :: Int -> XEvent -> ShowS

show :: XEvent -> String

showList :: [XEvent] -> ShowS

Eq XEvent 
Instance details

Defined in Graphics.X11.Xlib.Event

Methods

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

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

Ord XEvent 
Instance details

Defined in Graphics.X11.Xlib.Event

Methods

compare :: XEvent -> XEvent -> Ordering

(<) :: XEvent -> XEvent -> Bool

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

(>) :: XEvent -> XEvent -> Bool

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

max :: XEvent -> XEvent -> XEvent

min :: XEvent -> XEvent -> XEvent

type XEventPtr = Ptr XEvent #

type XKeyEvent = (Window, Window, Time, CInt, CInt, CInt, CInt, Modifier, KeyCode, Bool) #

type XMotionEvent = (Window, Window, Time, CInt, CInt, CInt, CInt, Modifier, NotifyMode, Bool) #

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

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

flush :: Display -> IO () #

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

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

pending :: Display -> IO CInt #

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

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

type CharStruct = (CInt, CInt, CInt, CInt, CInt) #

data FontStruct #

Instances

Instances details
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

Show FontStruct 
Instance details

Defined in Graphics.X11.Xlib.Font

Methods

showsPrec :: Int -> FontStruct -> ShowS

show :: FontStruct -> String

showList :: [FontStruct] -> ShowS

Eq FontStruct 
Instance details

Defined in Graphics.X11.Xlib.Font

Methods

(==) :: FontStruct -> FontStruct -> Bool

(/=) :: FontStruct -> FontStruct -> Bool

Ord FontStruct 
Instance details

Defined in Graphics.X11.Xlib.Font

type Glyph = Word16 #

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

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

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

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

textWidth :: FontStruct -> String -> Int32 #

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

destroyImage :: Image -> IO () #

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

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

xGetPixel :: Image -> CInt -> CInt -> IO CULong #

type AllowExposuresMode = CInt #

type PreferBlankingMode = CInt #

type ScreenSaverMode = CInt #

type VisualInfoMask = CLong #

autoRepeatOff :: Display -> IO () #

autoRepeatOn :: Display -> IO () #

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

bitmapPad :: Display -> CInt #

bitmapUnit :: Display -> CInt #

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

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

displayName :: String -> String #

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

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

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

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

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

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

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

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

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

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

fetchBytes :: Display -> IO String #

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

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

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

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

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

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

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

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

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

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

grabServer :: Display -> IO () #

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

keysymToString :: KeySym -> String #

lockDisplay :: Display -> IO () #

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

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

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

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

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

rmInitialize :: IO () #

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

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

setLocaleModifiers :: String -> IO String #

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

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

set_save_under :: Ptr SetWindowAttributes -> Bool -> IO () #

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

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

stringToKeysym :: String -> KeySym #

supportsLocale :: IO Bool #

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

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

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

ungrabServer :: Display -> IO () #

unlockDisplay :: Display -> IO () #

type RectInRegionResult = CInt #

data Region #

Instances

Instances details
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

Show Region 
Instance details

Defined in Graphics.X11.Xlib.Region

Methods

showsPrec :: Int -> Region -> ShowS

show :: Region -> String

showList :: [Region] -> ShowS

Eq Region 
Instance details

Defined in Graphics.X11.Xlib.Region

Methods

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

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

Ord Region 
Instance details

Defined in Graphics.X11.Xlib.Region

Methods

compare :: Region -> Region -> Ordering

(<) :: Region -> Region -> Bool

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

(>) :: Region -> Region -> Bool

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

max :: Region -> Region -> Region

min :: Region -> Region -> Region

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

emptyRegion :: Region -> IO Bool #

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

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

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

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

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

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

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

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

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

type Angle = CInt #

data Arc #

Instances

Instances details
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 ()

Show Arc 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> Arc -> ShowS

show :: Arc -> String

showList :: [Arc] -> ShowS

Eq Arc 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

type Buffer = CInt #

data Color #

Constructors

Color 

Fields

Instances

Instances details
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

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 ()

Show Color 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> Color -> ShowS

show :: Color -> String

showList :: [Color] -> ShowS

Eq Color 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

data GC #

Instances

Instances details
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

Show GC 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> GC -> ShowS

show :: GC -> String

showList :: [GC] -> ShowS

Eq GC 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

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

data Image #

Instances

Instances details
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

Show Image 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> Image -> ShowS

show :: Image -> String

showList :: [Image] -> ShowS

Eq Image 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

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

data Point #

Constructors

Point 

Fields

Instances

Instances details
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

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 ()

Show Point 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> Point -> ShowS

show :: Point -> String

showList :: [Point] -> ShowS

Eq Point 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

type ScreenNumber = Word32 #

data Segment #

Constructors

Segment 

Instances

Instances details
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

Storable Segment 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

sizeOf :: Segment -> Int

alignment :: Segment -> Int

peekElemOff :: Ptr Segment -> Int -> IO Segment

pokeElemOff :: Ptr Segment -> Int -> Segment -> IO ()

peekByteOff :: Ptr b -> Int -> IO Segment

pokeByteOff :: Ptr b -> Int -> Segment -> IO ()

peek :: Ptr Segment -> IO Segment

poke :: Ptr Segment -> Segment -> IO ()

Show Segment 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> Segment -> ShowS

show :: Segment -> String

showList :: [Segment] -> ShowS

Eq Segment 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

data SetWindowAttributes #

Instances

Instances details
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

Show SetWindowAttributes 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> SetWindowAttributes -> ShowS

show :: SetWindowAttributes -> String

showList :: [SetWindowAttributes] -> ShowS

Eq SetWindowAttributes 
Instance details

Defined in Graphics.X11.Xlib.Types

Ord SetWindowAttributes 
Instance details

Defined in Graphics.X11.Xlib.Types

data Visual #

Instances

Instances details
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

Show Visual 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> Visual -> ShowS

show :: Visual -> String

showList :: [Visual] -> ShowS

Eq Visual 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

Ord Visual 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

compare :: Visual -> Visual -> Ordering

(<) :: Visual -> Visual -> Bool

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

(>) :: Visual -> Visual -> Bool

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

max :: Visual -> Visual -> Visual

min :: Visual -> Visual -> Visual

data VisualInfo #

Instances

Instances details
Storable VisualInfo 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

sizeOf :: VisualInfo -> Int

alignment :: VisualInfo -> Int

peekElemOff :: Ptr VisualInfo -> Int -> IO VisualInfo

pokeElemOff :: Ptr VisualInfo -> Int -> VisualInfo -> IO ()

peekByteOff :: Ptr b -> Int -> IO VisualInfo

pokeByteOff :: Ptr b -> Int -> VisualInfo -> IO ()

peek :: Ptr VisualInfo -> IO VisualInfo

poke :: Ptr VisualInfo -> VisualInfo -> IO ()

Show VisualInfo 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> VisualInfo -> ShowS

show :: VisualInfo -> String

showList :: [VisualInfo] -> ShowS

Default VisualInfo 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

def :: VisualInfo #

Eq VisualInfo 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

(==) :: VisualInfo -> VisualInfo -> Bool

(/=) :: VisualInfo -> VisualInfo -> Bool

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

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

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

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

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

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

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

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

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

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

data WindowAttributes #

Instances

Instances details
Storable WindowAttributes 
Instance details

Defined in Graphics.X11.Xlib.Extras

data Event #

Constructors

AnyEvent 
ConfigureRequestEvent 

Fields

ConfigureEvent 

Fields

MapRequestEvent 
KeyEvent 

Fields

ButtonEvent 

Fields

MotionEvent 

Fields

DestroyWindowEvent 
UnmapEvent 
MapNotifyEvent 
MappingNotifyEvent 
CrossingEvent 

Fields

SelectionRequest 
SelectionClear 
PropertyEvent 
ExposeEvent 

Fields

FocusChangeEvent 
ClientMessageEvent 
RRScreenChangeNotifyEvent 
RRNotifyEvent 
RRCrtcChangeNotifyEvent 

Fields

RROutputChangeNotifyEvent 
RROutputPropertyNotifyEvent 
ScreenSaverNotifyEvent 

Fields

Instances

Instances details
Show Event 
Instance details

Defined in Graphics.X11.Xlib.Extras

Methods

showsPrec :: Int -> Event -> ShowS

show :: Event -> String

showList :: [Event] -> ShowS

Message Event Source # 
Instance details

Defined in XMonad.Core

xFree :: Ptr a -> IO CInt #

newtype FontSet #

Constructors

FontSet (Ptr FontSet) 

Instances

Instances details
Show FontSet 
Instance details

Defined in Graphics.X11.Xlib.Extras

Methods

showsPrec :: Int -> FontSet -> ShowS

show :: FontSet -> String

showList :: [FontSet] -> ShowS

Eq FontSet 
Instance details

Defined in Graphics.X11.Xlib.Extras

Methods

(==) :: FontSet -> FontSet -> Bool

(/=) :: FontSet -> FontSet -> Bool

Ord FontSet 
Instance details

Defined in Graphics.X11.Xlib.Extras

Methods

compare :: FontSet -> FontSet -> Ordering

(<) :: FontSet -> FontSet -> Bool

(<=) :: FontSet -> FontSet -> Bool

(>) :: FontSet -> FontSet -> Bool

(>=) :: FontSet -> FontSet -> Bool

max :: FontSet -> FontSet -> FontSet

min :: FontSet -> FontSet -> FontSet

data SizeHints #

Instances

Instances details
Storable SizeHints 
Instance details

Defined in Graphics.X11.Xlib.Extras

Methods

sizeOf :: SizeHints -> Int

alignment :: SizeHints -> Int

peekElemOff :: Ptr SizeHints -> Int -> IO SizeHints

pokeElemOff :: Ptr SizeHints -> Int -> SizeHints -> IO ()

peekByteOff :: Ptr b -> Int -> IO SizeHints

pokeByteOff :: Ptr b -> Int -> SizeHints -> IO ()

peek :: Ptr SizeHints -> IO SizeHints

poke :: Ptr SizeHints -> SizeHints -> IO ()

data TextProperty #

Constructors

TextProperty 

Fields

Instances

Instances details
Storable TextProperty 
Instance details

Defined in Graphics.X11.Xlib.Extras

Methods

sizeOf :: TextProperty -> Int

alignment :: TextProperty -> Int

peekElemOff :: Ptr TextProperty -> Int -> IO TextProperty

pokeElemOff :: Ptr TextProperty -> Int -> TextProperty -> IO ()

peekByteOff :: Ptr b -> Int -> IO TextProperty

pokeByteOff :: Ptr b -> Int -> TextProperty -> IO ()

peek :: Ptr TextProperty -> IO TextProperty

poke :: Ptr TextProperty -> TextProperty -> IO ()

data WMHints #

Constructors

WMHints 

Instances

Instances details
Storable WMHints 
Instance details

Defined in Graphics.X11.Xlib.Extras

Methods

sizeOf :: WMHints -> Int

alignment :: WMHints -> Int

peekElemOff :: Ptr WMHints -> Int -> IO WMHints

pokeElemOff :: Ptr WMHints -> Int -> WMHints -> IO ()

peekByteOff :: Ptr b -> Int -> IO WMHints

pokeByteOff :: Ptr b -> Int -> WMHints -> IO ()

peek :: Ptr WMHints -> IO WMHints

poke :: Ptr WMHints -> WMHints -> IO ()

data WindowChanges #

Constructors

WindowChanges 

Fields

Instances

Instances details
Storable WindowChanges 
Instance details

Defined in Graphics.X11.Xlib.Extras

Methods

sizeOf :: WindowChanges -> Int

alignment :: WindowChanges -> Int

peekElemOff :: Ptr WindowChanges -> Int -> IO WindowChanges

pokeElemOff :: Ptr WindowChanges -> Int -> WindowChanges -> IO ()

peekByteOff :: Ptr b -> Int -> IO WindowChanges

pokeByteOff :: Ptr b -> Int -> WindowChanges -> IO ()

peek :: Ptr WindowChanges -> IO WindowChanges

poke :: Ptr WindowChanges -> WindowChanges -> IO ()

rawGetWindowProperty :: Storable a => Int -> Display -> Atom -> Window -> IO (Maybe [a]) #

changeProperty16 :: Display -> Window -> Atom -> Atom -> CInt -> [CShort] -> IO () #

changeProperty32 :: Display -> Window -> Atom -> Atom -> CInt -> [CLong] -> IO () #

changeProperty8 :: Display -> Window -> Atom -> Atom -> CInt -> [CChar] -> IO () #

configureWindow :: Display -> Window -> CULong -> WindowChanges -> IO () #

createFontSet :: Display -> String -> IO ([String], String, FontSet) #

deleteProperty :: Display -> Window -> Atom -> IO () #

eventName :: Event -> String #

eventTable :: [(EventType, String)] #

fetchName :: Display -> Window -> IO (Maybe String) #

freeFontSet :: Display -> FontSet -> IO () #

freeStringList :: Ptr CString -> IO () #

getCommand :: Display -> Window -> IO [String] #

getWindowProperty16 :: Display -> Atom -> Window -> IO (Maybe [CShort]) #

getWindowProperty32 :: Display -> Atom -> Window -> IO (Maybe [CLong]) #

getWindowProperty8 :: Display -> Atom -> Window -> IO (Maybe [CChar]) #

iconicState :: Int #

isCursorKey :: KeySym -> Bool #

isKeypadKey :: KeySym -> Bool #

isPFKey :: KeySym -> Bool #

killClient :: Display -> Window -> IO CInt #

mapRaised :: Display -> Window -> IO CInt #

normalState :: Int #

pAspectBit :: Int #

pMaxSizeBit :: Int #

pMinSizeBit :: Int #

setClientMessageEvent :: XEventPtr -> Window -> Atom -> CInt -> Atom -> Time -> IO () #

setClientMessageEvent' :: XEventPtr -> Window -> Atom -> CInt -> [CInt] -> IO () #

setConfigureEvent :: XEventPtr -> Window -> Window -> CInt -> CInt -> CInt -> CInt -> CInt -> Window -> Bool -> IO () #

setKeyEvent :: XEventPtr -> Window -> Window -> Window -> KeyMask -> KeyCode -> Bool -> IO () #

setSelectionNotify :: XEventPtr -> Window -> Atom -> Atom -> Atom -> Time -> IO () #

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

waIsUnmapped :: CInt #

waIsViewable :: CInt #

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

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

wcFreeStringList :: Ptr CWString -> IO () #

wcTextEscapement :: FontSet -> String -> Int32 #

withServer :: Display -> IO () -> IO () #

xAllocWMHints :: IO (Ptr WMHints) #

xChangeProperty :: Display -> Window -> Atom -> Atom -> CInt -> CInt -> Ptr CUChar -> CInt -> IO Status #

xConfigureWindow :: Display -> Window -> CULong -> Ptr WindowChanges -> IO CInt #

xConvertSelection :: Display -> Atom -> Atom -> Atom -> Window -> Time -> IO () #

xCreateFontSet :: Display -> CString -> Ptr (Ptr CString) -> Ptr CInt -> Ptr CString -> IO (Ptr FontSet) #

xFetchName :: Display -> Window -> Ptr CString -> IO Status #

xFreeModifiermap :: Ptr () -> IO (Ptr CInt) #

xGetCommand :: Display -> Window -> Ptr (Ptr CWString) -> Ptr CInt -> IO Status #

xGetModifierMapping :: Display -> IO (Ptr ()) #

xGetWMHints :: Display -> Window -> IO (Ptr WMHints) #

xGetWMNormalHints :: Display -> Window -> Ptr SizeHints -> Ptr CLong -> IO Status #

xGetWMProtocols :: Display -> Window -> Ptr (Ptr Atom) -> Ptr CInt -> IO Status #

xGetWindowProperty :: Display -> Window -> Atom -> CLong -> CLong -> Bool -> Atom -> Ptr Atom -> Ptr CInt -> Ptr CULong -> Ptr CULong -> Ptr (Ptr CUChar) -> IO Status #

xQueryTree :: Display -> Window -> Ptr Window -> Ptr Window -> Ptr (Ptr Window) -> Ptr CInt -> IO Status #

xRefreshKeyboardMapping :: Ptr () -> IO CInt #

xSetClassHint :: Display -> Window -> Ptr ClassHint -> IO () #

xUnmapWindow :: Display -> Window -> IO CInt #

xwcDrawImageString :: Display -> Drawable -> FontSet -> GC -> Position -> Position -> CWString -> CInt -> IO () #

xwcDrawString :: Display -> Drawable -> FontSet -> GC -> Position -> Position -> CWString -> CInt -> IO () #

xwcTextEscapement :: FontSet -> CWString -> CInt -> IO Int32 #

xwcTextExtents :: FontSet -> CWString -> CInt -> Ptr Rectangle -> Ptr Rectangle -> IO CInt #

xwcTextPropertyToTextList :: Display -> Ptr TextProperty -> Ptr (Ptr CWString) -> Ptr CInt -> IO CInt #

type CXErrorHandler = Display -> XErrorEventPtr -> IO CInt #

data ClassHint #

Constructors

ClassHint 

Fields

data ErrorEvent #

Constructors

ErrorEvent 

Fields

type XErrorEventPtr = Ptr () #

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

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

Minimal complete definition

state | get, put

Methods

get :: m s #

put :: s -> m () #

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

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 #

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

Defined in Control.Monad.State.Class

Methods

get :: AccumT w m s #

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

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

MonadState s m => MonadState s (ExceptT e m) 
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 #

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 (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 #

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

Defined in Control.Monad.State.Class

Methods

get :: SelectT r m s #

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

state :: (s -> (a, s)) -> SelectT 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 #

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 #

(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 #

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 #

(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 #

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

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

Minimal complete definition

(ask | reader), local

Methods

ask :: m r #

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

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

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 #

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

Defined in Control.Monad.Reader.Class

Methods

ask :: AccumT w m r #

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

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

MonadReader r m => MonadReader r (ExceptT e m) 
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 #

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 #

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 #

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 #

(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 #

(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' (SelectT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: SelectT r m r' #

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

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

MonadReader r ((->) r) 
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 #

(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 :: MonadReader r m => (r -> a) -> m a #

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

Methods

liftIO :: IO a -> m a #

Instances

Instances details
MonadIO IO 
Instance details

Defined in Control.Monad.IO.Class

Methods

liftIO :: IO a -> IO a #

MonadIO Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

liftIO :: IO a -> Q 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 #

MonadIO m => MonadIO (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftIO :: IO a -> MaybeT m a #

(Monoid w, Functor m, MonadIO m) => MonadIO (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

liftIO :: IO a -> AccumT w m a #

MonadIO m => MonadIO (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

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

MonadIO m => MonadIO (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftIO :: IO a -> IdentityT 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 (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

liftIO :: IO a -> SelectT 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 #

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

Defined in Control.Monad.Trans.State.Strict

Methods

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

MonadIO m => MonadIO (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

liftIO :: IO a -> WriterT w m a #

(Monoid w, MonadIO m) => MonadIO (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

liftIO :: IO a -> WriterT w m a #

(Monoid w, MonadIO m) => MonadIO (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

liftIO :: IO a -> WriterT w m a #

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

Defined in Control.Monad.Trans.Cont

Methods

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

MonadIO m => MonadIO (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

Methods

liftIO :: IO a -> RWST r w s m a #

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

Defined in Control.Monad.Trans.RWS.Lazy

Methods

liftIO :: IO a -> RWST r w s m a #

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

Defined in Control.Monad.Trans.RWS.Strict

Methods

liftIO :: IO a -> RWST r w s m a #