For a higher-level API for textual OSDs using Pango, use Graphics.Aosd.Pango.
- class AosdRenderer a where
- toGeneralRenderer :: a -> IO GeneralRenderer
- data GeneralRenderer = GeneralRenderer {}
- data AosdOptions = AosdOptions {
- classHint :: Maybe XClassHint
- transparency :: Maybe Transparency
- xPos :: Position
- yPos :: Position
- offset :: (CInt, CInt)
- hideUponMouseEvent :: Maybe Bool
- mouseEventCB :: Maybe (C'AosdMouseEvent -> IO ())
- data Transparency
- data Position
- data XClassHint = XClassHint {}
- defaultOpts :: AosdOptions
- aosdFlash :: AosdRenderer a => AosdOptions -> a -> FlashDurations -> IO ()
- data FlashDurations = FlashDurations {}
- symDurations :: CUInt -> CUInt -> FlashDurations
- data AosdForeignPtr
- aosdNew :: AosdRenderer renderer => AosdOptions -> renderer -> IO AosdForeignPtr
- aosdDestroy :: AosdForeignPtr -> IO ()
- reconfigure :: AosdRenderer renderer => AosdOptions -> renderer -> AosdForeignPtr -> IO ()
- aosdRender :: AosdForeignPtr -> IO ()
- aosdShow :: AosdForeignPtr -> IO ()
- aosdHide :: AosdForeignPtr -> IO ()
- aosdLoopOnce :: AosdForeignPtr -> IO ()
- aosdLoopFor :: AosdForeignPtr -> CUInt -> IO ()
- debugRenderer :: GeneralRenderer
- module Graphics.Rendering.Cairo
- data Rectangle = Rectangle Int Int Int Int
- data CInt
- data CUInt
Renderers
class AosdRenderer a whereSource
toGeneralRenderer :: a -> IO GeneralRendererSource
data GeneralRenderer Source
GeneralRenderer | |
|
Options
data AosdOptions Source
AosdOptions | |
|
defaultOpts :: AosdOptionsSource
Non-Nothing
defaults:
- transparency = Just Composite,
- xPos = Center,
- yPos = Center,
- offset = (0,0),
- hideUponMouseEvent = Just True
Displaying
aosdFlash :: AosdRenderer a => AosdOptions -> a -> FlashDurations -> IO ()Source
Main high-level displayer. Blocks.
:: CUInt | |
-> CUInt | |
-> FlashDurations |
Construct a FlashDurations
with equal inMillis
and outMillis
.
Low-level operations
data AosdForeignPtr Source
aosdNew :: AosdRenderer renderer => AosdOptions -> renderer -> IO AosdForeignPtrSource
aosdDestroy :: AosdForeignPtr -> IO ()Source
reconfigure :: AosdRenderer renderer => AosdOptions -> renderer -> AosdForeignPtr -> IO ()Source
aosdRender :: AosdForeignPtr -> IO ()Source
aosdShow :: AosdForeignPtr -> IO ()Source
aosdHide :: AosdForeignPtr -> IO ()Source
aosdLoopOnce :: AosdForeignPtr -> IO ()Source
:: AosdForeignPtr | |
-> CUInt | Time in milliseconds. |
-> IO () |
Diagnostics
Reexports
module Graphics.Rendering.Cairo
data Rectangle
Rectangle
- Specifies x, y, width and height
data CInt
Haskell type representing the C int
type.