{-# LANGUAGE TemplateHaskell #-}

{-|

Print a bar chart of posting activity per day, or other report interval.

-}

module Hledger.Cli.Commands.Activity
where

import Data.List (sortOn)
import Text.Printf (printf)
import Lens.Micro ((^.), set)

import Hledger
import Hledger.Cli.CliOptions

activitymode :: Mode RawOpts
activitymode = [Char]
-> [Flag RawOpts]
-> [([Char], [Flag RawOpts])]
-> [Flag RawOpts]
-> ([Arg RawOpts], Maybe (Arg RawOpts))
-> Mode RawOpts
hledgerCommandMode
  $(embedFileRelative "Hledger/Cli/Commands/Activity.txt")
  []
  [([Char], [Flag RawOpts])
generalflagsgroup1]
  [Flag RawOpts]
hiddenflags
  ([], Arg RawOpts -> Maybe (Arg RawOpts)
forall a. a -> Maybe a
Just (Arg RawOpts -> Maybe (Arg RawOpts))
-> Arg RawOpts -> Maybe (Arg RawOpts)
forall a b. (a -> b) -> a -> b
$ [Char] -> Arg RawOpts
argsFlag [Char]
"[QUERY]")

barchar :: Char
barchar :: Char
barchar = Char
'*'

-- | Print a bar chart of number of postings per report interval.
activity :: CliOpts -> Journal -> IO ()
activity :: CliOpts -> Journal -> IO ()
activity CliOpts{reportspec_ :: CliOpts -> ReportSpec
reportspec_=ReportSpec
rspec} Journal
j = [Char] -> IO ()
putStr ([Char] -> IO ()) -> [Char] -> IO ()
forall a b. (a -> b) -> a -> b
$ ReportSpec -> Journal -> [Char]
showHistogram ReportSpec
rspec Journal
j

showHistogram :: ReportSpec -> Journal -> String
showHistogram :: ReportSpec -> Journal -> [Char]
showHistogram rspec :: ReportSpec
rspec@ReportSpec{_rsQuery :: ReportSpec -> Query
_rsQuery=Query
q} Journal
j =
    ((DateSpan, [Posting]) -> [Char])
-> [(DateSpan, [Posting])] -> [Char]
forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap (([Posting] -> [Char]) -> (DateSpan, [Posting]) -> [Char]
forall {t} {t} {t}.
(PrintfArg t, PrintfType t) =>
(t -> t) -> (DateSpan, t) -> t
printDayWith [Posting] -> [Char]
forall {t :: * -> *} {a}. Foldable t => t a -> [Char]
countBar) [(DateSpan, [Posting])]
spanps
  where
    spans :: [DateSpan]
spans = (DateSpan -> Bool) -> [DateSpan] -> [DateSpan]
forall a. (a -> Bool) -> [a] -> [a]
filter (Maybe EFDay -> Maybe EFDay -> DateSpan
DateSpan Maybe EFDay
forall a. Maybe a
Nothing Maybe EFDay
forall a. Maybe a
Nothing DateSpan -> DateSpan -> Bool
forall a. Eq a => a -> a -> Bool
/=) ([DateSpan] -> [DateSpan])
-> (ReportSpec -> [DateSpan]) -> ReportSpec -> [DateSpan]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (DateSpan, [DateSpan]) -> [DateSpan]
forall a b. (a, b) -> b
snd ((DateSpan, [DateSpan]) -> [DateSpan])
-> (ReportSpec -> (DateSpan, [DateSpan]))
-> ReportSpec
-> [DateSpan]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Journal -> ReportSpec -> (DateSpan, [DateSpan])
reportSpan Journal
j (ReportSpec -> [DateSpan]) -> ReportSpec -> [DateSpan]
forall a b. (a -> b) -> a -> b
$ case ReportSpec
rspec ReportSpec -> Getting Interval ReportSpec Interval -> Interval
forall s a. s -> Getting a s a -> a
^. Getting Interval ReportSpec Interval
forall c. HasReportOptsNoUpdate c => Lens' c Interval
Lens' ReportSpec Interval
interval of
      Interval
NoInterval -> ASetter ReportSpec ReportSpec Interval Interval
-> Interval -> ReportSpec -> ReportSpec
forall s t a b. ASetter s t a b -> b -> s -> t
set ASetter ReportSpec ReportSpec Interval Interval
forall c. HasReportOptsNoUpdate c => Lens' c Interval
Lens' ReportSpec Interval
interval (Int -> Interval
Days Int
1) ReportSpec
rspec
      Interval
_ -> ReportSpec
rspec
    spanps :: [(DateSpan, [Posting])]
spanps = [(DateSpan
s, (Posting -> Bool) -> [Posting] -> [Posting]
forall a. (a -> Bool) -> [a] -> [a]
filter (DateSpan -> Posting -> Bool
isPostingInDateSpan DateSpan
s) [Posting]
ps) | DateSpan
s <- [DateSpan]
spans]
    -- same as Register
    -- should count transactions, not postings ?
    -- ps = sortBy (comparing postingDate) $ filterempties $ filter matchapats $ filterdepth $ journalPostings j
    ps :: [Posting]
ps = (Posting -> Day) -> [Posting] -> [Posting]
forall b a. Ord b => (a -> b) -> [a] -> [a]
sortOn Posting -> Day
postingDate ([Posting] -> [Posting]) -> [Posting] -> [Posting]
forall a b. (a -> b) -> a -> b
$ (Posting -> Bool) -> [Posting] -> [Posting]
forall a. (a -> Bool) -> [a] -> [a]
filter (Query
q Query -> Posting -> Bool
`matchesPosting`) ([Posting] -> [Posting]) -> [Posting] -> [Posting]
forall a b. (a -> b) -> a -> b
$ Journal -> [Posting]
journalPostings Journal
j

printDayWith :: (t -> t) -> (DateSpan, t) -> t
printDayWith t -> t
f (DateSpan (Just EFDay
b) Maybe EFDay
_, t
ps) = [Char] -> [Char] -> t -> t
forall r. PrintfType r => [Char] -> r
printf [Char]
"%s %s\n" (Day -> [Char]
forall a. Show a => a -> [Char]
show (Day -> [Char]) -> Day -> [Char]
forall a b. (a -> b) -> a -> b
$ EFDay -> Day
fromEFDay EFDay
b) (t -> t
f t
ps)
printDayWith t -> t
_ (DateSpan, t)
_ = [Char] -> t
forall a. HasCallStack => [Char] -> a
error [Char]
"Expected start date for DateSpan"  -- PARTIAL:

countBar :: t a -> [Char]
countBar t a
ps = Int -> Char -> [Char]
forall a. Int -> a -> [a]
replicate (t a -> Int
forall a. t a -> Int
forall (t :: * -> *) a. Foldable t => t a -> Int
length t a
ps) Char
barchar