{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TemplateHaskell #-}

module Hledger.Cli.Commands.Tags (
  tagsmode
 ,tags
)
where

import qualified Control.Monad.Fail as Fail
import Data.List.Extra (nubSort)
import qualified Data.Text as T
import qualified Data.Text.IO as T
import Safe
import System.Console.CmdArgs.Explicit as C
import Hledger
import Hledger.Cli.CliOptions

tagsmode :: Mode RawOpts
tagsmode = CommandHelpStr
-> [Flag RawOpts]
-> [(CommandHelpStr, [Flag RawOpts])]
-> [Flag RawOpts]
-> ([Arg RawOpts], Maybe (Arg RawOpts))
-> Mode RawOpts
hledgerCommandMode
  $(embedFileRelative "Hledger/Cli/Commands/Tags.txt")
  [[CommandHelpStr]
-> (RawOpts -> RawOpts) -> CommandHelpStr -> Flag RawOpts
forall a. [CommandHelpStr] -> (a -> a) -> CommandHelpStr -> Flag a
flagNone [CommandHelpStr
"values"] (CommandHelpStr -> RawOpts -> RawOpts
setboolopt CommandHelpStr
"values") CommandHelpStr
"list tag values instead of tag names"
  ,[CommandHelpStr]
-> (RawOpts -> RawOpts) -> CommandHelpStr -> Flag RawOpts
forall a. [CommandHelpStr] -> (a -> a) -> CommandHelpStr -> Flag a
flagNone [CommandHelpStr
"parsed"] (CommandHelpStr -> RawOpts -> RawOpts
setboolopt CommandHelpStr
"parsed") CommandHelpStr
"show tags/values in the order they were parsed, including duplicates"
  ]
  [(CommandHelpStr, [Flag RawOpts])]
cligeneralflagsgroups1
  [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
$ CommandHelpStr -> Arg RawOpts
argsFlag CommandHelpStr
"[TAGREGEX [QUERY...]]")

tags :: CliOpts -> Journal -> IO ()
tags :: CliOpts -> Journal -> IO ()
tags CliOpts{rawopts_ :: CliOpts -> RawOpts
rawopts_=RawOpts
rawopts,reportspec_ :: CliOpts -> ReportSpec
reportspec_=ReportSpec
rspec} Journal
j = do
  let today :: Day
today = ReportSpec -> Day
_rsDay ReportSpec
rspec
      args :: [CommandHelpStr]
args = CommandHelpStr -> RawOpts -> [CommandHelpStr]
listofstringopt CommandHelpStr
"args" RawOpts
rawopts
  -- first argument is a tag name pattern, others are a hledger query: hledger tags [TAGREGEX [QUERYARGS..]]
  Maybe Regexp
mtagpat <- (CommandHelpStr -> IO Regexp)
-> Maybe CommandHelpStr -> IO (Maybe Regexp)
forall (t :: * -> *) (m :: * -> *) a b.
(Traversable t, Monad m) =>
(a -> m b) -> t a -> m (t b)
forall (m :: * -> *) a b.
Monad m =>
(a -> m b) -> Maybe a -> m (Maybe b)
mapM ((CommandHelpStr -> IO Regexp)
-> (Regexp -> IO Regexp)
-> Either CommandHelpStr Regexp
-> IO Regexp
forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either CommandHelpStr -> IO Regexp
forall a. CommandHelpStr -> IO a
forall (m :: * -> *) a. MonadFail m => CommandHelpStr -> m a
Fail.fail Regexp -> IO Regexp
forall a. a -> IO a
forall (f :: * -> *) a. Applicative f => a -> f a
pure (Either CommandHelpStr Regexp -> IO Regexp)
-> (CommandHelpStr -> Either CommandHelpStr Regexp)
-> CommandHelpStr
-> IO Regexp
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> Either CommandHelpStr Regexp
toRegexCI (Text -> Either CommandHelpStr Regexp)
-> (CommandHelpStr -> Text)
-> CommandHelpStr
-> Either CommandHelpStr Regexp
forall b c a. (b -> c) -> (a -> b) -> a -> c
. CommandHelpStr -> Text
T.pack) (Maybe CommandHelpStr -> IO (Maybe Regexp))
-> Maybe CommandHelpStr -> IO (Maybe Regexp)
forall a b. (a -> b) -> a -> b
$ [CommandHelpStr] -> Maybe CommandHelpStr
forall a. [a] -> Maybe a
headMay [CommandHelpStr]
args
  let
    querystr :: [Text]
querystr = (CommandHelpStr -> Text) -> [CommandHelpStr] -> [Text]
forall a b. (a -> b) -> [a] -> [b]
map CommandHelpStr -> Text
T.pack ([CommandHelpStr] -> [Text]) -> [CommandHelpStr] -> [Text]
forall a b. (a -> b) -> a -> b
$ Int -> [CommandHelpStr] -> [CommandHelpStr]
forall a. Int -> [a] -> [a]
drop Int
1 [CommandHelpStr]
args
    values :: Bool
values   = CommandHelpStr -> RawOpts -> Bool
boolopt CommandHelpStr
"values" RawOpts
rawopts
    parsed :: Bool
parsed   = CommandHelpStr -> RawOpts -> Bool
boolopt CommandHelpStr
"parsed" RawOpts
rawopts
    empty :: Bool
empty    = ReportOpts -> Bool
empty_ (ReportOpts -> Bool) -> ReportOpts -> Bool
forall a b. (a -> b) -> a -> b
$ ReportSpec -> ReportOpts
_rsReportOpts ReportSpec
rspec
  Query
query <- (CommandHelpStr -> IO Query)
-> ((Query, [QueryOpt]) -> IO Query)
-> Either CommandHelpStr (Query, [QueryOpt])
-> IO Query
forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either CommandHelpStr -> IO Query
forall a. CommandHelpStr -> a
usageError (Query -> IO Query
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return (Query -> IO Query)
-> ((Query, [QueryOpt]) -> Query)
-> (Query, [QueryOpt])
-> IO Query
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (Query, [QueryOpt]) -> Query
forall a b. (a, b) -> a
fst) (Either CommandHelpStr (Query, [QueryOpt]) -> IO Query)
-> Either CommandHelpStr (Query, [QueryOpt]) -> IO Query
forall a b. (a -> b) -> a -> b
$ Day -> [Text] -> Either CommandHelpStr (Query, [QueryOpt])
parseQueryList Day
today [Text]
querystr
  let
    q :: Query
q = Query -> Query
simplifyQuery (Query -> Query) -> Query -> Query
forall a b. (a -> b) -> a -> b
$ [Query] -> Query
And [ReportOpts -> Query
queryFromFlags (ReportOpts -> Query) -> ReportOpts -> Query
forall a b. (a -> b) -> a -> b
$ ReportSpec -> ReportOpts
_rsReportOpts ReportSpec
rspec, Query
query]
    matchedtxns :: [Transaction]
matchedtxns = (Transaction -> Bool) -> [Transaction] -> [Transaction]
forall a. (a -> Bool) -> [a] -> [a]
filter (Query
q Query -> Transaction -> Bool
`matchesTransaction`) ([Transaction] -> [Transaction]) -> [Transaction] -> [Transaction]
forall a b. (a -> b) -> a -> b
$ Journal -> [Transaction]
jtxns (Journal -> [Transaction]) -> Journal -> [Transaction]
forall a b. (a -> b) -> a -> b
$ ReportSpec -> Journal -> Journal
journalApplyValuationFromOpts ReportSpec
rspec Journal
j
    -- also list tags from matched account declarations, but not if there is
    -- a query for something transaction-related, like date: or amt:.
    matchedaccts :: [Text]
matchedaccts = CommandHelpStr -> [Text] -> [Text]
forall a. Show a => CommandHelpStr -> a -> a
dbg4 CommandHelpStr
"accts" ([Text] -> [Text]) -> [Text] -> [Text]
forall a b. (a -> b) -> a -> b
$
      if CommandHelpStr -> Bool -> Bool
forall a. Show a => CommandHelpStr -> a -> a
dbg4 CommandHelpStr
"queryIsTransactionRelated" (Bool -> Bool) -> Bool -> Bool
forall a b. (a -> b) -> a -> b
$ Query -> Bool
queryIsTransactionRelated (Query -> Bool) -> Query -> Bool
forall a b. (a -> b) -> a -> b
$ CommandHelpStr -> Query -> Query
forall a. Show a => CommandHelpStr -> a -> a
dbg4 CommandHelpStr
"q" Query
q
      then []
      else (Text -> Bool) -> [Text] -> [Text]
forall a. (a -> Bool) -> [a] -> [a]
filter ((Text -> Maybe AccountType)
-> (Text -> [Tag]) -> Query -> Text -> Bool
matchesAccountExtra (Journal -> Text -> Maybe AccountType
journalAccountType Journal
j) (Journal -> Text -> [Tag]
journalInheritedAccountTags Journal
j) Query
q) ([Text] -> [Text]) -> [Text] -> [Text]
forall a b. (a -> b) -> a -> b
$
           ((Text, AccountDeclarationInfo) -> Text)
-> [(Text, AccountDeclarationInfo)] -> [Text]
forall a b. (a -> b) -> [a] -> [b]
map (Text, AccountDeclarationInfo) -> Text
forall a b. (a, b) -> a
fst ([(Text, AccountDeclarationInfo)] -> [Text])
-> [(Text, AccountDeclarationInfo)] -> [Text]
forall a b. (a -> b) -> a -> b
$ Journal -> [(Text, AccountDeclarationInfo)]
jdeclaredaccounts Journal
j
    tagsorvalues :: [Text]
tagsorvalues =
      (if Bool
parsed then [Text] -> [Text]
forall a. a -> a
id else [Text] -> [Text]
forall a. Ord a => [a] -> [a]
nubSort)
      [ Text
r
      | (Text
t,Text
v) <- (Text -> [Tag]) -> [Text] -> [Tag]
forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap (Journal -> Text -> [Tag]
journalAccountTags Journal
j) [Text]
matchedaccts [Tag] -> [Tag] -> [Tag]
forall a. [a] -> [a] -> [a]
++ (Transaction -> [Tag]) -> [Transaction] -> [Tag]
forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap Transaction -> [Tag]
transactionAllTags [Transaction]
matchedtxns
      , Bool -> (Regexp -> Bool) -> Maybe Regexp -> Bool
forall b a. b -> (a -> b) -> Maybe a -> b
maybe Bool
True (Regexp -> Text -> Bool
`regexMatchText` Text
t) Maybe Regexp
mtagpat
      , let r :: Text
r = if Bool
values then Text
v else Text
t
      , Bool -> Bool
not (Bool
values Bool -> Bool -> Bool
&& Text -> Bool
T.null Text
v Bool -> Bool -> Bool
&& Bool -> Bool
not Bool
empty)
      ]
  (Text -> IO ()) -> [Text] -> IO ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ Text -> IO ()
T.putStrLn [Text]
tagsorvalues