Skip to content

Commit bcfc4e4

Browse files
committed
cli: introduce --dynamic-tags for rewrite/prints
1 parent 2f164b1 commit bcfc4e4

File tree

9 files changed

+125
-73
lines changed

9 files changed

+125
-73
lines changed

hledger-lib/Hledger/Data/PeriodicTransaction.hs

-1
Original file line numberDiff line numberDiff line change
@@ -215,7 +215,6 @@ runPeriodicTransaction PeriodicTransaction{..} requestedspan =
215215
,tdescription = ptdescription
216216
,tcomment = ptcomment <> "\n" -- force all further comments on new lines
217217
,ttags = ("_generated-transaction",period) :
218-
("generated-transaction" ,period) :
219218
pttags
220219
,tpostings = ptpostings
221220
}

hledger-lib/Hledger/Data/TransactionModifier.hs

+2-3
Original file line numberDiff line numberDiff line change
@@ -43,7 +43,7 @@ modifyTransactions tmods = map applymods
4343
t' = foldr (flip (.) . transactionModifierToFunction) id tmods t
4444
taggedt'
4545
-- PERF: compares txns to see if any modifier had an effect, inefficient ?
46-
| t' /= t = t'{ttags = ("modified","") : ttags t'}
46+
| t' /= t = t'{ttags = ("_modified","") : ttags t'}
4747
| otherwise = t'
4848

4949
-- | Converts a 'TransactionModifier' to a 'Transaction'-transforming function,
@@ -104,8 +104,7 @@ tmPostingRuleToFunction querytxt pr =
104104
{ pdate = pdate pr <|> pdate p
105105
, pdate2 = pdate2 pr <|> pdate2 p
106106
, pamount = amount' p
107-
, ptags = ("generated-posting", qry) :
108-
("_generated-posting",qry) :
107+
, ptags = ("_generated-posting",qry) :
109108
ptags pr
110109
}
111110
where

hledger/Hledger/Cli/Commands/Print.hs

+41-13
Original file line numberDiff line numberDiff line change
@@ -4,17 +4,21 @@ A ledger-compatible @print@ command.
44
55
-}
66

7-
{-# LANGUAGE OverloadedStrings #-}
7+
{-# LANGUAGE OverloadedStrings, LambdaCase, ViewPatterns #-}
88
{-# LANGUAGE TemplateHaskell #-}
99

1010
module Hledger.Cli.Commands.Print (
1111
printmode
12+
,txnflags
1213
,print'
1314
-- ,entriesReportAsText
14-
,originalTransaction
15+
,modPostings
16+
,prepareTxnFromOpts
1517
)
1618
where
1719

20+
import Data.Maybe (catMaybes)
21+
import Data.List (nub)
1822
import Data.Text (Text)
1923
import qualified Data.Text as T
2024
import System.Console.CmdArgs.Explicit
@@ -32,15 +36,27 @@ printmode = hledgerCommandMode
3236
([let arg = "STR" in
3337
flagReq ["match","m"] (\s opts -> Right $ setopt "match" s opts) arg
3438
("show the transaction whose description is most similar to "++arg++", and is most recent")
35-
,flagNone ["explicit","x"] (setboolopt "explicit")
36-
"show all amounts explicitly"
3739
,flagNone ["new"] (setboolopt "new")
3840
"show only newer-dated transactions added in each file since last run"
39-
] ++ outputflags)
41+
] ++ txnflags ++ outputflags)
4042
[generalflagsgroup1]
4143
hiddenflags
4244
([], Just $ argsFlag "[QUERY]")
4345

46+
-- | Common flags between all commands that print parsable transactions
47+
txnflags =
48+
[ flagNone ["explicit","x"] (setboolopt "explicit")
49+
"show all amounts explicitly"
50+
, flagNone ["dynamic-tags"] (setboolopt "dynamic-tags")
51+
"include dynamic tags as normal ones"
52+
]
53+
54+
enrichDynamicTags :: ([Tag] -> [Tag])
55+
enrichDynamicTags tags = nub $ tags ++ catMaybes (map enrichedMay tags) where
56+
enrichedMay = \case
57+
((T.stripPrefix "_" -> Just tag), value) -> Just (tag, value)
58+
_ -> Nothing
59+
4460
-- | Print journal transactions in standard format.
4561
print' :: CliOpts -> Journal -> IO ()
4662
print' opts j = do
@@ -60,21 +76,33 @@ printEntries opts@CliOpts{reportopts_=ropts} j = do
6076
writeOutput opts $ render $ entriesReport ropts' q j
6177

6278
entriesReportAsText :: CliOpts -> EntriesReport -> String
63-
entriesReportAsText opts = concatMap (showTransaction . syncTxn . gettxn)
79+
entriesReportAsText opts = concatMap (showTransaction . syncTxn . prepareTxnFromOpts opts)
80+
81+
-- | Create transaction update
82+
prepareTxnFromOpts :: CliOpts -> Transaction -> Transaction
83+
prepareTxnFromOpts opts =
84+
(if boolopt "dynamic-tags" (rawopts_ opts) then modTags enrichDynamicTags else id).
85+
(if useexplicittxn then id -- use fully inferred amounts & txn prices
86+
else modPostings originalPostingAmounts) -- use original as-written amounts/txn prices
6487
where
65-
gettxn | useexplicittxn = id -- use fully inferred amounts & txn prices
66-
| otherwise = originalTransaction -- use original as-written amounts/txn prices
6788
-- Original vs inferred transactions/postings were causing problems here, disabling -B (#551).
6889
-- Use the explicit one if -B or -x are active.
6990
-- This passes tests; does it also mean -B sometimes shows missing amounts unnecessarily ?
7091
useexplicittxn = boolopt "explicit" (rawopts_ opts) || (valuationTypeIsCost $ reportopts_ opts)
7192

72-
-- Replace this transaction's postings with the original postings if any, but keep the
73-
-- current possibly rewritten account names.
74-
originalTransaction t = t { tpostings = map originalPostingPreservingAccount $ tpostings t }
93+
-- | Update postings of transaction
94+
-- Note that you still need to call 'txnTieKnot'
95+
modPostings mod t = t { tpostings = map mod $ tpostings t }
96+
97+
-- | Update tags of transaction and postings
98+
-- Note that you still need to call 'txnTieKnot'
99+
modTags :: ([Tag] -> [Tag]) -> Transaction -> Transaction
100+
modTags f t = t { ttags = f $ ttags t, tpostings = map modPosting $ tpostings t } where
101+
modPosting p = p { ptags = f $ ptags p }
75102

76-
-- Get the original posting if any, but keep the current possibly rewritten account name.
77-
originalPostingPreservingAccount p = (originalPosting p) { paccount = paccount p }
103+
-- Get the original amounts preserving everything else
104+
originalPostingAmounts p = p { pamount = pamount p0, pbalanceassertion = pbalanceassertion p0 }
105+
where p0 = originalPosting p
78106

79107
-- XXX
80108
-- tests_showTransactions = [

hledger/Hledger/Cli/Commands/Printunique.hs

+2-2
Original file line numberDiff line numberDiff line change
@@ -13,13 +13,13 @@ import Hledger.Cli.Commands.Print
1313

1414
printuniquemode = hledgerCommandMode
1515
$(embedFileRelative "Hledger/Cli/Commands/Printunique.txt")
16-
[]
16+
txnflags
1717
[generalflagsgroup1]
1818
hiddenflags
1919
([], Nothing)
2020

2121
printunique opts j@Journal{jtxns=ts} = do
22-
print' opts j{jtxns=uniquify ts}
22+
print' opts j{jtxns=prepareTxnFromOpts opts <$> uniquify ts}
2323
where
2424
uniquify = nubBy (\t1 t2 -> thingToCompare t1 == thingToCompare t2) . sortOn thingToCompare
2525
thingToCompare = tdescription

hledger/Hledger/Cli/Commands/Rewrite.hs

+7-14
Original file line numberDiff line numberDiff line change
@@ -25,11 +25,10 @@ import qualified Data.Algorithm.Diff as D
2525

2626
rewritemode = hledgerCommandMode
2727
$(embedFileRelative "Hledger/Cli/Commands/Rewrite.txt")
28-
[flagReq ["add-posting"] (\s opts -> Right $ setopt "add-posting" s opts) "'ACCT AMTEXPR'"
28+
([flagReq ["add-posting"] (\s opts -> Right $ setopt "add-posting" s opts) "'ACCT AMTEXPR'"
2929
"add a posting to ACCT, which may be parenthesised. AMTEXPR is either a literal amount, or *N which means the transaction's first matched amount multiplied by N (a decimal number). Two spaces separate ACCT and AMTEXPR."
3030
,flagNone ["diff"] (setboolopt "diff") "generate diff suitable as an input for patch tool"
31-
,flagNone ["trace"] (setboolopt "trace") "inject special tags for generated postings/transactions for debug/trace prupose"
32-
]
31+
] ++ txnflags)
3332
[generalflagsgroup1]
3433
hiddenflags
3534
([], Just $ argsFlag "[QUERY] --add-posting \"ACCT AMTEXPR\" ...")
@@ -41,20 +40,10 @@ rewritemode = hledgerCommandMode
4140
rewrite opts@CliOpts{rawopts_=rawopts,reportopts_=ropts} j@Journal{jtxns=ts} = do
4241
-- rewrite matched transactions
4342
let modifiers = transactionModifierFromOpts opts : jtxnmodifiers j
44-
let j' = j{jtxns=traceModFromOpts opts <$> modifyTransactions modifiers ts}
43+
let j' = j{jtxns=prepareTxnFromOpts opts <$> modifyTransactions modifiers ts}
4544
-- run the print command, showing all transactions, or show diffs
4645
printOrDiff rawopts opts{reportopts_=ropts{query_=""}} j j'
4746

48-
traceModFromOpts :: CliOpts -> Transaction -> Transaction
49-
traceModFromOpts CliOpts{rawopts_=rawopts} =
50-
if boolopt "trace" rawopts then id else stripTxn
51-
52-
stripTxn :: Transaction -> Transaction
53-
stripTxn t = t { ttags = stripTags $ ttags t, tpostings = map stripPosting $ tpostings t } where
54-
stripPosting p = p { ptags = stripTags $ ptags p }
55-
stripTags = filter ((`notElem` ["generated-posting", "generated-transaction", "modified"]) . fst)
56-
57-
5847
-- | Build a 'TransactionModifier' from any query arguments and --add-posting flags
5948
-- provided on the command line, or throw a parse error.
6049
transactionModifierFromOpts :: CliOpts -> TransactionModifier
@@ -78,6 +67,10 @@ diffOutput j j' = do
7867
let changed = [(originalTransaction t, originalTransaction t') | (t, t') <- zip (jtxns j) (jtxns j'), t /= t']
7968
putStr $ renderPatch $ map (uncurry $ diffTxn j) changed
8069

70+
-- | Replace this transaction's postings with the original postings if any
71+
-- It is used for building correct diff
72+
originalTransaction = modPostings originalPosting
73+
8174
type Chunk = (GenericSourcePos, [DiffLine String])
8275

8376
-- XXX doctests, update needed:

tests/forecast.test

+29-4
Original file line numberDiff line numberDiff line change
@@ -51,7 +51,6 @@ hledger print -b 2016-11 -e 2017-02 -f - --forecast
5151
assets:cash
5252

5353
2017/01/01 * marked cleared, and with a description
54-
; generated-transaction: ~ monthly from 2016/1
5554
income $-1000
5655
expenses:food $20
5756
expenses:leisure $15
@@ -118,7 +117,6 @@ Y 2000
118117

119118
>>>
120119
2000/02/01 forecast
121-
; generated-transaction: ~ 2/1
122120

123121
>>>2
124122
>>>=0
@@ -135,7 +133,6 @@ Y 2000
135133

136134
>>>
137135
2000/01/15 forecast
138-
; generated-transaction: ~ 15
139136

140137
>>>2
141138
>>>=0
@@ -152,7 +149,35 @@ Y 2000
152149

153150
>>>
154151
2000/02/01 forecast
155-
; generated-transaction: ~ next month
152+
153+
>>>2
154+
>>>=0
155+
156+
# 8. print forecasted transactions with dynamic tags
157+
hledger print -b 2016-11 -e 2017-02 -f - --forecast --dynamic-tags
158+
<<<
159+
2016/12/31
160+
expenses:housing $600
161+
assets:cash
162+
163+
~ monthly from 2016/1 * marked cleared, and with a description
164+
income $-1000
165+
expenses:food $20
166+
expenses:leisure $15
167+
expenses:grocery $30
168+
assets:cash
169+
>>>
170+
2016/12/31
171+
expenses:housing $600
172+
assets:cash
173+
174+
2017/01/01 * marked cleared, and with a description
175+
; generated-transaction: ~ monthly from 2016/1
176+
income $-1000
177+
expenses:food $20
178+
expenses:leisure $15
179+
expenses:grocery $30
180+
assets:cash
156181

157182
>>>2
158183
>>>=0

0 commit comments

Comments
 (0)