mirror of
https://github.com/simonmichael/hledger.git
synced 2025-01-06 02:23:46 +03:00
f673e7c2eb
functions to AccountTransactionsReport. If you use transactionsReport, you should either use entryReport if you don't require a running total, or using accountTransactionsReport with thisacctq as Any or None (depending on what you want included in the running total).
45 lines
1.2 KiB
Haskell
45 lines
1.2 KiB
Haskell
{-# LANGUAGE FlexibleInstances #-}
|
|
{-# LANGUAGE OverloadedStrings #-}
|
|
|
|
{-|
|
|
|
|
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.ReportTypes,
|
|
module Hledger.Reports.EntriesReport,
|
|
module Hledger.Reports.PostingsReport,
|
|
module Hledger.Reports.AccountTransactionsReport,
|
|
module Hledger.Reports.BalanceReport,
|
|
module Hledger.Reports.MultiBalanceReport,
|
|
module Hledger.Reports.BudgetReport,
|
|
-- * Tests
|
|
tests_Reports
|
|
)
|
|
where
|
|
|
|
import Hledger.Reports.ReportOptions
|
|
import Hledger.Reports.ReportTypes
|
|
import Hledger.Reports.AccountTransactionsReport
|
|
import Hledger.Reports.EntriesReport
|
|
import Hledger.Reports.PostingsReport
|
|
import Hledger.Reports.BalanceReport
|
|
import Hledger.Reports.MultiBalanceReport
|
|
import Hledger.Reports.BudgetReport
|
|
import Hledger.Utils.Test
|
|
|
|
tests_Reports = tests "Reports" [
|
|
tests_BalanceReport
|
|
,tests_BudgetReport
|
|
,tests_AccountTransactionsReport
|
|
,tests_EntriesReport
|
|
,tests_MultiBalanceReport
|
|
,tests_PostingsReport
|
|
]
|