brick/programs/Main.hs

106 lines
3.2 KiB
Haskell
Raw Normal View History

2015-05-09 09:09:40 +03:00
{-# LANGUAGE OverloadedStrings #-}
2015-05-11 17:55:48 +03:00
{-# LANGUAGE TemplateHaskell #-}
2015-05-09 09:09:40 +03:00
module Main where
2015-05-11 17:55:48 +03:00
import Control.Lens
2015-05-09 19:56:14 +03:00
import Data.Default
2015-05-17 19:22:08 +03:00
import Data.Monoid
import Graphics.Vty hiding (translate)
2015-05-09 09:09:40 +03:00
import System.Exit
2015-05-18 04:41:38 +03:00
import Brick.Main
import Brick.Edit
import Brick.List
import Brick.Core
2015-05-30 04:25:46 +03:00
import Brick.Render
2015-05-18 05:37:25 +03:00
import Brick.Center
2015-05-18 04:41:38 +03:00
import Brick.Border
import Brick.Border.Style
2015-05-18 04:41:38 +03:00
import Brick.Util
2015-05-09 10:18:29 +03:00
2015-05-19 06:59:58 +03:00
styles :: [(String, BorderStyle)]
styles =
2015-05-19 07:01:59 +03:00
[ ("ascii", ascii)
, ("uni", unicode)
, ("uni-bold", unicodeBold)
, ("uni-rounded", unicodeRounded)
2015-05-19 06:59:58 +03:00
]
data St =
2015-05-11 17:55:48 +03:00
St { _stEditor :: Editor
2015-05-19 00:14:13 +03:00
, _stList :: List Int
2015-05-19 06:59:58 +03:00
, _stBorderStyle :: Int
, _stTrans :: Location
}
2015-05-09 10:18:29 +03:00
2015-05-11 17:55:48 +03:00
makeLenses ''St
kw :: String -> Render
kw = useAttr (fg blue) . txt
2015-05-19 07:18:51 +03:00
drawUI :: St -> [Render]
drawUI st = [withBorderStyle bs a]
2015-05-10 00:28:37 +03:00
where
2015-05-19 07:07:55 +03:00
(bsName, bs) = styles !! (st^.stBorderStyle)
box = borderWithLabel bsName $
(hLimit 25 (
vBox [ (vLimit 1 $ useAttr (cyan `on` blue) $ renderEditor (st^.stEditor), High)
, (hBorder, Low)
, (vLimit 10 $ renderList (st^.stList), High)
]
))
a = translateBy (st^.stTrans) $ vCenter $
(hCenter box)
<=> (vLimit 1 $ vPad ' ')
<=> (hCenter (kw "Enter" <+> " adds a list item"))
<=> (hCenter (kw "+" <+> " changes border styles"))
<=> (hCenter (kw "Arrow keys" <+> " navigates the list"))
<=> (hCenter (kw "Ctrl-Arrow keys" <+> " move the interface"))
2015-05-09 09:09:40 +03:00
appEvent :: Event -> St -> IO St
appEvent e st =
2015-05-09 09:09:40 +03:00
case e of
EvKey (KChar '+') [] ->
return $ st & stBorderStyle %~ ((`mod` (length styles)) . (+ 1))
2015-05-19 06:59:58 +03:00
2015-05-17 05:42:25 +03:00
EvKey KEsc [] -> exitSuccess
2015-05-18 18:38:30 +03:00
EvKey KUp [MCtrl] -> return $ st & stTrans %~ (\(Location (w, h)) -> Location (w, h - 1))
EvKey KDown [MCtrl] -> return $ st & stTrans %~ (\(Location (w, h)) -> Location (w, h + 1))
EvKey KLeft [MCtrl] -> return $ st & stTrans %~ (\(Location (w, h)) -> Location (w - 1, h))
EvKey KRight [MCtrl] -> return $ st & stTrans %~ (\(Location (w, h)) -> Location (w + 1, h))
EvKey KEnter [] ->
2015-05-17 20:01:23 +03:00
let el = length $ listElements $ st^.stList
in return $ st & stList %~ (listMoveBy 1 . listInsert el el)
2015-05-18 18:38:30 +03:00
ev -> return $ st & stEditor %~ (handleEvent ev)
& stList %~ (handleEvent ev)
initialState :: St
initialState =
St { _stEditor = editor (Name "edit") ""
, _stList = list (Name "list") listDrawElem []
2015-05-19 06:59:58 +03:00
, _stBorderStyle = 0
, _stTrans = Location (0, 0)
}
listDrawElem :: Bool -> Int -> Render
2015-05-17 19:44:18 +03:00
listDrawElem sel i =
2015-05-17 19:22:08 +03:00
let selAttr = white `on` blue
2015-05-18 18:38:30 +03:00
maybeSelect = if sel
then useAttr selAttr
2015-05-18 18:38:30 +03:00
else id
in maybeSelect $ hCenterWith (Just ' ') $ vBox $ for [1..i+1] $ \j ->
(txt $ "Item " <> show i <> " L" <> show j, High)
2015-05-17 19:22:08 +03:00
2015-05-11 01:51:08 +03:00
theApp :: App St Event
2015-05-11 00:56:58 +03:00
theApp =
2015-05-09 19:56:14 +03:00
def { appDraw = drawUI
2015-05-11 01:42:59 +03:00
, appChooseCursor = showFirstCursor
, appHandleEvent = appEvent
}
2015-05-09 09:09:40 +03:00
main :: IO ()
2015-05-11 01:51:08 +03:00
main = defaultMain theApp initialState