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
|
2015-05-26 04:07:20 +03:00
|
|
|
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
|
2015-06-08 05:40:49 +03:00
|
|
|
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
|
|
|
]
|
|
|
|
|
2015-05-09 10:45:46 +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
|
2015-05-19 07:58:16 +03:00
|
|
|
, _stTrans :: Location
|
2015-05-09 10:45:46 +03:00
|
|
|
}
|
2015-05-09 10:18:29 +03:00
|
|
|
|
2015-05-11 17:55:48 +03:00
|
|
|
makeLenses ''St
|
|
|
|
|
2015-06-08 03:36:50 +03:00
|
|
|
kw :: String -> Render
|
2015-05-26 04:07:20 +03:00
|
|
|
kw = useAttr (fg blue) . txt
|
2015-05-19 07:18:51 +03:00
|
|
|
|
2015-06-08 03:36:50 +03:00
|
|
|
drawUI :: St -> [Render]
|
2015-06-08 05:40:49 +03:00
|
|
|
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)
|
2015-06-08 05:40:49 +03:00
|
|
|
box = borderWithLabel bsName $
|
2015-06-08 04:37:36 +03:00
|
|
|
(hLimit 25 (
|
2015-06-08 05:28:16 +03:00
|
|
|
vBox [ (vLimit 1 $ useAttr (cyan `on` blue) $ renderEditor (st^.stEditor), High)
|
2015-06-08 05:40:49 +03:00
|
|
|
, (hBorder, Low)
|
2015-06-08 05:27:35 +03:00
|
|
|
, (vLimit 10 $ renderList (st^.stList), High)
|
2015-06-08 04:37:36 +03:00
|
|
|
]
|
|
|
|
))
|
2015-06-08 06:37:32 +03:00
|
|
|
a = translateBy (st^.stTrans) $ vCenter $
|
2015-06-08 04:37:36 +03:00
|
|
|
(hCenter box)
|
2015-06-08 06:37:32 +03:00
|
|
|
<=> (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
|
|
|
|
2015-05-17 19:41:17 +03:00
|
|
|
appEvent :: Event -> St -> IO St
|
|
|
|
appEvent e st =
|
2015-05-09 09:09:40 +03:00
|
|
|
case e of
|
2015-05-19 07:09:59 +03:00
|
|
|
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
|
|
|
|
2015-05-19 07:58:16 +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))
|
|
|
|
|
2015-05-17 19:53:00 +03:00
|
|
|
EvKey KEnter [] ->
|
2015-05-17 20:01:23 +03:00
|
|
|
let el = length $ listElements $ st^.stList
|
2015-06-08 05:27:35 +03:00
|
|
|
in return $ st & stList %~ (listMoveBy 1 . listInsert el el)
|
2015-05-18 18:38:30 +03:00
|
|
|
|
2015-05-17 19:41:17 +03:00
|
|
|
ev -> return $ st & stEditor %~ (handleEvent ev)
|
|
|
|
& stList %~ (handleEvent ev)
|
2015-05-09 10:45:46 +03:00
|
|
|
|
|
|
|
initialState :: St
|
|
|
|
initialState =
|
2015-06-08 04:52:04 +03:00
|
|
|
St { _stEditor = editor (Name "edit") ""
|
|
|
|
, _stList = list (Name "list") listDrawElem []
|
2015-05-19 06:59:58 +03:00
|
|
|
, _stBorderStyle = 0
|
2015-05-19 07:58:16 +03:00
|
|
|
, _stTrans = Location (0, 0)
|
2015-05-09 19:14:56 +03:00
|
|
|
}
|
|
|
|
|
2015-06-08 03:36:50 +03:00
|
|
|
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
|
2015-05-26 04:07:20 +03:00
|
|
|
then useAttr selAttr
|
2015-05-18 18:38:30 +03:00
|
|
|
else id
|
2015-06-08 06:38:07 +03:00
|
|
|
in maybeSelect $ hCenterWith (Just ' ') $ vBox $ for [1..i+1] $ \j ->
|
2015-05-26 04:07:20 +03:00
|
|
|
(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
|
2015-05-17 19:41:17 +03:00
|
|
|
, appHandleEvent = appEvent
|
2015-05-09 19:24:59 +03:00
|
|
|
}
|
|
|
|
|
2015-05-09 09:09:40 +03:00
|
|
|
main :: IO ()
|
2015-05-11 01:51:08 +03:00
|
|
|
main = defaultMain theApp initialState
|