2015-08-18 03:44:18 +03:00
|
|
|
-- The accounts screen, showing accounts and balances like the CLI balance command.
|
|
|
|
|
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
2015-08-28 08:45:49 +03:00
|
|
|
{-# LANGUAGE RecordWildCards #-}
|
2015-08-18 03:44:18 +03:00
|
|
|
|
|
|
|
module Hledger.UI.AccountsScreen
|
2016-06-08 21:03:49 +03:00
|
|
|
(accountsScreen
|
2016-06-09 09:45:26 +03:00
|
|
|
,asInit
|
2015-10-28 21:35:40 +03:00
|
|
|
,asSetSelectedAccount
|
2015-09-04 06:51:05 +03:00
|
|
|
)
|
2015-08-18 03:44:18 +03:00
|
|
|
where
|
|
|
|
|
2016-06-11 03:50:57 +03:00
|
|
|
import Brick
|
|
|
|
import Brick.Widgets.List
|
|
|
|
import Brick.Widgets.Edit
|
|
|
|
import Brick.Widgets.Border (borderAttr)
|
2015-09-04 19:10:00 +03:00
|
|
|
import Control.Monad.IO.Class (liftIO)
|
2015-08-18 03:44:18 +03:00
|
|
|
import Data.List
|
2015-08-28 08:45:49 +03:00
|
|
|
import Data.Maybe
|
2015-08-25 16:56:04 +03:00
|
|
|
import Data.Monoid
|
lib: textification begins! account names
The first of several conversions from String to (strict) Text, hopefully
reducing space and time usage.
This one shows a small improvement, with GHC 7.10.3 and text-1.2.2.1:
hledger -f data/100x100x10.journal stats
string: <<ghc: 39471064 bytes, 77 GCs, 198421/275048 avg/max bytes residency (3 samples), 2M in use, 0.000 INIT (0.001 elapsed), 0.015 MUT (0.020 elapsed), 0.010 GC (0.014 elapsed) :ghc>>
text: <<ghc: 39268024 bytes, 77 GCs, 197018/270840 avg/max bytes residency (3 samples), 2M in use, 0.000 INIT (0.002 elapsed), 0.016 MUT (0.022 elapsed), 0.009 GC (0.011 elapsed) :ghc>>
hledger -f data/1000x100x10.journal stats
string: <<ghc: 318555920 bytes, 617 GCs, 2178997/7134472 avg/max bytes residency (7 samples), 16M in use, 0.000 INIT (0.001 elapsed), 0.129 MUT (0.136 elapsed), 0.067 GC (0.077 elapsed) :ghc>>
text: <<ghc: 314248496 bytes, 612 GCs, 2074045/6617960 avg/max bytes residency (7 samples), 16M in use, 0.000 INIT (0.003 elapsed), 0.137 MUT (0.145 elapsed), 0.067 GC (0.079 elapsed) :ghc>>
hledger -f data/10000x100x10.journal stats
string: <<ghc: 3114763608 bytes, 6026 GCs, 18858950/75552024 avg/max bytes residency (11 samples), 201M in use, 0.000 INIT (0.000 elapsed), 1.331 MUT (1.372 elapsed), 0.699 GC (0.812 elapsed) :ghc>>
text: <<ghc: 3071468920 bytes, 5968 GCs, 14120344/62951360 avg/max bytes residency (9 samples), 124M in use, 0.000 INIT (0.003 elapsed), 1.272 MUT (1.349 elapsed), 0.513 GC (0.578 elapsed) :ghc>>
hledger -f data/100000x100x10.journal stats
string: <<ghc: 31186579432 bytes, 60278 GCs, 135332581/740228992 avg/max bytes residency (13 samples), 1697M in use, 0.000 INIT (0.008 elapsed), 14.677 MUT (15.508 elapsed), 7.081 GC (8.074 elapsed) :ghc>>
text: <<ghc: 30753427672 bytes, 59763 GCs, 117595958/666457240 avg/max bytes residency (14 samples), 1588M in use, 0.000 INIT (0.008 elapsed), 13.713 MUT (13.966 elapsed), 6.220 GC (7.108 elapsed) :ghc>>
2016-05-24 04:16:21 +03:00
|
|
|
import qualified Data.Text as T
|
2015-08-18 03:44:18 +03:00
|
|
|
import Data.Time.Calendar (Day)
|
|
|
|
import qualified Data.Vector as V
|
2016-06-11 03:30:45 +03:00
|
|
|
import Graphics.Vty
|
2016-06-09 22:41:26 +03:00
|
|
|
import Lens.Micro.Platform
|
2016-06-09 22:42:47 +03:00
|
|
|
import System.Console.ANSI
|
2016-06-11 03:50:57 +03:00
|
|
|
import System.FilePath (takeFileName)
|
2015-08-18 03:44:18 +03:00
|
|
|
|
|
|
|
import Hledger
|
|
|
|
import Hledger.Cli hiding (progname,prognameandversion,green)
|
2015-08-28 22:33:33 +03:00
|
|
|
import Hledger.UI.UIOptions
|
2015-08-18 03:44:18 +03:00
|
|
|
import Hledger.UI.UITypes
|
2016-06-11 03:30:45 +03:00
|
|
|
import Hledger.UI.UIState
|
2015-08-18 03:44:18 +03:00
|
|
|
import Hledger.UI.UIUtils
|
2016-06-08 21:03:49 +03:00
|
|
|
import Hledger.UI.RegisterScreen
|
|
|
|
import Hledger.UI.ErrorScreen
|
2015-08-18 03:44:18 +03:00
|
|
|
|
2016-06-08 21:03:49 +03:00
|
|
|
accountsScreen :: Screen
|
|
|
|
accountsScreen = AccountsScreen{
|
2016-06-09 09:45:26 +03:00
|
|
|
sInit = asInit
|
|
|
|
,sDraw = asDraw
|
|
|
|
,sHandle = asHandle
|
|
|
|
,_asList = list "accounts" V.empty 1
|
|
|
|
,_asSelectedAccount = ""
|
2015-08-18 03:44:18 +03:00
|
|
|
}
|
|
|
|
|
2016-06-11 03:30:45 +03:00
|
|
|
asInit :: Day -> Bool -> UIState -> UIState
|
|
|
|
asInit d reset ui@UIState{
|
2015-08-28 18:07:54 +03:00
|
|
|
aopts=uopts@UIOpts{cliopts_=copts@CliOpts{reportopts_=ropts}},
|
|
|
|
ajournal=j,
|
2016-06-09 01:46:19 +03:00
|
|
|
aScreen=s@AccountsScreen{}
|
2015-08-28 18:07:54 +03:00
|
|
|
} =
|
2016-06-11 03:30:45 +03:00
|
|
|
ui{aopts=uopts', aScreen=s & asList .~ newitems'}
|
2015-08-18 03:44:18 +03:00
|
|
|
where
|
2016-06-08 22:15:58 +03:00
|
|
|
newitems = list (Name "accounts") (V.fromList displayitems) 1
|
2015-08-28 18:07:54 +03:00
|
|
|
|
2016-06-04 02:31:53 +03:00
|
|
|
-- keep the selection near the last selected account
|
|
|
|
-- (may need to move to the next leaf account when entering flat mode)
|
2016-06-08 22:15:58 +03:00
|
|
|
newitems' = listMoveTo selidx newitems
|
2015-10-28 21:13:33 +03:00
|
|
|
where
|
2016-06-09 09:45:26 +03:00
|
|
|
selidx = case (reset, listSelectedElement $ s ^. asList) of
|
2016-06-07 19:26:16 +03:00
|
|
|
(True, _) -> 0
|
|
|
|
(_, Nothing) -> 0
|
2016-06-08 22:15:58 +03:00
|
|
|
(_, Just (_,AccountsScreenItem{asItemAccountName=a})) -> fromMaybe (fromMaybe 0 mprefixmatch) mexactmatch
|
2016-06-04 02:31:53 +03:00
|
|
|
where
|
2016-06-08 22:15:58 +03:00
|
|
|
mexactmatch = findIndex ((a ==) . asItemAccountName) displayitems
|
|
|
|
mprefixmatch = findIndex ((a `isAccountNamePrefixOf`) . asItemAccountName) displayitems
|
2015-09-04 06:40:43 +03:00
|
|
|
uopts' = uopts{cliopts_=copts{reportopts_=ropts'}}
|
|
|
|
ropts' = ropts {
|
|
|
|
-- XXX balanceReport doesn't respect this yet
|
|
|
|
balancetype_=HistoricalBalance
|
|
|
|
}
|
|
|
|
|
2015-08-28 08:45:49 +03:00
|
|
|
q = queryFromOpts d ropts
|
2015-09-04 06:40:43 +03:00
|
|
|
|
2015-08-28 18:07:54 +03:00
|
|
|
-- maybe convert balances to market value
|
|
|
|
convert | value_ ropts' = balanceReportValue j valuedate
|
2015-08-28 08:45:49 +03:00
|
|
|
| otherwise = id
|
2015-08-18 03:44:18 +03:00
|
|
|
where
|
2015-08-28 08:45:49 +03:00
|
|
|
valuedate = fromMaybe d $ queryEndDate False q
|
|
|
|
|
2015-08-28 18:07:54 +03:00
|
|
|
-- run the report
|
|
|
|
(items,_total) = convert $ balanceReport ropts' q j
|
2015-08-28 08:45:49 +03:00
|
|
|
|
2015-08-29 03:55:50 +03:00
|
|
|
-- pre-render the list items
|
|
|
|
displayitem ((fullacct, shortacct, indent), bal) =
|
2016-06-08 22:15:58 +03:00
|
|
|
AccountsScreenItem{asItemIndentLevel = indent
|
|
|
|
,asItemAccountName = fullacct
|
|
|
|
,asItemDisplayAccountName = if flat_ ropts' then fullacct else shortacct
|
|
|
|
,asItemRenderedAmounts = map showAmountWithoutPrice amts -- like showMixedAmountOneLineWithoutPrice
|
|
|
|
}
|
2015-08-29 03:55:50 +03:00
|
|
|
where
|
|
|
|
Mixed amts = normaliseMixedAmountSquashPricesForDisplay $ stripPrices bal
|
|
|
|
stripPrices (Mixed as) = Mixed $ map stripprice as where stripprice a = a{aprice=NoPrice}
|
|
|
|
displayitems = map displayitem items
|
|
|
|
|
|
|
|
|
2016-06-09 09:45:26 +03:00
|
|
|
asInit _ _ _ = error "init function called with wrong screen type, should not happen"
|
2015-08-18 03:44:18 +03:00
|
|
|
|
2016-06-11 03:30:45 +03:00
|
|
|
asDraw :: UIState -> [Widget]
|
|
|
|
asDraw UIState{aopts=UIOpts{cliopts_=CliOpts{reportopts_=ropts}}
|
2016-06-01 22:09:16 +03:00
|
|
|
,ajournal=j
|
2016-06-09 01:46:19 +03:00
|
|
|
,aScreen=s@AccountsScreen{}
|
2016-06-10 18:40:00 +03:00
|
|
|
,aMode=mode
|
|
|
|
} =
|
2016-06-10 21:50:57 +03:00
|
|
|
case mode of
|
|
|
|
Help -> [helpDialog, maincontent]
|
|
|
|
-- Minibuffer e -> [minibuffer e, maincontent]
|
|
|
|
_ -> [maincontent]
|
|
|
|
where
|
|
|
|
toplabel = files
|
|
|
|
<+> nonzero
|
|
|
|
<+> str " accounts"
|
|
|
|
<+> borderQueryStr querystr
|
|
|
|
<+> togglefilters
|
|
|
|
<+> borderDepthStr mdepth
|
|
|
|
<+> str " ("
|
|
|
|
<+> cur
|
|
|
|
<+> str "/"
|
|
|
|
<+> total
|
|
|
|
<+> str ")"
|
|
|
|
files = case journalFilePaths j of
|
|
|
|
[] -> str ""
|
|
|
|
f:_ -> withAttr ("border" <> "bold") $ str $ takeFileName f
|
|
|
|
-- [f,_:[]] -> (withAttr ("border" <> "bold") $ str $ takeFileName f) <+> str " (& 1 included file)"
|
|
|
|
-- f:fs -> (withAttr ("border" <> "bold") $ str $ takeFileName f) <+> str (" (& " ++ show (length fs) ++ " included files)")
|
|
|
|
querystr = query_ ropts
|
|
|
|
mdepth = depth_ ropts
|
|
|
|
togglefilters =
|
|
|
|
case concat [
|
|
|
|
if cleared_ ropts then ["cleared"] else []
|
|
|
|
,if uncleared_ ropts then ["uncleared"] else []
|
|
|
|
,if pending_ ropts then ["pending"] else []
|
|
|
|
,if real_ ropts then ["real"] else []
|
|
|
|
] of
|
|
|
|
[] -> str ""
|
|
|
|
fs -> str " with " <+> withAttr (borderAttr <> "query") (str $ intercalate ", " fs) <+> str " txns"
|
|
|
|
nonzero | empty_ ropts = str ""
|
|
|
|
| otherwise = withAttr (borderAttr <> "query") (str " nonzero")
|
|
|
|
cur = str (case s ^. asList ^. listSelectedL of -- XXX second ^. required here but not below..
|
|
|
|
Nothing -> "-"
|
|
|
|
Just i -> show (i + 1))
|
|
|
|
total = str $ show $ V.length $ s ^. asList . listElementsL
|
|
|
|
maincontent = Widget Greedy Greedy $ do
|
|
|
|
c <- getContext
|
|
|
|
let
|
|
|
|
availwidth =
|
|
|
|
-- ltrace "availwidth" $
|
|
|
|
c^.availWidthL
|
|
|
|
- 2 -- XXX due to margin ? shouldn't be necessary (cf UIUtils)
|
|
|
|
displayitems = s ^. asList . listElementsL
|
|
|
|
maxacctwidthseen =
|
|
|
|
-- ltrace "maxacctwidthseen" $
|
|
|
|
V.maximum $
|
|
|
|
V.map (\AccountsScreenItem{..} -> asItemIndentLevel*2 + textWidth asItemDisplayAccountName) $
|
|
|
|
-- V.filter (\(indent,_,_,_) -> (indent-1) <= fromMaybe 99999 mdepth) $
|
|
|
|
displayitems
|
|
|
|
maxbalwidthseen =
|
|
|
|
-- ltrace "maxbalwidthseen" $
|
|
|
|
V.maximum $ V.map (\AccountsScreenItem{..} -> sum (map strWidth asItemRenderedAmounts) + 2 * (length asItemRenderedAmounts - 1)) displayitems
|
|
|
|
maxbalwidth =
|
|
|
|
-- ltrace "maxbalwidth" $
|
|
|
|
max 0 (availwidth - 2 - 4) -- leave 2 whitespace plus least 4 for accts
|
|
|
|
balwidth =
|
|
|
|
-- ltrace "balwidth" $
|
|
|
|
min maxbalwidth maxbalwidthseen
|
|
|
|
maxacctwidth =
|
|
|
|
-- ltrace "maxacctwidth" $
|
|
|
|
availwidth - 2 - balwidth
|
|
|
|
acctwidth =
|
|
|
|
-- ltrace "acctwidth" $
|
|
|
|
min maxacctwidth maxacctwidthseen
|
|
|
|
|
|
|
|
-- XXX how to minimise the balance column's jumping around
|
|
|
|
-- as you change the depth limit ?
|
|
|
|
|
|
|
|
colwidths = (acctwidth, balwidth)
|
|
|
|
|
|
|
|
render $ defaultLayout toplabel bottomlabel $ renderList (s ^. asList) (asDrawItem colwidths)
|
2015-08-29 03:55:50 +03:00
|
|
|
|
2016-06-10 21:50:57 +03:00
|
|
|
where
|
|
|
|
bottomlabel = case mode of
|
|
|
|
Minibuffer ed -> minibuffer ed
|
|
|
|
_ -> quickhelp
|
|
|
|
quickhelp = borderKeysStr [
|
|
|
|
("h", "help")
|
|
|
|
,("right", "register")
|
|
|
|
,("F", "flat?")
|
2016-06-10 22:51:10 +03:00
|
|
|
,("-+0123456789", "depth")
|
2016-06-10 21:50:57 +03:00
|
|
|
--,("/", "filter")
|
|
|
|
--,("DEL", "unfilter")
|
|
|
|
--,("ESC", "cancel/top")
|
|
|
|
,("a", "add")
|
|
|
|
,("g", "reload")
|
|
|
|
,("q", "quit")
|
|
|
|
]
|
2015-08-23 03:46:57 +03:00
|
|
|
|
2016-06-09 09:45:26 +03:00
|
|
|
asDraw _ = error "draw function called with wrong screen type, should not happen"
|
2015-08-18 03:44:18 +03:00
|
|
|
|
2016-06-09 09:45:26 +03:00
|
|
|
asDrawItem :: (Int,Int) -> Bool -> AccountsScreenItem -> Widget
|
|
|
|
asDrawItem (acctwidth, balwidth) selected AccountsScreenItem{..} =
|
2015-08-23 03:46:57 +03:00
|
|
|
Widget Greedy Fixed $ do
|
|
|
|
-- c <- getContext
|
2015-08-29 03:55:50 +03:00
|
|
|
-- let showitem = intercalate "\n" . balanceReportItemAsText defreportopts fmt
|
|
|
|
render $
|
2016-06-08 22:15:58 +03:00
|
|
|
addamts asItemRenderedAmounts $
|
|
|
|
str (T.unpack $ fitText (Just acctwidth) (Just acctwidth) True True $ T.replicate (2*asItemIndentLevel) " " <> asItemDisplayAccountName) <+>
|
2015-08-29 03:55:50 +03:00
|
|
|
str " " <+>
|
2016-06-08 22:15:58 +03:00
|
|
|
str (balspace asItemRenderedAmounts)
|
2015-08-29 03:55:50 +03:00
|
|
|
where
|
|
|
|
balspace as = replicate n ' '
|
2015-09-30 10:17:24 +03:00
|
|
|
where n = max 0 (balwidth - (sum (map strWidth as) + 2 * (length as - 1)))
|
2015-08-29 03:55:50 +03:00
|
|
|
addamts :: [String] -> Widget -> Widget
|
|
|
|
addamts [] w = w
|
|
|
|
addamts [a] w = (<+> renderamt a) w
|
|
|
|
-- foldl' :: (b -> a -> b) -> b -> t a -> b
|
|
|
|
-- foldl' (Widget -> String -> Widget) -> Widget -> [String] -> Widget
|
|
|
|
addamts (a:as) w = foldl' addamt (addamts [a] w) as
|
|
|
|
addamt :: Widget -> String -> Widget
|
|
|
|
addamt w a = ((<+> renderamt a) . (<+> str ", ")) w
|
|
|
|
renderamt :: String -> Widget
|
|
|
|
renderamt a | '-' `elem` a = withAttr (sel $ "list" <> "balance" <> "negative") $ str a
|
|
|
|
| otherwise = withAttr (sel $ "list" <> "balance" <> "positive") $ str a
|
|
|
|
sel | selected = (<> "selected")
|
|
|
|
| otherwise = id
|
2015-08-18 03:44:18 +03:00
|
|
|
|
2016-06-11 03:30:45 +03:00
|
|
|
asHandle :: UIState -> Event -> EventM (Next UIState)
|
|
|
|
asHandle ui0@UIState{
|
2016-06-09 01:46:19 +03:00
|
|
|
aScreen=scr@AccountsScreen{..}
|
2016-05-03 06:12:11 +03:00
|
|
|
,aopts=UIOpts{cliopts_=copts}
|
2015-09-04 18:14:36 +03:00
|
|
|
,ajournal=j
|
2016-06-10 18:40:00 +03:00
|
|
|
,aMode=mode
|
2016-06-04 21:51:28 +03:00
|
|
|
} ev = do
|
2016-06-10 21:50:57 +03:00
|
|
|
d <- liftIO getCurrentDay
|
|
|
|
-- c <- getContext
|
|
|
|
-- let h = c^.availHeightL
|
|
|
|
-- moveSel n l = listMoveBy n l
|
|
|
|
|
|
|
|
-- save the currently selected account, in case we leave this screen and lose the selection
|
|
|
|
let
|
|
|
|
selacct = case listSelectedElement $ scr ^. asList of
|
|
|
|
Just (_, AccountsScreenItem{..}) -> asItemAccountName
|
|
|
|
Nothing -> scr ^. asSelectedAccount
|
2016-06-11 03:30:45 +03:00
|
|
|
ui = ui0{aScreen=scr & asSelectedAccount .~ selacct}
|
2016-06-10 21:50:57 +03:00
|
|
|
|
|
|
|
case mode of
|
|
|
|
Minibuffer ed ->
|
|
|
|
case ev of
|
2016-06-11 03:30:45 +03:00
|
|
|
EvKey KEsc [] -> continue $ closeMinibuffer ui
|
|
|
|
EvKey KEnter [] -> continue $ regenerateScreens j d $ setFilter s $ closeMinibuffer ui
|
2016-06-11 02:39:06 +03:00
|
|
|
where s = chomp $ unlines $ getEditContents ed
|
|
|
|
ev -> do ed' <- handleEvent ev ed
|
2016-06-11 03:30:45 +03:00
|
|
|
continue $ ui{aMode=Minibuffer ed'}
|
2016-06-10 21:50:57 +03:00
|
|
|
|
|
|
|
Help ->
|
|
|
|
case ev of
|
2016-06-11 03:30:45 +03:00
|
|
|
EvKey (KChar 'q') [] -> halt ui
|
|
|
|
_ -> helpHandle ui ev
|
2016-06-10 21:50:57 +03:00
|
|
|
|
|
|
|
Normal ->
|
|
|
|
case ev of
|
2016-06-11 03:30:45 +03:00
|
|
|
EvKey (KChar 'q') [] -> halt ui
|
2016-06-11 02:39:06 +03:00
|
|
|
-- EvKey (KChar 'l') [MCtrl] -> do
|
2016-06-11 03:50:57 +03:00
|
|
|
EvKey KEsc [] -> continue $ resetScreens d ui
|
|
|
|
EvKey (KChar c) [] | c `elem` ['h','?'] -> continue $ setMode Help ui
|
2016-06-11 03:30:45 +03:00
|
|
|
EvKey (KChar 'g') [] -> liftIO (uiReloadJournalIfChanged copts d j ui) >>= continue
|
|
|
|
EvKey (KChar 'a') [] -> suspendAndResume $ clearScreen >> setCursorPosition 0 0 >> add copts j >> uiReloadJournalIfChanged copts d j ui
|
|
|
|
EvKey (KChar '0') [] -> continue $ regenerateScreens j d $ setDepth (Just 0) ui
|
|
|
|
EvKey (KChar '1') [] -> continue $ regenerateScreens j d $ setDepth (Just 1) ui
|
|
|
|
EvKey (KChar '2') [] -> continue $ regenerateScreens j d $ setDepth (Just 2) ui
|
|
|
|
EvKey (KChar '3') [] -> continue $ regenerateScreens j d $ setDepth (Just 3) ui
|
|
|
|
EvKey (KChar '4') [] -> continue $ regenerateScreens j d $ setDepth (Just 4) ui
|
|
|
|
EvKey (KChar '5') [] -> continue $ regenerateScreens j d $ setDepth (Just 5) ui
|
|
|
|
EvKey (KChar '6') [] -> continue $ regenerateScreens j d $ setDepth (Just 6) ui
|
|
|
|
EvKey (KChar '7') [] -> continue $ regenerateScreens j d $ setDepth (Just 7) ui
|
|
|
|
EvKey (KChar '8') [] -> continue $ regenerateScreens j d $ setDepth (Just 8) ui
|
|
|
|
EvKey (KChar '9') [] -> continue $ regenerateScreens j d $ setDepth (Just 9) ui
|
|
|
|
EvKey (KChar '-') [] -> continue $ regenerateScreens j d $ decDepth ui
|
|
|
|
EvKey (KChar '_') [] -> continue $ regenerateScreens j d $ decDepth ui
|
2016-06-11 03:50:57 +03:00
|
|
|
EvKey (KChar c) [] | c `elem` ['+','='] -> continue $ regenerateScreens j d $ incDepth ui
|
2016-06-11 03:30:45 +03:00
|
|
|
EvKey (KChar 'F') [] -> continue $ regenerateScreens j d $ toggleFlat ui
|
|
|
|
EvKey (KChar 'E') [] -> scrollTop >> (continue $ regenerateScreens j d $ toggleEmpty ui)
|
|
|
|
EvKey (KChar 'C') [] -> scrollTop >> (continue $ regenerateScreens j d $ toggleCleared ui)
|
|
|
|
EvKey (KChar 'U') [] -> scrollTop >> (continue $ regenerateScreens j d $ toggleUncleared ui)
|
|
|
|
EvKey (KChar 'R') [] -> scrollTop >> (continue $ regenerateScreens j d $ toggleReal ui)
|
2016-06-11 03:50:57 +03:00
|
|
|
EvKey (KChar '/') [] -> continue $ regenerateScreens j d $ showMinibuffer ui
|
|
|
|
EvKey k [] | k `elem` [KBS, KDel] -> (continue $ regenerateScreens j d $ resetFilter ui)
|
2016-06-11 03:30:45 +03:00
|
|
|
EvKey (KLeft) [] -> continue $ popScreen ui
|
2016-06-11 03:50:57 +03:00
|
|
|
EvKey k [] | k `elem` [KRight, KEnter] -> scrollTopRegister >> continue (screenEnter d scr ui)
|
2016-06-10 21:50:57 +03:00
|
|
|
where
|
|
|
|
scr = rsSetAccount selacct registerScreen
|
|
|
|
|
|
|
|
-- fall through to the list's event handler (handles up/down)
|
|
|
|
ev -> do
|
|
|
|
newitems <- handleEvent ev (scr ^. asList)
|
2016-06-11 03:30:45 +03:00
|
|
|
continue $ ui{aScreen=scr & asList .~ newitems
|
2016-06-10 21:50:57 +03:00
|
|
|
& asSelectedAccount .~ selacct
|
|
|
|
}
|
2016-06-11 03:30:45 +03:00
|
|
|
-- continue =<< handleEventLensed ui someLens ev
|
2016-06-04 21:51:28 +03:00
|
|
|
|
2016-06-04 03:53:49 +03:00
|
|
|
where
|
|
|
|
-- Encourage a more stable scroll position when toggling list items.
|
|
|
|
-- We scroll to the top, and the viewport will automatically
|
|
|
|
-- scroll down just far enough to reveal the selection, which
|
|
|
|
-- usually leaves it at bottom of screen).
|
|
|
|
-- XXX better: scroll so selection is in middle of screen ?
|
|
|
|
scrollTop = vScrollToBeginning $ viewportScroll "accounts"
|
|
|
|
scrollTopRegister = vScrollToBeginning $ viewportScroll "register"
|
|
|
|
|
2016-06-09 09:45:26 +03:00
|
|
|
asHandle _ _ = error "event handler called with wrong screen type, should not happen"
|
2015-08-28 08:45:49 +03:00
|
|
|
|
2016-06-09 09:45:26 +03:00
|
|
|
asSetSelectedAccount a s@AccountsScreen{} = s & asSelectedAccount .~ a
|
|
|
|
asSetSelectedAccount _ s = s
|
2015-08-28 20:31:40 +03:00
|
|
|
|