mirror of
https://github.com/simonmichael/hledger.git
synced 2025-01-06 02:23:46 +03:00
a7f6b551c5
Of the 2 tests, the first is a simple test on a specific period. The second is expected to fail at this point until the new upcoming code to fix the issue with the history option is implemented. For the record : this issue happens when we use the -H flag for a period that does not contain any transactions. Currently, the ending balance values are only taken into account if the current period contains a Transaction containing one of the previous populated accounts. For example, if we have a statement on the 2008/01/01 for $1 and we do a command (with -H) to check the value on the (without transactions) 2008/01/02, we will not get the $1 from 2008/01/01. In that same example, if we had a transaction for the same account as 2008/01/01 in say 2008/01/03 then the -H command would successfully show the statement from 2008/01/03 with the initial amount that we set in 2008/01/01.
45 lines
1.3 KiB
Haskell
45 lines
1.3 KiB
Haskell
{-# LANGUAGE RecordWildCards, DeriveDataTypeable, FlexibleInstances #-}
|
|
{-|
|
|
|
|
Generate several common kinds of report from a journal, as \"*Report\" -
|
|
simple intermediate data structures intended to be easily rendered as
|
|
text, html, json, csv etc. by hledger commands, hamlet templates,
|
|
javascript, or whatever.
|
|
|
|
-}
|
|
|
|
module Hledger.Reports (
|
|
module Hledger.Reports.ReportOptions,
|
|
module Hledger.Reports.EntriesReport,
|
|
module Hledger.Reports.PostingsReport,
|
|
module Hledger.Reports.TransactionsReports,
|
|
module Hledger.Reports.BalanceReport,
|
|
module Hledger.Reports.MultiBalanceReports,
|
|
-- module Hledger.Reports.BalanceHistoryReport,
|
|
|
|
-- * Tests
|
|
tests_Hledger_Reports
|
|
)
|
|
where
|
|
|
|
import Test.HUnit
|
|
|
|
import Hledger.Reports.ReportOptions
|
|
import Hledger.Reports.EntriesReport
|
|
import Hledger.Reports.PostingsReport
|
|
import Hledger.Reports.TransactionsReports
|
|
import Hledger.Reports.BalanceReport
|
|
import Hledger.Reports.MultiBalanceReports
|
|
-- import Hledger.Reports.BalanceHistoryReport
|
|
|
|
tests_Hledger_Reports :: Test
|
|
tests_Hledger_Reports = TestList $
|
|
-- ++ tests_isInterestingIndented
|
|
[
|
|
tests_Hledger_Reports_ReportOptions,
|
|
tests_Hledger_Reports_EntriesReport,
|
|
tests_Hledger_Reports_PostingsReport,
|
|
tests_Hledger_Reports_BalanceReport,
|
|
tests_Hledger_Reports_MultiBalanceReport
|
|
]
|