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

XMonad

Description

 

Documentation

doBlue :: Word8 #

doGreen :: Word8 #

doRed :: Word8 #

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

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

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

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

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 #

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

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

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

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 #

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

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 #

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

type AllowEvents = CInt #

type ArcMode = CInt #

type Atom = Word32 #

type BackingStore = CInt #

type BitGravity = CInt #

type Button = Word32 #

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 KeySym = XID #

type LineStyle = CInt #

type MappingRequest = CInt #

type Mask = Word32 #

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 = Word32 #

type RRMode = Word32 #

type RROutput = Word32 #

type Reflection = Word16 #

type Rotation = Word16 #

type SizeID = Word16 #

type Status = CInt #

type SubWindowMode = CInt #

type SubpixelOrder = Word16 #

type Time = Word32 #

type Visibility = CInt #

type VisualID = Word32 #

type Window = XID #

type WindowClass = CInt #

type WindowGravity = CInt #

type XID = Word32 #

type XRRModeFlags = Word32 #

type QueuedMode = CInt #

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

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

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

Show XEvent 
Instance details

Defined in Graphics.X11.Xlib.Event

Methods

showsPrec :: Int -> XEvent -> ShowS

show :: XEvent -> String

showList :: [XEvent] -> ShowS

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

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

data FontStruct #

Instances

Instances details
Eq FontStruct 
Instance details

Defined in Graphics.X11.Xlib.Font

Methods

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

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

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

Methods

showsPrec :: Int -> FontStruct -> ShowS

show :: FontStruct -> String

showList :: [FontStruct] -> ShowS

type Glyph = Word16 #

type AllowExposuresMode = CInt #

type PreferBlankingMode = CInt #

type ScreenSaverMode = CInt #

type VisualInfoMask = CLong #

type RectInRegionResult = CInt #

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

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

Show Region 
Instance details

Defined in Graphics.X11.Xlib.Region

Methods

showsPrec :: Int -> Region -> ShowS

show :: Region -> String

showList :: [Region] -> ShowS

type Angle = CInt #

data Arc #

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

type Buffer = CInt #

data Color #

Constructors

Color 

Fields

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

type Dimension = Word32 #

newtype Display #

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

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

Show Display 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> Display -> ShowS

show :: Display -> String

showList :: [Display] -> ShowS

data GC #

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

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 = Word32 #

data Point #

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

type Position = Int32 #

data Rectangle #

Instances

Instances details
Eq Rectangle 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

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

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

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

data Screen #

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

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

Show Screen 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> Screen -> ShowS

show :: Screen -> String

showList :: [Screen] -> ShowS

type ScreenNumber = Word32 #

data Segment #

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

Methods

showsPrec :: Int -> Segment -> ShowS

show :: Segment -> String

showList :: [Segment] -> ShowS

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

data SetWindowAttributes #

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

Methods

showsPrec :: Int -> SetWindowAttributes -> ShowS

show :: SetWindowAttributes -> String

showList :: [SetWindowAttributes] -> ShowS

data Visual #

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

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

Show Visual 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

showsPrec :: Int -> Visual -> ShowS

show :: Visual -> String

showList :: [Visual] -> ShowS

data VisualInfo #

Instances

Instances details
Eq VisualInfo 
Instance details

Defined in Graphics.X11.Xlib.Types

Methods

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

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

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 #

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

(.|.) :: 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 #

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

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 #

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) 
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 :: 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 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 (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

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

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

Defined in Control.Monad.Trans.Reader

Methods

liftIO :: IO a -> ReaderT r m 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 #