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
|
|
|
{-# LANGUAGE StandaloneDeriving, OverloadedStrings #-}
|
2008-10-03 06:04:15 +04:00
|
|
|
{-|
|
|
|
|
|
2012-04-14 02:24:55 +04:00
|
|
|
A 'Journal' is a set of transactions, plus optional related data. This is
|
|
|
|
hledger's primary data object. It is usually parsed from a journal file or
|
|
|
|
other data format (see "Hledger.Read").
|
2008-10-03 06:04:15 +04:00
|
|
|
|
|
|
|
-}
|
|
|
|
|
2012-04-14 02:24:55 +04:00
|
|
|
module Hledger.Data.Journal (
|
|
|
|
-- * Parsing helpers
|
2015-08-10 02:20:02 +03:00
|
|
|
addMarketPrice,
|
2012-04-14 02:24:55 +04:00
|
|
|
addModifierTransaction,
|
|
|
|
addPeriodicTransaction,
|
|
|
|
addTransaction,
|
|
|
|
journalApplyAliases,
|
2012-05-27 22:14:20 +04:00
|
|
|
journalBalanceTransactions,
|
2015-11-22 20:21:36 +03:00
|
|
|
journalApplyCommodityStyles,
|
|
|
|
commodityStylesFromAmounts,
|
2012-04-14 02:24:55 +04:00
|
|
|
journalConvertAmountsToCost,
|
|
|
|
journalFinalise,
|
|
|
|
-- * Filtering
|
|
|
|
filterJournalTransactions,
|
2014-02-28 05:47:47 +04:00
|
|
|
filterJournalPostings,
|
2014-05-24 00:10:36 +04:00
|
|
|
filterJournalAmounts,
|
|
|
|
filterTransactionAmounts,
|
2016-06-01 22:09:16 +03:00
|
|
|
filterTransactionPostings,
|
2014-02-28 05:47:47 +04:00
|
|
|
filterPostingAmount,
|
2012-04-14 02:24:55 +04:00
|
|
|
-- * Querying
|
2012-05-27 22:14:20 +04:00
|
|
|
journalAccountNames,
|
2012-04-14 02:24:55 +04:00
|
|
|
journalAccountNamesUsed,
|
2012-11-20 01:20:10 +04:00
|
|
|
-- journalAmountAndPriceCommodities,
|
2012-04-14 02:24:55 +04:00
|
|
|
journalAmounts,
|
2012-11-20 01:20:10 +04:00
|
|
|
-- journalCanonicalCommodities,
|
2012-04-14 02:24:55 +04:00
|
|
|
journalDateSpan,
|
2014-02-28 05:47:47 +04:00
|
|
|
journalDescriptions,
|
2012-04-14 02:24:55 +04:00
|
|
|
journalFilePath,
|
|
|
|
journalFilePaths,
|
2015-10-30 06:12:46 +03:00
|
|
|
journalTransactionAt,
|
|
|
|
journalNextTransaction,
|
|
|
|
journalPrevTransaction,
|
2012-04-14 02:24:55 +04:00
|
|
|
journalPostings,
|
2012-04-14 05:12:42 +04:00
|
|
|
-- * Standard account types
|
2012-05-16 11:37:24 +04:00
|
|
|
journalBalanceSheetAccountQuery,
|
|
|
|
journalProfitAndLossAccountQuery,
|
2012-04-15 04:05:10 +04:00
|
|
|
journalIncomeAccountQuery,
|
|
|
|
journalExpenseAccountQuery,
|
|
|
|
journalAssetAccountQuery,
|
|
|
|
journalLiabilityAccountQuery,
|
|
|
|
journalEquityAccountQuery,
|
2012-04-17 21:32:56 +04:00
|
|
|
journalCashAccountQuery,
|
2012-04-14 02:24:55 +04:00
|
|
|
-- * Misc
|
2015-11-22 20:21:36 +03:00
|
|
|
canonicalStyleFrom,
|
2012-04-14 02:24:55 +04:00
|
|
|
matchpats,
|
|
|
|
nulljournal,
|
|
|
|
-- * Tests
|
2012-05-27 22:14:20 +04:00
|
|
|
samplejournal,
|
2012-04-14 02:24:55 +04:00
|
|
|
tests_Hledger_Data_Journal,
|
|
|
|
)
|
2007-07-02 23:15:39 +04:00
|
|
|
where
|
2013-05-29 03:25:00 +04:00
|
|
|
import Control.Monad
|
2011-05-28 08:11:44 +04:00
|
|
|
import Data.List
|
2012-11-20 01:20:10 +04:00
|
|
|
-- import Data.Map (findWithDefault)
|
2013-05-29 03:25:00 +04:00
|
|
|
import Data.Maybe
|
2016-05-19 01:08:50 +03:00
|
|
|
import Data.Monoid
|
2011-05-28 08:11:44 +04:00
|
|
|
import Data.Ord
|
lib: textification: saved journal source
Slightly worse on small files, better on large ones.
hledger -f data/100x100x10.journal stats
<<ghc: 39305392 bytes, 77 GCs, 196354/268584 avg/max bytes residency (3 samples), 2M in use, 0.000 INIT (0.007 elapsed), 0.014 MUT (0.027 elapsed), 0.011 GC (0.111 elapsed) :ghc>>
<<ghc: 39307728 bytes, 77 GCs, 196909/270248 avg/max bytes residency (3 samples), 2M in use, 0.001 INIT (0.010 elapsed), 0.015 MUT (0.028 elapsed), 0.012 GC (0.116 elapsed) :ghc>>
hledger -f data/1000x1000x10.journal stats
<<ghc: 314285912 bytes, 612 GCs, 2064811/6597608 avg/max bytes residency (7 samples), 16M in use, 0.000 INIT (0.002 elapsed), 0.126 MUT (0.134 elapsed), 0.059 GC (0.069 elapsed) :ghc>>
<<ghc: 314271368 bytes, 612 GCs, 2070227/6628024 avg/max bytes residency (7 samples), 16M in use, 0.000 INIT (0.000 elapsed), 0.137 MUT (0.143 elapsed), 0.059 GC (0.068 elapsed) :ghc>>
hledger -f data/10000x1000x10.journal stats
<<ghc: 3070033264 bytes, 5965 GCs, 12699294/62962464 avg/max bytes residency (10 samples), 124M in use, 0.000 INIT (0.000 elapsed), 1.245 MUT (1.300 elapsed), 0.498 GC (0.558 elapsed) :ghc>>
<<ghc: 3070006752 bytes, 5973 GCs, 12687314/62848920 avg/max bytes residency (10 samples), 124M in use, 0.000 INIT (0.003 elapsed), 1.257 MUT (1.281 elapsed), 0.496 GC (0.554 elapsed) :ghc>>
hledger -f data/100000x1000x10.journal stats
<<ghc: 30753465088 bytes, 59763 GCs, 117723618/666643528 avg/max bytes residency (14 samples), 1589M in use, 0.000 INIT (0.002 elapsed), 12.536 MUT (12.793 elapsed), 5.978 GC (7.155 elapsed) :ghc>>
<<ghc: 30753367256 bytes, 59811 GCs, 117723236/666627528 avg/max bytes residency (14 samples), 1590M in use, 0.001 INIT (0.012 elapsed), 12.923 MUT (13.169 elapsed), 5.981 GC (6.860 elapsed) :ghc>>
2016-05-24 05:24:39 +03:00
|
|
|
import Data.Text (Text)
|
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
|
2016-02-21 13:37:59 +03:00
|
|
|
import Safe (headMay, headDef)
|
2011-05-28 08:11:44 +04:00
|
|
|
import Data.Time.Calendar
|
|
|
|
import Data.Tree
|
2009-08-12 13:21:46 +04:00
|
|
|
import System.Time (ClockTime(TOD))
|
2011-05-28 08:11:44 +04:00
|
|
|
import Test.HUnit
|
|
|
|
import Text.Printf
|
2012-11-20 01:20:10 +04:00
|
|
|
import qualified Data.Map as M
|
2011-05-28 08:11:44 +04:00
|
|
|
|
|
|
|
import Hledger.Utils
|
2010-05-20 03:08:53 +04:00
|
|
|
import Hledger.Data.Types
|
|
|
|
import Hledger.Data.AccountName
|
|
|
|
import Hledger.Data.Amount
|
2012-11-20 01:20:10 +04:00
|
|
|
-- import Hledger.Data.Commodity
|
2012-05-27 22:14:20 +04:00
|
|
|
import Hledger.Data.Dates
|
|
|
|
import Hledger.Data.Transaction
|
2010-05-20 03:08:53 +04:00
|
|
|
import Hledger.Data.Posting
|
2012-05-16 11:57:10 +04:00
|
|
|
import Hledger.Query
|
2007-07-02 23:15:39 +04:00
|
|
|
|
|
|
|
|
2016-05-23 10:32:55 +03:00
|
|
|
-- try to make Journal ppShow-compatible
|
|
|
|
-- instance Show ClockTime where
|
|
|
|
-- show t = "<ClockTime>"
|
|
|
|
-- deriving instance Show Journal
|
|
|
|
|
2009-12-16 10:00:43 +03:00
|
|
|
instance Show Journal where
|
2013-12-07 01:51:19 +04:00
|
|
|
show j
|
|
|
|
| debugLevel < 3 = printf "Journal %s with %d transactions, %d accounts"
|
|
|
|
(journalFilePath j)
|
|
|
|
(length (jtxns j) +
|
|
|
|
length (jmodifiertxns j) +
|
|
|
|
length (jperiodictxns j))
|
|
|
|
(length accounts)
|
|
|
|
| debugLevel < 6 = printf "Journal %s with %d transactions, %d accounts: %s"
|
|
|
|
(journalFilePath j)
|
|
|
|
(length (jtxns j) +
|
|
|
|
length (jmodifiertxns j) +
|
|
|
|
length (jperiodictxns j))
|
|
|
|
(length accounts)
|
|
|
|
(show accounts)
|
|
|
|
| otherwise = printf "Journal %s with %d transactions, %d accounts: %s, commodity styles: %s"
|
2010-09-24 05:56:11 +04:00
|
|
|
(journalFilePath j)
|
2009-12-21 08:23:07 +03:00
|
|
|
(length (jtxns j) +
|
|
|
|
length (jmodifiertxns j) +
|
|
|
|
length (jperiodictxns j))
|
2008-10-09 13:25:58 +04:00
|
|
|
(length accounts)
|
|
|
|
(show accounts)
|
2016-05-23 10:32:55 +03:00
|
|
|
(show $ jinferredcommodities j)
|
2009-12-16 10:00:43 +03:00
|
|
|
-- ++ (show $ journalTransactions l)
|
2015-06-29 00:14:56 +03:00
|
|
|
where accounts = filter (/= "root") $ flatten $ journalAccountNameTree j
|
2008-10-03 16:10:05 +04:00
|
|
|
|
2012-04-14 02:24:55 +04:00
|
|
|
-- showJournalDebug j = unlines [
|
|
|
|
-- show j
|
|
|
|
-- ,show (jtxns j)
|
|
|
|
-- ,show (jmodifiertxns j)
|
|
|
|
-- ,show (jperiodictxns j)
|
2016-05-23 10:32:55 +03:00
|
|
|
-- ,show $ jparsetimeclockentries j
|
2015-08-10 02:20:02 +03:00
|
|
|
-- ,show $ jmarketprices j
|
2016-05-23 10:32:55 +03:00
|
|
|
-- ,show $ jfinalcommentlines j
|
2016-05-19 06:57:34 +03:00
|
|
|
-- ,show $ jparsestate j
|
2016-05-23 10:32:55 +03:00
|
|
|
-- ,show $ map fst $ jfiles j
|
2012-04-14 02:24:55 +04:00
|
|
|
-- ]
|
2011-08-03 03:27:41 +04:00
|
|
|
|
2016-05-23 10:32:55 +03:00
|
|
|
-- The monoid instance for Journal is useful for two situations.
|
|
|
|
--
|
|
|
|
-- 1. concatenating finalised journals, eg with multiple -f options:
|
|
|
|
-- FIRST <> SECOND. The second's list fields are appended to the
|
|
|
|
-- first's, map fields are combined, transaction counts are summed,
|
|
|
|
-- the parse state of the second is kept.
|
|
|
|
--
|
|
|
|
-- 2. merging a child parsed journal, eg with the include directive:
|
|
|
|
-- CHILD <> PARENT. A parsed journal's data is in reverse order, so
|
|
|
|
-- this gives what we want.
|
|
|
|
--
|
2016-05-19 01:08:50 +03:00
|
|
|
instance Monoid Journal where
|
|
|
|
mempty = nulljournal
|
2016-05-23 10:32:55 +03:00
|
|
|
mappend j1 j2 = Journal {
|
|
|
|
jparsedefaultyear = jparsedefaultyear j2
|
|
|
|
,jparsedefaultcommodity = jparsedefaultcommodity j2
|
|
|
|
,jparseparentaccounts = jparseparentaccounts j2
|
|
|
|
,jparsealiases = jparsealiases j2
|
|
|
|
,jparsetransactioncount = jparsetransactioncount j1 + jparsetransactioncount j2
|
|
|
|
,jparsetimeclockentries = jparsetimeclockentries j1 <> jparsetimeclockentries j2
|
|
|
|
,jaccounts = jaccounts j1 <> jaccounts j2
|
|
|
|
,jcommodities = jcommodities j1 <> jcommodities j2
|
|
|
|
,jinferredcommodities = jinferredcommodities j1 <> jinferredcommodities j2
|
|
|
|
,jmarketprices = jmarketprices j1 <> jmarketprices j2
|
|
|
|
,jmodifiertxns = jmodifiertxns j1 <> jmodifiertxns j2
|
|
|
|
,jperiodictxns = jperiodictxns j1 <> jperiodictxns j2
|
|
|
|
,jtxns = jtxns j1 <> jtxns j2
|
|
|
|
,jfinalcommentlines = jfinalcommentlines j2
|
|
|
|
,jfiles = jfiles j1 <> jfiles j2
|
|
|
|
,jlastreadtime = max (jlastreadtime j1) (jlastreadtime j2)
|
|
|
|
}
|
2016-05-19 01:08:50 +03:00
|
|
|
|
2009-12-20 18:50:54 +03:00
|
|
|
nulljournal :: Journal
|
2016-05-23 10:32:55 +03:00
|
|
|
nulljournal = Journal {
|
|
|
|
jparsedefaultyear = Nothing
|
|
|
|
,jparsedefaultcommodity = Nothing
|
|
|
|
,jparseparentaccounts = []
|
|
|
|
,jparsealiases = []
|
|
|
|
,jparsetransactioncount = 0
|
|
|
|
,jparsetimeclockentries = []
|
|
|
|
,jaccounts = []
|
|
|
|
,jcommodities = M.fromList []
|
|
|
|
,jinferredcommodities = M.fromList []
|
|
|
|
,jmarketprices = []
|
|
|
|
,jmodifiertxns = []
|
|
|
|
,jperiodictxns = []
|
|
|
|
,jtxns = []
|
lib: textification: comments and tags
No change.
hledger -f data/100x100x10.journal stats
<<ghc: 42859576 bytes, 84 GCs, 193781/269984 avg/max bytes residency (3 samples), 2M in use, 0.000 INIT (0.001 elapsed), 0.016 MUT (0.020 elapsed), 0.009 GC (0.011 elapsed) :ghc>>
<<ghc: 42859576 bytes, 84 GCs, 193781/269984 avg/max bytes residency (3 samples), 2M in use, 0.000 INIT (0.001 elapsed), 0.015 MUT (0.018 elapsed), 0.009 GC (0.013 elapsed) :ghc>>
hledger -f data/1000x1000x10.journal stats
<<ghc: 349576344 bytes, 681 GCs, 1407388/4091680 avg/max bytes residency (7 samples), 11M in use, 0.000 INIT (0.000 elapsed), 0.124 MUT (0.130 elapsed), 0.047 GC (0.055 elapsed) :ghc>>
<<ghc: 349576280 bytes, 681 GCs, 1407388/4091680 avg/max bytes residency (7 samples), 11M in use, 0.000 INIT (0.000 elapsed), 0.126 MUT (0.132 elapsed), 0.049 GC (0.058 elapsed) :ghc>>
hledger -f data/10000x1000x10.journal stats
<<ghc: 3424030664 bytes, 6658 GCs, 11403359/41071624 avg/max bytes residency (11 samples), 111M in use, 0.000 INIT (0.000 elapsed), 1.207 MUT (1.228 elapsed), 0.473 GC (0.528 elapsed) :ghc>>
<<ghc: 3424030760 bytes, 6658 GCs, 11403874/41077288 avg/max bytes residency (11 samples), 111M in use, 0.000 INIT (0.002 elapsed), 1.234 MUT (1.256 elapsed), 0.470 GC (0.520 elapsed) :ghc>>
hledger -f data/100000x1000x10.journal stats
<<ghc: 34306547448 bytes, 66727 GCs, 76805504/414629288 avg/max bytes residency (14 samples), 1009M in use, 0.000 INIT (0.003 elapsed), 12.615 MUT (12.813 elapsed), 4.656 GC (5.291 elapsed) :ghc>>
<<ghc: 34306547320 bytes, 66727 GCs, 76805504/414629288 avg/max bytes residency (14 samples), 1009M in use, 0.000 INIT (0.009 elapsed), 12.802 MUT (13.065 elapsed), 4.774 GC (5.441 elapsed) :ghc>>
2016-05-25 03:09:20 +03:00
|
|
|
,jfinalcommentlines = ""
|
2016-05-23 10:32:55 +03:00
|
|
|
,jfiles = []
|
|
|
|
,jlastreadtime = TOD 0 0
|
|
|
|
}
|
2010-11-13 18:03:40 +03:00
|
|
|
|
2010-09-24 05:56:11 +04:00
|
|
|
journalFilePath :: Journal -> FilePath
|
|
|
|
journalFilePath = fst . mainfile
|
|
|
|
|
|
|
|
journalFilePaths :: Journal -> [FilePath]
|
2016-05-23 10:32:55 +03:00
|
|
|
journalFilePaths = map fst . jfiles
|
2010-09-24 05:56:11 +04:00
|
|
|
|
lib: textification: saved journal source
Slightly worse on small files, better on large ones.
hledger -f data/100x100x10.journal stats
<<ghc: 39305392 bytes, 77 GCs, 196354/268584 avg/max bytes residency (3 samples), 2M in use, 0.000 INIT (0.007 elapsed), 0.014 MUT (0.027 elapsed), 0.011 GC (0.111 elapsed) :ghc>>
<<ghc: 39307728 bytes, 77 GCs, 196909/270248 avg/max bytes residency (3 samples), 2M in use, 0.001 INIT (0.010 elapsed), 0.015 MUT (0.028 elapsed), 0.012 GC (0.116 elapsed) :ghc>>
hledger -f data/1000x1000x10.journal stats
<<ghc: 314285912 bytes, 612 GCs, 2064811/6597608 avg/max bytes residency (7 samples), 16M in use, 0.000 INIT (0.002 elapsed), 0.126 MUT (0.134 elapsed), 0.059 GC (0.069 elapsed) :ghc>>
<<ghc: 314271368 bytes, 612 GCs, 2070227/6628024 avg/max bytes residency (7 samples), 16M in use, 0.000 INIT (0.000 elapsed), 0.137 MUT (0.143 elapsed), 0.059 GC (0.068 elapsed) :ghc>>
hledger -f data/10000x1000x10.journal stats
<<ghc: 3070033264 bytes, 5965 GCs, 12699294/62962464 avg/max bytes residency (10 samples), 124M in use, 0.000 INIT (0.000 elapsed), 1.245 MUT (1.300 elapsed), 0.498 GC (0.558 elapsed) :ghc>>
<<ghc: 3070006752 bytes, 5973 GCs, 12687314/62848920 avg/max bytes residency (10 samples), 124M in use, 0.000 INIT (0.003 elapsed), 1.257 MUT (1.281 elapsed), 0.496 GC (0.554 elapsed) :ghc>>
hledger -f data/100000x1000x10.journal stats
<<ghc: 30753465088 bytes, 59763 GCs, 117723618/666643528 avg/max bytes residency (14 samples), 1589M in use, 0.000 INIT (0.002 elapsed), 12.536 MUT (12.793 elapsed), 5.978 GC (7.155 elapsed) :ghc>>
<<ghc: 30753367256 bytes, 59811 GCs, 117723236/666627528 avg/max bytes residency (14 samples), 1590M in use, 0.001 INIT (0.012 elapsed), 12.923 MUT (13.169 elapsed), 5.981 GC (6.860 elapsed) :ghc>>
2016-05-24 05:24:39 +03:00
|
|
|
mainfile :: Journal -> (FilePath, Text)
|
2016-05-23 10:32:55 +03:00
|
|
|
mainfile = headDef ("", "") . jfiles
|
2010-09-24 05:56:11 +04:00
|
|
|
|
2009-12-16 11:07:26 +03:00
|
|
|
addTransaction :: Transaction -> Journal -> Journal
|
2014-11-03 09:00:02 +03:00
|
|
|
addTransaction t j = j { jtxns = t : jtxns j }
|
2008-12-08 04:48:03 +03:00
|
|
|
|
2009-12-16 10:00:43 +03:00
|
|
|
addModifierTransaction :: ModifierTransaction -> Journal -> Journal
|
2014-11-03 09:00:02 +03:00
|
|
|
addModifierTransaction mt j = j { jmodifiertxns = mt : jmodifiertxns j }
|
2008-12-08 04:48:03 +03:00
|
|
|
|
2009-12-16 10:00:43 +03:00
|
|
|
addPeriodicTransaction :: PeriodicTransaction -> Journal -> Journal
|
2014-11-03 09:00:02 +03:00
|
|
|
addPeriodicTransaction pt j = j { jperiodictxns = pt : jperiodictxns j }
|
2008-12-08 04:48:03 +03:00
|
|
|
|
2015-08-10 02:20:02 +03:00
|
|
|
addMarketPrice :: MarketPrice -> Journal -> Journal
|
|
|
|
addMarketPrice h j = j { jmarketprices = h : jmarketprices j }
|
2008-12-16 13:54:20 +03:00
|
|
|
|
2015-10-30 06:12:46 +03:00
|
|
|
-- | Get the transaction with this index (its 1-based position in the input stream), if any.
|
|
|
|
journalTransactionAt :: Journal -> Integer -> Maybe Transaction
|
|
|
|
journalTransactionAt Journal{jtxns=ts} i =
|
|
|
|
-- it's probably ts !! (i+1), but we won't assume
|
|
|
|
headMay [t | t <- ts, tindex t == i]
|
|
|
|
|
|
|
|
-- | Get the transaction that appeared immediately after this one in the input stream, if any.
|
|
|
|
journalNextTransaction :: Journal -> Transaction -> Maybe Transaction
|
|
|
|
journalNextTransaction j t = journalTransactionAt j (tindex t + 1)
|
2016-02-21 13:37:59 +03:00
|
|
|
|
2015-10-30 06:12:46 +03:00
|
|
|
-- | Get the transaction that appeared immediately before this one in the input stream, if any.
|
|
|
|
journalPrevTransaction :: Journal -> Transaction -> Maybe Transaction
|
|
|
|
journalPrevTransaction j t = journalTransactionAt j (tindex t - 1)
|
2016-02-21 13:37:59 +03:00
|
|
|
|
2014-02-28 05:47:47 +04:00
|
|
|
-- | Unique transaction descriptions used in this journal.
|
lib: textification: descriptions & codes
Slightly higher (with small files) and lower (with large files) maximum
residency, and slightly quicker for all.
hledger -f data/100x100x10.journal stats
<<ghc: 42858472 bytes, 84 GCs, 193712/269608 avg/max bytes residency (3 samples), 2M in use, 0.000 INIT (0.015 elapsed), 0.016 MUT (0.042 elapsed), 0.011 GC (0.119 elapsed) :ghc>>
<<ghc: 42891776 bytes, 84 GCs, 190816/260920 avg/max bytes residency (3 samples), 2M in use, 0.000 INIT (0.004 elapsed), 0.017 MUT (0.025 elapsed), 0.010 GC (0.015 elapsed) :ghc>>
hledger -f data/1000x1000x10.journal stats
<<ghc: 349575240 bytes, 681 GCs, 1396425/4091680 avg/max bytes residency (7 samples), 11M in use, 0.000 INIT (0.000 elapsed), 0.137 MUT (0.146 elapsed), 0.050 GC (0.057 elapsed) :ghc>>
<<ghc: 349927568 bytes, 681 GCs, 1397825/4097248 avg/max bytes residency (7 samples), 11M in use, 0.000 INIT (0.000 elapsed), 0.126 MUT (0.133 elapsed), 0.050 GC (0.057 elapsed) :ghc>>
hledger -f data/10000x1000x10.journal stats
<<ghc: 3424029496 bytes, 6658 GCs, 11403141/41077288 avg/max bytes residency (11 samples), 111M in use, 0.000 INIT (0.000 elapsed), 1.278 MUT (1.310 elapsed), 0.493 GC (0.546 elapsed) :ghc>>
<<ghc: 3427418064 bytes, 6665 GCs, 11127869/37790168 avg/max bytes residency (11 samples), 109M in use, 0.000 INIT (0.001 elapsed), 1.212 MUT (1.229 elapsed), 0.466 GC (0.519 elapsed) :ghc>>
hledger -f data/100000x1000x10.journal stats
<<ghc: 34306546248 bytes, 66727 GCs, 77030638/414617944 avg/max bytes residency (14 samples), 1012M in use, 0.000 INIT (0.000 elapsed), 12.965 MUT (13.164 elapsed), 4.771 GC (5.447 elapsed) :ghc>>
<<ghc: 34340246056 bytes, 66779 GCs, 76983178/416011480 avg/max bytes residency (14 samples), 1011M in use, 0.000 INIT (0.008 elapsed), 12.666 MUT (12.836 elapsed), 4.595 GC (5.175 elapsed) :ghc>>
2016-05-25 04:51:52 +03:00
|
|
|
journalDescriptions :: Journal -> [Text]
|
2014-02-28 05:47:47 +04:00
|
|
|
journalDescriptions = nub . sort . map tdescription . jtxns
|
|
|
|
|
|
|
|
-- | All postings from this journal's transactions, in order.
|
2009-12-19 08:57:54 +03:00
|
|
|
journalPostings :: Journal -> [Posting]
|
|
|
|
journalPostings = concatMap tpostings . jtxns
|
2008-10-03 16:10:05 +04:00
|
|
|
|
2014-02-28 05:47:47 +04:00
|
|
|
-- | Unique account names posted to in this journal.
|
2009-12-16 10:00:43 +03:00
|
|
|
journalAccountNamesUsed :: Journal -> [AccountName]
|
2011-07-17 19:54:21 +04:00
|
|
|
journalAccountNamesUsed = sort . accountNamesFromPostings . journalPostings
|
2008-10-03 16:10:05 +04:00
|
|
|
|
2014-02-28 05:47:47 +04:00
|
|
|
-- | Unique account names in this journal, including parent accounts containing no postings.
|
2009-12-16 10:00:43 +03:00
|
|
|
journalAccountNames :: Journal -> [AccountName]
|
|
|
|
journalAccountNames = sort . expandAccountNames . journalAccountNamesUsed
|
2008-10-03 16:10:05 +04:00
|
|
|
|
2009-12-16 10:00:43 +03:00
|
|
|
journalAccountNameTree :: Journal -> Tree AccountName
|
|
|
|
journalAccountNameTree = accountNameTreeFrom . journalAccountNames
|
2008-10-10 08:23:25 +04:00
|
|
|
|
2012-04-14 05:12:42 +04:00
|
|
|
-- standard account types
|
|
|
|
|
2012-04-15 04:05:10 +04:00
|
|
|
-- | A query for Profit & Loss accounts in this journal.
|
|
|
|
-- Cf <http://en.wikipedia.org/wiki/Chart_of_accounts#Profit_.26_Loss_accounts>.
|
2012-05-16 11:12:49 +04:00
|
|
|
journalProfitAndLossAccountQuery :: Journal -> Query
|
|
|
|
journalProfitAndLossAccountQuery j = Or [journalIncomeAccountQuery j
|
2012-04-15 04:05:10 +04:00
|
|
|
,journalExpenseAccountQuery j
|
|
|
|
]
|
|
|
|
|
|
|
|
-- | A query for Income (Revenue) accounts in this journal.
|
|
|
|
-- This is currently hard-coded to the case-insensitive regex @^(income|revenue)s?(:|$)@.
|
2012-05-16 11:12:49 +04:00
|
|
|
journalIncomeAccountQuery :: Journal -> Query
|
|
|
|
journalIncomeAccountQuery _ = Acct "^(income|revenue)s?(:|$)"
|
2012-04-15 04:05:10 +04:00
|
|
|
|
|
|
|
-- | A query for Expense accounts in this journal.
|
|
|
|
-- This is currently hard-coded to the case-insensitive regex @^expenses?(:|$)@.
|
2012-05-16 11:12:49 +04:00
|
|
|
journalExpenseAccountQuery :: Journal -> Query
|
|
|
|
journalExpenseAccountQuery _ = Acct "^expenses?(:|$)"
|
2012-04-14 05:12:42 +04:00
|
|
|
|
2012-05-16 11:37:24 +04:00
|
|
|
-- | A query for Asset, Liability & Equity accounts in this journal.
|
2012-04-14 05:12:42 +04:00
|
|
|
-- Cf <http://en.wikipedia.org/wiki/Chart_of_accounts#Balance_Sheet_Accounts>.
|
2012-05-16 11:12:49 +04:00
|
|
|
journalBalanceSheetAccountQuery :: Journal -> Query
|
|
|
|
journalBalanceSheetAccountQuery j = Or [journalAssetAccountQuery j
|
2012-04-15 04:05:10 +04:00
|
|
|
,journalLiabilityAccountQuery j
|
|
|
|
,journalEquityAccountQuery j
|
|
|
|
]
|
|
|
|
|
|
|
|
-- | A query for Asset accounts in this journal.
|
|
|
|
-- This is currently hard-coded to the case-insensitive regex @^assets?(:|$)@.
|
2012-05-16 11:12:49 +04:00
|
|
|
journalAssetAccountQuery :: Journal -> Query
|
|
|
|
journalAssetAccountQuery _ = Acct "^assets?(:|$)"
|
2012-04-15 04:05:10 +04:00
|
|
|
|
|
|
|
-- | A query for Liability accounts in this journal.
|
2015-07-04 15:15:30 +03:00
|
|
|
-- This is currently hard-coded to the case-insensitive regex @^(debts?|liabilit(y|ies))(:|$)@.
|
2012-05-16 11:12:49 +04:00
|
|
|
journalLiabilityAccountQuery :: Journal -> Query
|
2015-07-04 15:15:30 +03:00
|
|
|
journalLiabilityAccountQuery _ = Acct "^(debts?|liabilit(y|ies))(:|$)"
|
2012-04-15 04:05:10 +04:00
|
|
|
|
|
|
|
-- | A query for Equity accounts in this journal.
|
|
|
|
-- This is currently hard-coded to the case-insensitive regex @^equity(:|$)@.
|
2012-05-16 11:12:49 +04:00
|
|
|
journalEquityAccountQuery :: Journal -> Query
|
|
|
|
journalEquityAccountQuery _ = Acct "^equity(:|$)"
|
2012-04-14 05:12:42 +04:00
|
|
|
|
2012-04-17 21:32:56 +04:00
|
|
|
-- | A query for Cash (-equivalent) accounts in this journal (ie,
|
|
|
|
-- accounts which appear on the cashflow statement.) This is currently
|
|
|
|
-- hard-coded to be all the Asset accounts except for those containing the
|
|
|
|
-- case-insensitive regex @(receivable|A/R)@.
|
|
|
|
journalCashAccountQuery :: Journal -> Query
|
|
|
|
journalCashAccountQuery j = And [journalAssetAccountQuery j, Not $ Acct "(receivable|A/R)"]
|
|
|
|
|
2009-12-21 08:23:07 +03:00
|
|
|
-- Various kinds of filtering on journals. We do it differently depending
|
|
|
|
-- on the command.
|
|
|
|
|
2011-06-04 03:14:26 +04:00
|
|
|
-------------------------------------------------------------------------------
|
|
|
|
-- filtering V2
|
|
|
|
|
2014-05-24 00:10:36 +04:00
|
|
|
-- | Keep only transactions matching the query expression.
|
|
|
|
filterJournalTransactions :: Query -> Journal -> Journal
|
|
|
|
filterJournalTransactions q j@Journal{jtxns=ts} = j{jtxns=filter (q `matchesTransaction`) ts}
|
|
|
|
|
2011-06-04 03:14:26 +04:00
|
|
|
-- | Keep only postings matching the query expression.
|
|
|
|
-- This can leave unbalanced transactions.
|
2012-05-27 22:14:20 +04:00
|
|
|
filterJournalPostings :: Query -> Journal -> Journal
|
2016-06-02 06:47:27 +03:00
|
|
|
filterJournalPostings q j@Journal{jtxns=ts} = j{jtxns=map (filterTransactionPostings q) ts}
|
2011-06-05 22:36:32 +04:00
|
|
|
|
2014-05-24 00:10:36 +04:00
|
|
|
-- | Within each posting's amount, keep only the parts matching the query.
|
2014-02-28 05:47:47 +04:00
|
|
|
-- This can leave unbalanced transactions.
|
2014-05-24 00:10:36 +04:00
|
|
|
filterJournalAmounts :: Query -> Journal -> Journal
|
|
|
|
filterJournalAmounts q j@Journal{jtxns=ts} = j{jtxns=map (filterTransactionAmounts q) ts}
|
|
|
|
|
|
|
|
-- | Filter out all parts of this transaction's amounts which do not match the query.
|
|
|
|
-- This can leave the transaction unbalanced.
|
|
|
|
filterTransactionAmounts :: Query -> Transaction -> Transaction
|
|
|
|
filterTransactionAmounts q t@Transaction{tpostings=ps} = t{tpostings=map (filterPostingAmount q) ps}
|
2014-02-28 05:47:47 +04:00
|
|
|
|
|
|
|
-- | Filter out all parts of this posting's amount which do not match the query.
|
|
|
|
filterPostingAmount :: Query -> Posting -> Posting
|
|
|
|
filterPostingAmount q p@Posting{pamount=Mixed as} = p{pamount=Mixed $ filter (q `matchesAmount`) as}
|
|
|
|
|
2016-06-01 22:09:16 +03:00
|
|
|
filterTransactionPostings :: Query -> Transaction -> Transaction
|
2016-06-02 06:47:27 +03:00
|
|
|
filterTransactionPostings q t@Transaction{tpostings=ps} = t{tpostings=filter (q `matchesPosting`) ps}
|
2016-06-01 22:09:16 +03:00
|
|
|
|
|
|
|
|
2012-05-27 22:14:20 +04:00
|
|
|
{-
|
2011-06-04 03:14:26 +04:00
|
|
|
-------------------------------------------------------------------------------
|
|
|
|
-- filtering V1
|
|
|
|
|
2011-06-03 06:14:36 +04:00
|
|
|
-- | Keep only transactions we are interested in, as described by the
|
|
|
|
-- filter specification.
|
2009-12-21 08:23:07 +03:00
|
|
|
filterJournalTransactions :: FilterSpec -> Journal -> Journal
|
|
|
|
filterJournalTransactions FilterSpec{datespan=datespan
|
|
|
|
,cleared=cleared
|
|
|
|
-- ,real=real
|
|
|
|
-- ,empty=empty
|
|
|
|
,acctpats=apats
|
|
|
|
,descpats=dpats
|
|
|
|
,depth=depth
|
2012-05-09 19:34:05 +04:00
|
|
|
,fMetadata=md
|
2009-12-21 08:23:07 +03:00
|
|
|
} =
|
|
|
|
filterJournalTransactionsByClearedStatus cleared .
|
|
|
|
filterJournalPostingsByDepth depth .
|
|
|
|
filterJournalTransactionsByAccount apats .
|
2012-04-09 00:43:48 +04:00
|
|
|
filterJournalTransactionsByMetadata md .
|
2009-12-21 08:23:07 +03:00
|
|
|
filterJournalTransactionsByDescription dpats .
|
2011-06-03 06:14:36 +04:00
|
|
|
filterJournalTransactionsByDate datespan
|
2009-12-21 08:23:07 +03:00
|
|
|
|
2011-06-03 06:14:36 +04:00
|
|
|
-- | Keep only postings we are interested in, as described by the filter
|
|
|
|
-- specification. This can leave unbalanced transactions.
|
2009-12-21 08:23:07 +03:00
|
|
|
filterJournalPostings :: FilterSpec -> Journal -> Journal
|
|
|
|
filterJournalPostings FilterSpec{datespan=datespan
|
|
|
|
,cleared=cleared
|
|
|
|
,real=real
|
|
|
|
,empty=empty
|
|
|
|
,acctpats=apats
|
|
|
|
,descpats=dpats
|
|
|
|
,depth=depth
|
2012-05-09 19:34:05 +04:00
|
|
|
,fMetadata=md
|
2009-12-21 08:23:07 +03:00
|
|
|
} =
|
|
|
|
filterJournalPostingsByRealness real .
|
|
|
|
filterJournalPostingsByClearedStatus cleared .
|
|
|
|
filterJournalPostingsByEmpty empty .
|
|
|
|
filterJournalPostingsByDepth depth .
|
|
|
|
filterJournalPostingsByAccount apats .
|
2012-04-09 00:43:48 +04:00
|
|
|
filterJournalTransactionsByMetadata md .
|
2009-12-21 08:23:07 +03:00
|
|
|
filterJournalTransactionsByDescription dpats .
|
2011-06-03 06:14:36 +04:00
|
|
|
filterJournalTransactionsByDate datespan
|
2009-04-03 14:58:05 +04:00
|
|
|
|
2012-04-09 00:43:48 +04:00
|
|
|
-- | Keep only transactions whose metadata matches all metadata specifications.
|
|
|
|
filterJournalTransactionsByMetadata :: [(String,String)] -> Journal -> Journal
|
|
|
|
filterJournalTransactionsByMetadata pats j@Journal{jtxns=ts} = j{jtxns=filter matchmd ts}
|
|
|
|
where matchmd t = all (`elem` tmetadata t) pats
|
|
|
|
|
2010-07-13 10:30:06 +04:00
|
|
|
-- | Keep only transactions whose description matches the description patterns.
|
2009-12-16 11:07:26 +03:00
|
|
|
filterJournalTransactionsByDescription :: [String] -> Journal -> Journal
|
2009-12-21 08:43:10 +03:00
|
|
|
filterJournalTransactionsByDescription pats j@Journal{jtxns=ts} = j{jtxns=filter matchdesc ts}
|
2009-12-16 20:58:51 +03:00
|
|
|
where matchdesc = matchpats pats . tdescription
|
2009-04-03 14:58:05 +04:00
|
|
|
|
2010-07-13 10:30:06 +04:00
|
|
|
-- | Keep only transactions which fall between begin and end dates.
|
2009-04-03 14:58:05 +04:00
|
|
|
-- We include transactions on the begin date and exclude transactions on the end
|
2008-10-10 08:23:25 +04:00
|
|
|
-- date, like ledger. An empty date string means no restriction.
|
2009-12-16 11:07:26 +03:00
|
|
|
filterJournalTransactionsByDate :: DateSpan -> Journal -> Journal
|
2009-12-21 08:43:10 +03:00
|
|
|
filterJournalTransactionsByDate (DateSpan begin end) j@Journal{jtxns=ts} = j{jtxns=filter match ts}
|
|
|
|
where match t = maybe True (tdate t>=) begin && maybe True (tdate t<) end
|
2008-10-10 08:23:25 +04:00
|
|
|
|
2010-07-13 10:30:06 +04:00
|
|
|
-- | Keep only transactions which have the requested cleared/uncleared
|
|
|
|
-- status, if there is one.
|
2009-12-21 08:23:07 +03:00
|
|
|
filterJournalTransactionsByClearedStatus :: Maybe Bool -> Journal -> Journal
|
|
|
|
filterJournalTransactionsByClearedStatus Nothing j = j
|
2009-12-21 08:43:10 +03:00
|
|
|
filterJournalTransactionsByClearedStatus (Just val) j@Journal{jtxns=ts} = j{jtxns=filter match ts}
|
|
|
|
where match = (==val).tstatus
|
2009-12-21 08:23:07 +03:00
|
|
|
|
|
|
|
-- | Keep only postings which have the requested cleared/uncleared status,
|
|
|
|
-- if there is one.
|
2009-12-16 10:58:06 +03:00
|
|
|
filterJournalPostingsByClearedStatus :: Maybe Bool -> Journal -> Journal
|
2009-12-19 08:57:54 +03:00
|
|
|
filterJournalPostingsByClearedStatus Nothing j = j
|
2009-12-21 08:23:07 +03:00
|
|
|
filterJournalPostingsByClearedStatus (Just c) j@Journal{jtxns=ts} = j{jtxns=map filterpostings ts}
|
|
|
|
where filterpostings t@Transaction{tpostings=ps} = t{tpostings=filter ((==c) . postingCleared) ps}
|
2008-10-15 04:34:02 +04:00
|
|
|
|
2009-04-03 14:58:05 +04:00
|
|
|
-- | Strip out any virtual postings, if the flag is true, otherwise do
|
2008-10-17 04:57:00 +04:00
|
|
|
-- no filtering.
|
2009-12-16 10:00:43 +03:00
|
|
|
filterJournalPostingsByRealness :: Bool -> Journal -> Journal
|
2012-04-16 20:43:58 +04:00
|
|
|
filterJournalPostingsByRealness False j = j
|
2009-12-21 08:43:10 +03:00
|
|
|
filterJournalPostingsByRealness True j@Journal{jtxns=ts} = j{jtxns=map filterpostings ts}
|
2009-12-21 08:23:07 +03:00
|
|
|
where filterpostings t@Transaction{tpostings=ps} = t{tpostings=filter isReal ps}
|
|
|
|
|
|
|
|
-- | Strip out any postings with zero amount, unless the flag is true.
|
|
|
|
filterJournalPostingsByEmpty :: Bool -> Journal -> Journal
|
2012-04-16 20:43:58 +04:00
|
|
|
filterJournalPostingsByEmpty True j = j
|
2009-12-21 08:43:10 +03:00
|
|
|
filterJournalPostingsByEmpty False j@Journal{jtxns=ts} = j{jtxns=map filterpostings ts}
|
2009-12-21 08:23:07 +03:00
|
|
|
where filterpostings t@Transaction{tpostings=ps} = t{tpostings=filter (not . isEmptyPosting) ps}
|
|
|
|
|
2012-04-14 02:24:55 +04:00
|
|
|
-- -- | Keep only transactions which affect accounts deeper than the specified depth.
|
|
|
|
-- filterJournalTransactionsByDepth :: Maybe Int -> Journal -> Journal
|
|
|
|
-- filterJournalTransactionsByDepth Nothing j = j
|
|
|
|
-- filterJournalTransactionsByDepth (Just d) j@Journal{jtxns=ts} =
|
|
|
|
-- j{jtxns=(filter (any ((<= d+1) . accountNameLevel . paccount) . tpostings) ts)}
|
2009-04-03 14:58:05 +04:00
|
|
|
|
|
|
|
-- | Strip out any postings to accounts deeper than the specified depth
|
2010-07-13 10:30:06 +04:00
|
|
|
-- (and any transactions which have no postings as a result).
|
2009-12-21 08:23:07 +03:00
|
|
|
filterJournalPostingsByDepth :: Maybe Int -> Journal -> Journal
|
|
|
|
filterJournalPostingsByDepth Nothing j = j
|
2009-12-21 08:43:10 +03:00
|
|
|
filterJournalPostingsByDepth (Just d) j@Journal{jtxns=ts} =
|
|
|
|
j{jtxns=filter (not . null . tpostings) $ map filtertxns ts}
|
2009-12-16 20:58:51 +03:00
|
|
|
where filtertxns t@Transaction{tpostings=ps} =
|
2009-12-21 08:23:07 +03:00
|
|
|
t{tpostings=filter ((<= d) . accountNameLevel . paccount) ps}
|
2009-04-03 14:58:05 +04:00
|
|
|
|
2012-05-27 22:14:20 +04:00
|
|
|
-- | Keep only postings which affect accounts matched by the account patterns.
|
|
|
|
-- This can leave transactions unbalanced.
|
|
|
|
filterJournalPostingsByAccount :: [String] -> Journal -> Journal
|
|
|
|
filterJournalPostingsByAccount apats j@Journal{jtxns=ts} = j{jtxns=map filterpostings ts}
|
|
|
|
where filterpostings t@Transaction{tpostings=ps} = t{tpostings=filter (matchpats apats . paccount) ps}
|
|
|
|
|
2009-12-21 08:23:07 +03:00
|
|
|
-- | Keep only transactions which affect accounts matched by the account patterns.
|
2010-04-16 03:08:27 +04:00
|
|
|
-- More precisely: each positive account pattern excludes transactions
|
|
|
|
-- which do not contain a posting to a matched account, and each negative
|
|
|
|
-- account pattern excludes transactions containing a posting to a matched
|
|
|
|
-- account.
|
2009-12-21 08:23:07 +03:00
|
|
|
filterJournalTransactionsByAccount :: [String] -> Journal -> Journal
|
2010-04-16 03:08:27 +04:00
|
|
|
filterJournalTransactionsByAccount apats j@Journal{jtxns=ts} = j{jtxns=filter tmatch ts}
|
|
|
|
where
|
|
|
|
tmatch t = (null positives || any positivepmatch ps) && (null negatives || not (any negativepmatch ps)) where ps = tpostings t
|
|
|
|
positivepmatch p = any (`amatch` a) positives where a = paccount p
|
|
|
|
negativepmatch p = any (`amatch` a) negatives where a = paccount p
|
2011-06-09 01:52:10 +04:00
|
|
|
amatch pat a = regexMatchesCI (abspat pat) a
|
2010-04-16 03:08:27 +04:00
|
|
|
(negatives,positives) = partition isnegativepat apats
|
2008-11-22 09:35:10 +03:00
|
|
|
|
2012-05-27 22:14:20 +04:00
|
|
|
-}
|
2009-12-21 08:23:07 +03:00
|
|
|
|
2011-08-05 04:05:39 +04:00
|
|
|
-- | Apply additional account aliases (eg from the command-line) to all postings in a journal.
|
2014-10-25 02:05:10 +04:00
|
|
|
journalApplyAliases :: [AccountAlias] -> Journal -> Journal
|
|
|
|
journalApplyAliases aliases j@Journal{jtxns=ts} =
|
|
|
|
-- (if null aliases
|
|
|
|
-- then id
|
|
|
|
-- else (dbgtrace $
|
|
|
|
-- "applying additional command-line aliases:\n"
|
|
|
|
-- ++ chomp (unlines $ map (" "++) $ lines $ ppShow aliases))) $
|
2015-05-14 22:50:32 +03:00
|
|
|
j{jtxns=map dotransaction ts}
|
2011-08-05 04:05:39 +04:00
|
|
|
where
|
2015-05-14 22:50:32 +03:00
|
|
|
dotransaction t@Transaction{tpostings=ps} = t{tpostings=map doposting ps}
|
|
|
|
doposting p@Posting{paccount=a} = p{paccount= accountNameApplyAliases aliases a}
|
2011-08-05 04:05:39 +04:00
|
|
|
|
2016-05-23 10:32:55 +03:00
|
|
|
-- | Do post-parse processing on a parsed journal to make it ready for
|
|
|
|
-- use. Reverse parsed data to normal order, canonicalise amount
|
|
|
|
-- formats, check/ensure that transactions are balanced, and maybe
|
|
|
|
-- check balance assertions.
|
lib: textification: saved journal source
Slightly worse on small files, better on large ones.
hledger -f data/100x100x10.journal stats
<<ghc: 39305392 bytes, 77 GCs, 196354/268584 avg/max bytes residency (3 samples), 2M in use, 0.000 INIT (0.007 elapsed), 0.014 MUT (0.027 elapsed), 0.011 GC (0.111 elapsed) :ghc>>
<<ghc: 39307728 bytes, 77 GCs, 196909/270248 avg/max bytes residency (3 samples), 2M in use, 0.001 INIT (0.010 elapsed), 0.015 MUT (0.028 elapsed), 0.012 GC (0.116 elapsed) :ghc>>
hledger -f data/1000x1000x10.journal stats
<<ghc: 314285912 bytes, 612 GCs, 2064811/6597608 avg/max bytes residency (7 samples), 16M in use, 0.000 INIT (0.002 elapsed), 0.126 MUT (0.134 elapsed), 0.059 GC (0.069 elapsed) :ghc>>
<<ghc: 314271368 bytes, 612 GCs, 2070227/6628024 avg/max bytes residency (7 samples), 16M in use, 0.000 INIT (0.000 elapsed), 0.137 MUT (0.143 elapsed), 0.059 GC (0.068 elapsed) :ghc>>
hledger -f data/10000x1000x10.journal stats
<<ghc: 3070033264 bytes, 5965 GCs, 12699294/62962464 avg/max bytes residency (10 samples), 124M in use, 0.000 INIT (0.000 elapsed), 1.245 MUT (1.300 elapsed), 0.498 GC (0.558 elapsed) :ghc>>
<<ghc: 3070006752 bytes, 5973 GCs, 12687314/62848920 avg/max bytes residency (10 samples), 124M in use, 0.000 INIT (0.003 elapsed), 1.257 MUT (1.281 elapsed), 0.496 GC (0.554 elapsed) :ghc>>
hledger -f data/100000x1000x10.journal stats
<<ghc: 30753465088 bytes, 59763 GCs, 117723618/666643528 avg/max bytes residency (14 samples), 1589M in use, 0.000 INIT (0.002 elapsed), 12.536 MUT (12.793 elapsed), 5.978 GC (7.155 elapsed) :ghc>>
<<ghc: 30753367256 bytes, 59811 GCs, 117723236/666627528 avg/max bytes residency (14 samples), 1590M in use, 0.001 INIT (0.012 elapsed), 12.923 MUT (13.169 elapsed), 5.981 GC (6.860 elapsed) :ghc>>
2016-05-24 05:24:39 +03:00
|
|
|
journalFinalise :: ClockTime -> FilePath -> Text -> Bool -> ParsedJournal -> Either String Journal
|
2016-05-23 10:32:55 +03:00
|
|
|
journalFinalise t path txt assrt j@Journal{jfiles=fs} = do
|
2013-05-29 03:25:00 +04:00
|
|
|
(journalBalanceTransactions $
|
2015-11-22 20:21:36 +03:00
|
|
|
journalApplyCommodityStyles $
|
2016-05-23 10:32:55 +03:00
|
|
|
j{ jfiles = (path,txt) : reverse fs
|
|
|
|
, jlastreadtime = t
|
|
|
|
, jtxns = reverse $ jtxns j -- NOTE: see addTransaction
|
|
|
|
, jmodifiertxns = reverse $ jmodifiertxns j -- NOTE: see addModifierTransaction
|
|
|
|
, jperiodictxns = reverse $ jperiodictxns j -- NOTE: see addPeriodicTransaction
|
|
|
|
, jmarketprices = reverse $ jmarketprices j -- NOTE: see addMarketPrice
|
2014-11-03 09:00:02 +03:00
|
|
|
})
|
2014-07-02 05:26:37 +04:00
|
|
|
>>= if assrt then journalCheckBalanceAssertions else return
|
2013-05-29 03:25:00 +04:00
|
|
|
|
|
|
|
-- | Check any balance assertions in the journal and return an error
|
|
|
|
-- message if any of them fail.
|
|
|
|
journalCheckBalanceAssertions :: Journal -> Either String Journal
|
|
|
|
journalCheckBalanceAssertions j = do
|
|
|
|
let postingsByAccount = groupBy (\p1 p2 -> paccount p1 == paccount p2) $
|
|
|
|
sortBy (comparing paccount) $
|
|
|
|
journalPostings j
|
|
|
|
forM_ postingsByAccount checkBalanceAssertionsForAccount
|
|
|
|
Right j
|
|
|
|
|
|
|
|
-- Check any balance assertions in this sequence of postings to a single account.
|
|
|
|
checkBalanceAssertionsForAccount :: [Posting] -> Either String ()
|
|
|
|
checkBalanceAssertionsForAccount ps
|
|
|
|
| null errs = Right ()
|
|
|
|
| otherwise = Left $ head errs
|
|
|
|
where
|
2013-05-31 02:16:54 +04:00
|
|
|
errs = fst $
|
|
|
|
foldl' checkBalanceAssertion ([],nullmixedamt) $
|
|
|
|
splitAssertions $
|
|
|
|
sortBy (comparing postingDate) ps
|
2013-05-29 03:25:00 +04:00
|
|
|
|
|
|
|
-- Given a starting balance, accumulated errors, and a non-null sequence of
|
|
|
|
-- postings to a single account with a balance assertion in the last:
|
|
|
|
-- check that the final balance matches the balance assertion.
|
|
|
|
-- If it does, return the new balance, otherwise add an error to the
|
|
|
|
-- error list. Intended to be called from a fold.
|
|
|
|
checkBalanceAssertion :: ([String],MixedAmount) -> [Posting] -> ([String],MixedAmount)
|
2014-07-02 18:35:06 +04:00
|
|
|
checkBalanceAssertion (errs,startbal) ps
|
|
|
|
| null ps = (errs,startbal)
|
2016-07-06 00:10:33 +03:00
|
|
|
| isNothing $ pbalanceassertion p = (errs,startbal)
|
|
|
|
| iswrong = (errs++[err], finalfullbal)
|
2016-02-10 18:39:03 +03:00
|
|
|
| otherwise = (errs,finalfullbal)
|
2013-05-29 03:25:00 +04:00
|
|
|
where
|
|
|
|
p = last ps
|
2016-07-06 00:10:33 +03:00
|
|
|
Just assertedbal = pbalanceassertion p
|
|
|
|
assertedcomm = maybe "" acommodity $ headMay $ amounts assertedbal
|
|
|
|
finalfullbal = sum $ [startbal] ++ map pamount (dbg2 "ps" ps)
|
|
|
|
finalsinglebal = filterMixedAmount (\a -> acommodity a == assertedcomm) finalfullbal
|
2016-02-10 18:39:03 +03:00
|
|
|
actualbal = finalsinglebal -- just check the single-commodity balance, like Ledger; maybe add ==FULLBAL later
|
2016-07-06 00:10:33 +03:00
|
|
|
iswrong = dbgtrace 2 debugmsg $
|
|
|
|
not (isReallyZeroMixedAmount (actualbal - assertedbal))
|
|
|
|
-- bal' /= assertedbal -- MixedAmount's Eq instance currently gets confused by different precisions
|
|
|
|
where
|
|
|
|
debugmsg = "assertions: on " ++ show (postingDate p) ++ " balance of " ++ show assertedcomm
|
|
|
|
++ " in " ++ T.unpack (paccount p) ++ " should be " ++ show assertedbal
|
|
|
|
diff = assertedbal - actualbal
|
2016-02-10 18:39:03 +03:00
|
|
|
diffplus | isNegativeMixedAmount diff == Just False = "+"
|
|
|
|
| otherwise = ""
|
|
|
|
err = printf (unlines [
|
2016-07-06 00:10:33 +03:00
|
|
|
"balance assertion error%s",
|
2016-02-10 18:39:03 +03:00
|
|
|
"after posting:",
|
|
|
|
"%s",
|
2016-07-06 00:10:33 +03:00
|
|
|
"balance assertion details:",
|
|
|
|
"date: %s",
|
|
|
|
"account: %s",
|
|
|
|
"commodity: %s",
|
|
|
|
"calculated: %s",
|
|
|
|
"asserted: %s (difference: %s)"
|
2016-02-10 18:39:03 +03:00
|
|
|
])
|
2016-07-06 00:10:33 +03:00
|
|
|
(case ptransaction p of
|
|
|
|
Nothing -> ":" -- shouldn't happen
|
|
|
|
Just t -> printf " in \"%s\" (line %d, column %d):\nin transaction:\n%s" f l c (chomp $ show t) :: String
|
|
|
|
where GenericSourcePos f l c = tsourcepos t)
|
|
|
|
(showPostingLine p)
|
2016-02-10 18:39:03 +03:00
|
|
|
(showDate $ postingDate p)
|
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
|
|
|
(T.unpack $ paccount p) -- XXX pack
|
2014-07-18 02:23:03 +04:00
|
|
|
assertedcomm
|
2016-02-10 18:39:03 +03:00
|
|
|
(showMixedAmount finalsinglebal)
|
2016-07-06 00:10:33 +03:00
|
|
|
(showMixedAmount assertedbal)
|
2016-02-10 18:39:03 +03:00
|
|
|
(diffplus ++ showMixedAmount diff)
|
2013-05-29 03:25:00 +04:00
|
|
|
|
|
|
|
-- Given a sequence of postings to a single account, split it into
|
|
|
|
-- sub-sequences consisting of ordinary postings followed by a single
|
|
|
|
-- balance-asserting posting. Postings not followed by a balance
|
|
|
|
-- assertion are discarded.
|
|
|
|
splitAssertions :: [Posting] -> [[Posting]]
|
|
|
|
splitAssertions ps
|
2015-01-11 09:15:21 +03:00
|
|
|
| null rest = []
|
2013-05-29 03:25:00 +04:00
|
|
|
| otherwise = (ps'++[head rest]):splitAssertions (tail rest)
|
|
|
|
where
|
|
|
|
(ps',rest) = break (isJust . pbalanceassertion) ps
|
2014-09-11 00:07:53 +04:00
|
|
|
|
2010-11-15 01:44:37 +03:00
|
|
|
-- | Fill in any missing amounts and check that all journal transactions
|
|
|
|
-- balance, or return an error message. This is done after parsing all
|
|
|
|
-- amounts and working out the canonical commodities, since balancing
|
|
|
|
-- depends on display precision. Reports only the first error encountered.
|
|
|
|
journalBalanceTransactions :: Journal -> Either String Journal
|
2016-05-23 10:32:55 +03:00
|
|
|
journalBalanceTransactions j@Journal{jtxns=ts, jinferredcommodities=ss} =
|
2012-12-22 04:24:38 +04:00
|
|
|
case sequence $ map balance ts of Right ts' -> Right j{jtxns=map txnTieKnot ts'}
|
2010-11-15 01:44:37 +03:00
|
|
|
Left e -> Left e
|
2012-11-20 01:20:10 +04:00
|
|
|
where balance = balanceTransaction (Just ss)
|
2010-11-15 01:44:37 +03:00
|
|
|
|
2016-05-08 04:25:28 +03:00
|
|
|
-- | Choose and apply a consistent display format to the posting
|
|
|
|
-- amounts in each commodity. Each commodity's format is specified by
|
|
|
|
-- a commodity format directive, or otherwise inferred from posting
|
|
|
|
-- amounts as in hledger < 0.28.
|
2015-11-22 20:21:36 +03:00
|
|
|
journalApplyCommodityStyles :: Journal -> Journal
|
|
|
|
journalApplyCommodityStyles j@Journal{jtxns=ts, jmarketprices=mps} = j''
|
2010-05-23 03:35:34 +04:00
|
|
|
where
|
2016-05-08 04:25:28 +03:00
|
|
|
j' = journalInferCommodityStyles j
|
2015-08-10 02:20:02 +03:00
|
|
|
j'' = j'{jtxns=map fixtransaction ts, jmarketprices=map fixmarketprice mps}
|
2010-05-23 03:35:34 +04:00
|
|
|
fixtransaction t@Transaction{tpostings=ps} = t{tpostings=map fixposting ps}
|
|
|
|
fixposting p@Posting{pamount=a} = p{pamount=fixmixedamount a}
|
2015-08-10 02:20:02 +03:00
|
|
|
fixmarketprice mp@MarketPrice{mpamount=a} = mp{mpamount=fixamount a}
|
2010-05-23 03:35:34 +04:00
|
|
|
fixmixedamount (Mixed as) = Mixed $ map fixamount as
|
2012-11-20 01:20:10 +04:00
|
|
|
fixamount a@Amount{acommodity=c} = a{astyle=journalCommodityStyle j' c}
|
|
|
|
|
2016-05-08 04:25:28 +03:00
|
|
|
-- | Get this journal's standard display style for the given
|
|
|
|
-- commodity. That is the style defined by the last corresponding
|
|
|
|
-- commodity format directive if any, otherwise the style inferred
|
|
|
|
-- from the posting amounts (or in some cases, price amounts) in this
|
|
|
|
-- commodity if any, otherwise the default style.
|
2016-05-08 02:18:04 +03:00
|
|
|
journalCommodityStyle :: Journal -> CommoditySymbol -> AmountStyle
|
2016-05-08 04:25:28 +03:00
|
|
|
journalCommodityStyle j c =
|
|
|
|
headDef amountstyle{asprecision=2} $
|
|
|
|
catMaybes [
|
|
|
|
M.lookup c (jcommodities j) >>= cformat
|
2016-05-23 10:32:55 +03:00
|
|
|
,M.lookup c $ jinferredcommodities j
|
2016-05-08 04:25:28 +03:00
|
|
|
]
|
|
|
|
|
|
|
|
-- | Infer a display format for each commodity based on the amounts parsed.
|
2015-11-22 20:21:36 +03:00
|
|
|
-- "hledger... will use the format of the first posting amount in the
|
|
|
|
-- commodity, and the highest precision of all posting amounts in the commodity."
|
2016-05-08 04:25:28 +03:00
|
|
|
journalInferCommodityStyles :: Journal -> Journal
|
|
|
|
journalInferCommodityStyles j =
|
2016-05-23 10:32:55 +03:00
|
|
|
j{jinferredcommodities =
|
2015-11-22 20:21:36 +03:00
|
|
|
commodityStylesFromAmounts $
|
|
|
|
dbg8 "journalChooseCommmodityStyles using amounts" $ journalAmounts j}
|
|
|
|
|
|
|
|
-- | Given a list of amounts in parse order, build a map from their commodity names
|
|
|
|
-- to standard commodity display formats.
|
2016-05-08 02:18:04 +03:00
|
|
|
commodityStylesFromAmounts :: [Amount] -> M.Map CommoditySymbol AmountStyle
|
2015-11-22 20:21:36 +03:00
|
|
|
commodityStylesFromAmounts amts = M.fromList commstyles
|
look harder for decimal point & digit groups (fixes #196)
Amount display styles have been reworked a bit; they are now calculated
after journal parsing, not during it. This allows the fix for #196:
we now search through the amounts until a decimal point is detected,
instead of just looking at the first one; likewise for digit groups.
Digit groups are now implemented with a better type.
Digit group size detection has been improved a little:
1000,000 now gives group sizes [3,4,4,...], not [3,3,...], and
10,000 gives groups sizes [3,3,...] not [3,2,2,..].
(To get [3,2,2,...] you'd use eg 00,00,000.)
There are still some old (or new ?) issues; I don't think we handle
inconsistent decimal points & digit groups too well. But for now all
tests pass.
2014-07-03 10:26:16 +04:00
|
|
|
where
|
|
|
|
samecomm = \a1 a2 -> acommodity a1 == acommodity a2
|
|
|
|
commamts = [(acommodity $ head as, as) | as <- groupBy samecomm $ sortBy (comparing acommodity) amts]
|
|
|
|
commstyles = [(c, canonicalStyleFrom $ map astyle as) | (c,as) <- commamts]
|
|
|
|
|
2015-11-22 20:21:36 +03:00
|
|
|
-- | Given an ordered list of amount styles, choose a canonical style.
|
|
|
|
-- That is: the style of the first, and the
|
|
|
|
-- maximum precision of all.
|
look harder for decimal point & digit groups (fixes #196)
Amount display styles have been reworked a bit; they are now calculated
after journal parsing, not during it. This allows the fix for #196:
we now search through the amounts until a decimal point is detected,
instead of just looking at the first one; likewise for digit groups.
Digit groups are now implemented with a better type.
Digit group size detection has been improved a little:
1000,000 now gives group sizes [3,4,4,...], not [3,3,...], and
10,000 gives groups sizes [3,3,...] not [3,2,2,..].
(To get [3,2,2,...] you'd use eg 00,00,000.)
There are still some old (or new ?) issues; I don't think we handle
inconsistent decimal points & digit groups too well. But for now all
tests pass.
2014-07-03 10:26:16 +04:00
|
|
|
canonicalStyleFrom :: [AmountStyle] -> AmountStyle
|
|
|
|
canonicalStyleFrom [] = amountstyle
|
|
|
|
canonicalStyleFrom ss@(first:_) =
|
|
|
|
first{asprecision=prec, asdecimalpoint=mdec, asdigitgroups=mgrps}
|
|
|
|
where
|
2015-11-22 20:21:36 +03:00
|
|
|
mgrps = maybe Nothing Just $ headMay $ catMaybes $ map asdigitgroups ss
|
|
|
|
-- precision is maximum of all precisions
|
look harder for decimal point & digit groups (fixes #196)
Amount display styles have been reworked a bit; they are now calculated
after journal parsing, not during it. This allows the fix for #196:
we now search through the amounts until a decimal point is detected,
instead of just looking at the first one; likewise for digit groups.
Digit groups are now implemented with a better type.
Digit group size detection has been improved a little:
1000,000 now gives group sizes [3,4,4,...], not [3,3,...], and
10,000 gives groups sizes [3,3,...] not [3,2,2,..].
(To get [3,2,2,...] you'd use eg 00,00,000.)
There are still some old (or new ?) issues; I don't think we handle
inconsistent decimal points & digit groups too well. But for now all
tests pass.
2014-07-03 10:26:16 +04:00
|
|
|
prec = maximum $ map asprecision ss
|
|
|
|
mdec = Just $ headDef '.' $ catMaybes $ map asdecimalpoint ss
|
2015-11-22 20:21:36 +03:00
|
|
|
-- precision is that of first amount with a decimal point
|
|
|
|
-- (mdec, prec) =
|
|
|
|
-- case filter (isJust . asdecimalpoint) ss of
|
|
|
|
-- (s:_) -> (asdecimalpoint s, asprecision s)
|
|
|
|
-- [] -> (Just '.', 0)
|
2010-05-22 23:00:20 +04:00
|
|
|
|
2012-04-14 02:24:55 +04:00
|
|
|
-- -- | Apply this journal's historical price records to unpriced amounts where possible.
|
2015-08-10 02:20:02 +03:00
|
|
|
-- journalApplyMarketPrices :: Journal -> Journal
|
|
|
|
-- journalApplyMarketPrices j@Journal{jtxns=ts} = j{jtxns=map fixtransaction ts}
|
2012-04-14 02:24:55 +04:00
|
|
|
-- where
|
|
|
|
-- fixtransaction t@Transaction{tdate=d, tpostings=ps} = t{tpostings=map fixposting ps}
|
|
|
|
-- where
|
|
|
|
-- fixposting p@Posting{pamount=a} = p{pamount=fixmixedamount a}
|
|
|
|
-- fixmixedamount (Mixed as) = Mixed $ map fixamount as
|
|
|
|
-- fixamount = fixprice
|
|
|
|
-- fixprice a@Amount{price=Just _} = a
|
2015-08-10 02:20:02 +03:00
|
|
|
-- fixprice a@Amount{commodity=c} = a{price=maybe Nothing (Just . UnitPrice) $ journalMarketPriceFor j d c}
|
2012-04-14 02:24:55 +04:00
|
|
|
|
|
|
|
-- -- | Get the price for a commodity on the specified day from the price database, if known.
|
|
|
|
-- -- Does only one lookup step, ie will not look up the price of a price.
|
2016-05-08 02:18:04 +03:00
|
|
|
-- journalMarketPriceFor :: Journal -> Day -> CommoditySymbol -> Maybe MixedAmount
|
|
|
|
-- journalMarketPriceFor j d CommoditySymbol{symbol=s} = do
|
2015-08-10 02:20:02 +03:00
|
|
|
-- let ps = reverse $ filter ((<= d).mpdate) $ filter ((s==).hsymbol) $ sortBy (comparing mpdate) $ jmarketprices j
|
|
|
|
-- case ps of (MarketPrice{mpamount=a}:_) -> Just a
|
2012-04-14 02:24:55 +04:00
|
|
|
-- _ -> Nothing
|
2010-05-23 00:23:36 +04:00
|
|
|
|
|
|
|
-- | Convert all this journal's amounts to cost by applying their prices, if any.
|
|
|
|
journalConvertAmountsToCost :: Journal -> Journal
|
|
|
|
journalConvertAmountsToCost j@Journal{jtxns=ts} = j{jtxns=map fixtransaction ts}
|
|
|
|
where
|
2015-11-22 20:21:36 +03:00
|
|
|
-- similar to journalApplyCommodityStyles
|
2010-05-23 00:23:36 +04:00
|
|
|
fixtransaction t@Transaction{tpostings=ps} = t{tpostings=map fixposting ps}
|
|
|
|
fixposting p@Posting{pamount=a} = p{pamount=fixmixedamount a}
|
|
|
|
fixmixedamount (Mixed as) = Mixed $ map fixamount as
|
2016-05-23 10:32:55 +03:00
|
|
|
fixamount = canonicaliseAmount (jinferredcommodities j) . costOfAmount
|
2012-11-20 01:20:10 +04:00
|
|
|
|
|
|
|
-- -- | Get this journal's unique, display-preference-canonicalised commodities, by symbol.
|
2016-05-08 02:18:04 +03:00
|
|
|
-- journalCanonicalCommodities :: Journal -> M.Map String CommoditySymbol
|
2012-11-20 01:20:10 +04:00
|
|
|
-- journalCanonicalCommodities j = canonicaliseCommodities $ journalAmountCommodities j
|
2010-05-23 00:23:36 +04:00
|
|
|
|
2012-11-20 01:20:10 +04:00
|
|
|
-- -- | Get all this journal's amounts' commodities, in the order parsed.
|
2016-05-08 02:18:04 +03:00
|
|
|
-- journalAmountCommodities :: Journal -> [CommoditySymbol]
|
2012-11-20 01:20:10 +04:00
|
|
|
-- journalAmountCommodities = map acommodity . concatMap amounts . journalAmounts
|
2010-05-23 00:23:36 +04:00
|
|
|
|
2012-11-20 01:20:10 +04:00
|
|
|
-- -- | Get all this journal's amount and price commodities, in the order parsed.
|
2016-05-08 02:18:04 +03:00
|
|
|
-- journalAmountAndPriceCommodities :: Journal -> [CommoditySymbol]
|
2012-11-20 01:20:10 +04:00
|
|
|
-- journalAmountAndPriceCommodities = concatMap amountCommodities . concatMap amounts . journalAmounts
|
2010-05-23 00:23:36 +04:00
|
|
|
|
2012-11-20 01:20:10 +04:00
|
|
|
-- -- | Get this amount's commodity and any commodities referenced in its price.
|
2016-05-08 02:18:04 +03:00
|
|
|
-- amountCommodities :: Amount -> [CommoditySymbol]
|
2012-11-20 01:20:10 +04:00
|
|
|
-- amountCommodities Amount{acommodity=c,aprice=p} =
|
|
|
|
-- case p of Nothing -> [c]
|
|
|
|
-- Just (UnitPrice ma) -> c:(concatMap amountCommodities $ amounts ma)
|
|
|
|
-- Just (TotalPrice ma) -> c:(concatMap amountCommodities $ amounts ma)
|
2010-05-23 00:23:36 +04:00
|
|
|
|
2015-10-12 02:07:31 +03:00
|
|
|
-- | Get an ordered list of the amounts in this journal which will
|
|
|
|
-- influence amount style canonicalisation. These are:
|
|
|
|
--
|
|
|
|
-- * amounts in market price directives (in parse order)
|
|
|
|
-- * amounts in postings (in parse order)
|
|
|
|
--
|
|
|
|
-- Amounts in default commodity directives also influence
|
|
|
|
-- canonicalisation, but earlier, as amounts are parsed.
|
|
|
|
-- Amounts in posting prices are not used for canonicalisation.
|
|
|
|
--
|
2012-11-20 01:20:10 +04:00
|
|
|
journalAmounts :: Journal -> [Amount]
|
2015-10-12 02:07:31 +03:00
|
|
|
journalAmounts j =
|
|
|
|
concat
|
|
|
|
[map mpamount $ jmarketprices j
|
|
|
|
,concatMap flatten $ map pamount $ journalPostings j
|
|
|
|
]
|
|
|
|
where flatten (Mixed as) = as
|
2008-11-22 23:35:17 +03:00
|
|
|
|
2014-04-25 01:44:30 +04:00
|
|
|
-- | The fully specified date span enclosing the dates (primary or secondary)
|
|
|
|
-- of all this journal's transactions and postings, or DateSpan Nothing Nothing
|
2014-04-25 01:28:20 +04:00
|
|
|
-- if there are none.
|
2014-04-25 01:44:30 +04:00
|
|
|
journalDateSpan :: Bool -> Journal -> DateSpan
|
|
|
|
journalDateSpan secondary j
|
2014-04-25 01:28:20 +04:00
|
|
|
| null ts = DateSpan Nothing Nothing
|
|
|
|
| otherwise = DateSpan (Just earliest) (Just $ addDays 1 latest)
|
2009-04-04 15:19:15 +04:00
|
|
|
where
|
2014-04-25 01:28:20 +04:00
|
|
|
earliest = minimum dates
|
|
|
|
latest = maximum dates
|
|
|
|
dates = pdates ++ tdates
|
2014-04-25 01:44:30 +04:00
|
|
|
tdates = map (if secondary then transactionDate2 else tdate) ts
|
|
|
|
pdates = concatMap (catMaybes . map (if secondary then (Just . postingDate2) else pdate) . tpostings) ts
|
2014-04-25 01:28:20 +04:00
|
|
|
ts = jtxns j
|
|
|
|
|
|
|
|
-- #ifdef TESTS
|
|
|
|
test_journalDateSpan = do
|
|
|
|
"journalDateSpan" ~: do
|
|
|
|
assertEqual "" (DateSpan (Just $ fromGregorian 2014 1 10) (Just $ fromGregorian 2014 10 11))
|
2014-04-25 01:44:30 +04:00
|
|
|
(journalDateSpan True j)
|
2014-04-25 01:28:20 +04:00
|
|
|
where
|
|
|
|
j = nulljournal{jtxns = [nulltransaction{tdate = parsedate "2014/02/01"
|
|
|
|
,tpostings = [posting{pdate=Just (parsedate "2014/01/10")}]
|
|
|
|
}
|
|
|
|
,nulltransaction{tdate = parsedate "2014/09/01"
|
2014-04-25 01:44:30 +04:00
|
|
|
,tpostings = [posting{pdate2=Just (parsedate "2014/10/10")}]
|
2014-04-25 01:28:20 +04:00
|
|
|
}
|
|
|
|
]}
|
|
|
|
-- #endif
|
2009-05-29 15:31:51 +04:00
|
|
|
|
2012-04-14 05:12:42 +04:00
|
|
|
-- Misc helpers
|
|
|
|
|
2010-07-13 10:30:06 +04:00
|
|
|
-- | Check if a set of hledger account/description filter patterns matches the
|
2009-05-29 15:31:51 +04:00
|
|
|
-- given account name or entry description. Patterns are case-insensitive
|
2010-04-14 20:19:01 +04:00
|
|
|
-- regular expressions. Prefixed with not:, they become anti-patterns.
|
2009-05-29 15:31:51 +04:00
|
|
|
matchpats :: [String] -> String -> Bool
|
|
|
|
matchpats pats str =
|
|
|
|
(null positives || any match positives) && (null negatives || not (any match negatives))
|
|
|
|
where
|
|
|
|
(negatives,positives) = partition isnegativepat pats
|
|
|
|
match "" = True
|
2011-06-09 01:52:10 +04:00
|
|
|
match pat = regexMatchesCI (abspat pat) str
|
2010-04-16 03:08:27 +04:00
|
|
|
|
|
|
|
negateprefix = "not:"
|
|
|
|
|
|
|
|
isnegativepat = (negateprefix `isPrefixOf`)
|
|
|
|
|
|
|
|
abspat pat = if isnegativepat pat then drop (length negateprefix) pat else pat
|
2009-12-21 08:23:07 +03:00
|
|
|
|
2011-08-30 15:37:36 +04:00
|
|
|
-- debug helpers
|
2012-11-20 01:20:10 +04:00
|
|
|
-- traceAmountPrecision a = trace (show $ map (precision . acommodity) $ amounts a) a
|
|
|
|
-- tracePostingsCommodities ps = trace (show $ map ((map (precision . acommodity) . amounts) . pamount) ps) ps
|
2011-08-30 15:37:36 +04:00
|
|
|
|
2012-04-14 05:12:42 +04:00
|
|
|
-- tests
|
|
|
|
|
2012-05-27 22:14:20 +04:00
|
|
|
-- A sample journal for testing, similar to data/sample.journal:
|
|
|
|
--
|
|
|
|
-- 2008/01/01 income
|
|
|
|
-- assets:bank:checking $1
|
|
|
|
-- income:salary
|
|
|
|
--
|
|
|
|
-- 2008/06/01 gift
|
|
|
|
-- assets:bank:checking $1
|
|
|
|
-- income:gifts
|
|
|
|
--
|
|
|
|
-- 2008/06/02 save
|
|
|
|
-- assets:bank:saving $1
|
|
|
|
-- assets:bank:checking
|
|
|
|
--
|
|
|
|
-- 2008/06/03 * eat & shop
|
|
|
|
-- expenses:food $1
|
|
|
|
-- expenses:supplies $1
|
|
|
|
-- assets:cash
|
|
|
|
--
|
|
|
|
-- 2008/12/31 * pay off
|
|
|
|
-- liabilities:debts $1
|
|
|
|
-- assets:bank:checking
|
|
|
|
--
|
2014-09-11 00:07:53 +04:00
|
|
|
Right samplejournal = journalBalanceTransactions $
|
2012-11-20 01:20:10 +04:00
|
|
|
nulljournal
|
|
|
|
{jtxns = [
|
2012-05-27 22:14:20 +04:00
|
|
|
txnTieKnot $ Transaction {
|
2015-10-30 06:12:46 +03:00
|
|
|
tindex=0,
|
2014-08-01 04:32:42 +04:00
|
|
|
tsourcepos=nullsourcepos,
|
2012-05-27 22:14:20 +04:00
|
|
|
tdate=parsedate "2008/01/01",
|
2012-12-06 08:43:41 +04:00
|
|
|
tdate2=Nothing,
|
2015-05-16 21:51:35 +03:00
|
|
|
tstatus=Uncleared,
|
2012-05-27 22:14:20 +04:00
|
|
|
tcode="",
|
|
|
|
tdescription="income",
|
|
|
|
tcomment="",
|
2012-05-28 02:59:06 +04:00
|
|
|
ttags=[],
|
2012-12-06 04:03:07 +04:00
|
|
|
tpostings=
|
|
|
|
["assets:bank:checking" `post` usd 1
|
|
|
|
,"income:salary" `post` missingamt
|
|
|
|
],
|
2012-05-27 22:14:20 +04:00
|
|
|
tpreceding_comment_lines=""
|
|
|
|
}
|
|
|
|
,
|
|
|
|
txnTieKnot $ Transaction {
|
2015-10-30 06:12:46 +03:00
|
|
|
tindex=0,
|
2014-08-01 04:32:42 +04:00
|
|
|
tsourcepos=nullsourcepos,
|
2012-05-27 22:14:20 +04:00
|
|
|
tdate=parsedate "2008/06/01",
|
2012-12-06 08:43:41 +04:00
|
|
|
tdate2=Nothing,
|
2015-05-16 21:51:35 +03:00
|
|
|
tstatus=Uncleared,
|
2012-05-27 22:14:20 +04:00
|
|
|
tcode="",
|
|
|
|
tdescription="gift",
|
|
|
|
tcomment="",
|
2012-05-28 02:59:06 +04:00
|
|
|
ttags=[],
|
2012-12-06 04:03:07 +04:00
|
|
|
tpostings=
|
|
|
|
["assets:bank:checking" `post` usd 1
|
|
|
|
,"income:gifts" `post` missingamt
|
|
|
|
],
|
2012-05-27 22:14:20 +04:00
|
|
|
tpreceding_comment_lines=""
|
|
|
|
}
|
|
|
|
,
|
|
|
|
txnTieKnot $ Transaction {
|
2015-10-30 06:12:46 +03:00
|
|
|
tindex=0,
|
2014-08-01 04:32:42 +04:00
|
|
|
tsourcepos=nullsourcepos,
|
2012-05-27 22:14:20 +04:00
|
|
|
tdate=parsedate "2008/06/02",
|
2012-12-06 08:43:41 +04:00
|
|
|
tdate2=Nothing,
|
2015-05-16 21:51:35 +03:00
|
|
|
tstatus=Uncleared,
|
2012-05-27 22:14:20 +04:00
|
|
|
tcode="",
|
|
|
|
tdescription="save",
|
|
|
|
tcomment="",
|
2012-05-28 02:59:06 +04:00
|
|
|
ttags=[],
|
2012-12-06 04:03:07 +04:00
|
|
|
tpostings=
|
|
|
|
["assets:bank:saving" `post` usd 1
|
|
|
|
,"assets:bank:checking" `post` usd (-1)
|
|
|
|
],
|
2012-05-27 22:14:20 +04:00
|
|
|
tpreceding_comment_lines=""
|
|
|
|
}
|
|
|
|
,
|
|
|
|
txnTieKnot $ Transaction {
|
2015-10-30 06:12:46 +03:00
|
|
|
tindex=0,
|
2014-08-01 04:32:42 +04:00
|
|
|
tsourcepos=nullsourcepos,
|
2012-05-27 22:14:20 +04:00
|
|
|
tdate=parsedate "2008/06/03",
|
2012-12-06 08:43:41 +04:00
|
|
|
tdate2=Nothing,
|
2015-05-16 21:51:35 +03:00
|
|
|
tstatus=Cleared,
|
2012-05-27 22:14:20 +04:00
|
|
|
tcode="",
|
|
|
|
tdescription="eat & shop",
|
|
|
|
tcomment="",
|
2012-05-28 02:59:06 +04:00
|
|
|
ttags=[],
|
2012-12-06 04:03:07 +04:00
|
|
|
tpostings=["expenses:food" `post` usd 1
|
|
|
|
,"expenses:supplies" `post` usd 1
|
|
|
|
,"assets:cash" `post` missingamt
|
|
|
|
],
|
2012-05-27 22:14:20 +04:00
|
|
|
tpreceding_comment_lines=""
|
|
|
|
}
|
|
|
|
,
|
|
|
|
txnTieKnot $ Transaction {
|
2015-10-30 06:12:46 +03:00
|
|
|
tindex=0,
|
2014-08-01 04:32:42 +04:00
|
|
|
tsourcepos=nullsourcepos,
|
2012-05-27 22:14:20 +04:00
|
|
|
tdate=parsedate "2008/12/31",
|
2012-12-06 08:43:41 +04:00
|
|
|
tdate2=Nothing,
|
2015-05-16 21:51:35 +03:00
|
|
|
tstatus=Uncleared,
|
2012-05-27 22:14:20 +04:00
|
|
|
tcode="",
|
|
|
|
tdescription="pay off",
|
|
|
|
tcomment="",
|
2012-05-28 02:59:06 +04:00
|
|
|
ttags=[],
|
2012-12-06 04:03:07 +04:00
|
|
|
tpostings=["liabilities:debts" `post` usd 1
|
|
|
|
,"assets:bank:checking" `post` usd (-1)
|
|
|
|
],
|
2012-05-27 22:14:20 +04:00
|
|
|
tpreceding_comment_lines=""
|
|
|
|
}
|
|
|
|
]
|
2012-11-20 01:20:10 +04:00
|
|
|
}
|
2012-05-27 22:14:20 +04:00
|
|
|
|
|
|
|
tests_Hledger_Data_Journal = TestList $
|
2012-10-21 21:18:18 +04:00
|
|
|
[
|
2014-04-25 01:28:20 +04:00
|
|
|
test_journalDateSpan
|
2012-04-14 05:12:42 +04:00
|
|
|
-- "query standard account types" ~:
|
|
|
|
-- do
|
|
|
|
-- let j = journal1
|
|
|
|
-- journalBalanceSheetAccountNames j `is` ["assets","assets:a","equity","equity:q","equity:q:qq","liabilities","liabilities:l"]
|
|
|
|
-- journalProfitAndLossAccountNames j `is` ["expenses","expenses:e","income","income:i"]
|
2012-10-21 21:18:18 +04:00
|
|
|
]
|