| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Dyna.Brick.Run
Contents
Description
IO of thebrick application
Synopsis
- data Spec = Spec {
- spec'attrMap :: AttrMap
- spec'cursor :: [CursorLocation BoxId] -> Maybe (CursorLocation BoxId)
- defSpec :: AttrMap -> Spec
- emptyAttrMap :: AttrMap
- data Run a
- runApp :: Spec -> Run Win -> IO ()
- vtyEvents :: Evt Event
- mouseUp :: Evt MouseUpEvent
- mouseDown :: Evt MouseDownEvent
- keyEvents :: Evt (Key, [Modifier])
- onChar :: Char -> Evt [Modifier]
- onKey :: Key -> Evt [Modifier]
- readChars :: Evt Char
- module Brick
- data Key
- data Modifier
Documentation
Constructors
| Spec | |
Fields
| |
Run application
Instances
| Monad Run Source # | |
| Functor Run Source # | |
| Applicative Run Source # | |
| MonadIO Run Source # | |
Defined in Dyna.Brick.Types | |
| MonadRandom Run Source # | |
Defined in Dyna.Brick.Types | |
| Frp Run Source # | |
| MonadReader Env Run Source # | |
| MonadBase IO Run Source # | |
Defined in Dyna.Brick.Types | |
| MonadBaseControl IO Run Source # | |
| type Ref Run Source # | |
Defined in Dyna.Brick.Types | |
| type StM Run a Source # | |
Defined in Dyna.Brick.Types | |
Sensors
module Brick
Representations of non-modifier keys.
- KFun is indexed from 0 to 63. Range of supported FKeys varies by terminal and keyboard.
- KUpLeft, KUpRight, KDownLeft, KDownRight, KCenter support varies by terminal and keyboard.
- Actually, support for most of these but KEsc, KChar, KBS, and KEnter vary by terminal and keyboard.
Constructors
| KEsc | |
| KChar Char | |
| KBS | |
| KEnter | |
| KLeft | |
| KRight | |
| KUp | |
| KDown | |
| KUpLeft | |
| KUpRight | |
| KDownLeft | |
| KDownRight | |
| KCenter | |
| KFun Int | |
| KBackTab | |
| KPrtScr | |
| KPause | |
| KIns | |
| KHome | |
| KPageUp | |
| KDel | |
| KEnd | |
| KPageDown | |
| KBegin | |
| KMenu |
Instances
Modifier keys. Key codes are interpreted such that users are more
likely to have Meta than Alt; for instance on the PC Linux console,
MMeta will generally correspond to the physical Alt key.
Instances
| Eq Modifier | |
| Ord Modifier | |
Defined in Graphics.Vty.Input.Events | |
| Read Modifier | |
| Show Modifier | |
| Generic Modifier | |
| NFData Modifier | |
Defined in Graphics.Vty.Input.Events | |
| Parse Modifier | |
Defined in Graphics.Vty.Config Methods parseValue :: Parser Modifier | |
| type Rep Modifier | |
Defined in Graphics.Vty.Input.Events type Rep Modifier = D1 ('MetaData "Modifier" "Graphics.Vty.Input.Events" "vty-5.35.1-KZM7sNe0OABAUeGlQIWLj" 'False) ((C1 ('MetaCons "MShift" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MCtrl" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "MMeta" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MAlt" 'PrefixI 'False) (U1 :: Type -> Type))) | |