There are no modules which depend on Hledger.Data.Commodity which don't also depend on Hledger.Data.Amount. Though Hledger.Data.Amount is a very large module and might be broken up, Hledger.Data.Commodity only defines three very small functions which are used, and so can be combined with little cost.
		
			
				
	
	
		
			64 lines
		
	
	
		
			1.9 KiB
		
	
	
	
		
			Haskell
		
	
	
	
	
	
			
		
		
	
	
			64 lines
		
	
	
		
			1.9 KiB
		
	
	
	
		
			Haskell
		
	
	
	
	
	
| {-# LANGUAGE OverloadedStrings #-}
 | |
| {-|
 | |
| 
 | |
| The Hledger.Data library allows parsing and querying of C++ ledger-style
 | |
| journal files.  It generally provides a compatible subset of C++ ledger's
 | |
| functionality.  This package re-exports all the Hledger.Data.* modules
 | |
| (except UTF8, which requires an explicit import.)
 | |
| 
 | |
| -}
 | |
| 
 | |
| module Hledger.Data (
 | |
|                module Hledger.Data.Account,
 | |
|                module Hledger.Data.AccountName,
 | |
|                module Hledger.Data.Amount,
 | |
|                module Hledger.Data.Dates,
 | |
|                module Hledger.Data.Journal,
 | |
|                module Hledger.Data.Json,
 | |
|                module Hledger.Data.Ledger,
 | |
|                module Hledger.Data.Period,
 | |
|                module Hledger.Data.PeriodicTransaction,
 | |
|                module Hledger.Data.Posting,
 | |
|                module Hledger.Data.RawOptions,
 | |
|                module Hledger.Data.StringFormat,
 | |
|                module Hledger.Data.Timeclock,
 | |
|                module Hledger.Data.Transaction,
 | |
|                module Hledger.Data.TransactionModifier,
 | |
|                module Hledger.Data.Types,
 | |
|                module Hledger.Data.Valuation,
 | |
|                tests_Data
 | |
|               )
 | |
| where
 | |
| 
 | |
| import Hledger.Data.Account
 | |
| import Hledger.Data.AccountName
 | |
| import Hledger.Data.Amount
 | |
| import Hledger.Data.Dates
 | |
| import Hledger.Data.Journal
 | |
| import Hledger.Data.Json
 | |
| import Hledger.Data.Ledger
 | |
| import Hledger.Data.Period
 | |
| import Hledger.Data.PeriodicTransaction
 | |
| import Hledger.Data.Posting
 | |
| import Hledger.Data.RawOptions
 | |
| import Hledger.Data.StringFormat
 | |
| import Hledger.Data.Timeclock
 | |
| import Hledger.Data.Transaction
 | |
| import Hledger.Data.TransactionModifier
 | |
| import Hledger.Data.Types hiding (MixedAmountKey, Mixed)
 | |
| import Hledger.Data.Valuation
 | |
| import Hledger.Utils.Test
 | |
| 
 | |
| tests_Data = tests "Data" [
 | |
|    tests_AccountName
 | |
|   ,tests_Amount
 | |
|   ,tests_Dates
 | |
|   ,tests_Journal
 | |
|   ,tests_Ledger
 | |
|   ,tests_Posting
 | |
|   ,tests_Valuation
 | |
|   ,tests_StringFormat
 | |
|   ,tests_Timeclock
 | |
|   ,tests_Transaction
 | |
|   ]
 |