2008-10-01 04:29:58 +04:00
|
|
|
|
{-|
|
2008-10-03 06:28:58 +04:00
|
|
|
|
|
2008-10-08 22:25:51 +04:00
|
|
|
|
Parsers for standard ledger and timelog files.
|
|
|
|
|
|
|
|
|
|
-}
|
|
|
|
|
|
|
|
|
|
module Ledger.Parse
|
|
|
|
|
where
|
2009-05-15 00:44:06 +04:00
|
|
|
|
import Prelude hiding (readFile, putStr, print)
|
2008-12-08 04:49:31 +03:00
|
|
|
|
import Control.Monad.Error
|
2008-10-08 22:25:51 +04:00
|
|
|
|
import Text.ParserCombinators.Parsec
|
2008-10-15 03:14:31 +04:00
|
|
|
|
import Text.ParserCombinators.Parsec.Char
|
|
|
|
|
import Text.ParserCombinators.Parsec.Combinator
|
2008-12-10 20:40:05 +03:00
|
|
|
|
import System.Directory
|
2009-05-15 00:44:06 +04:00
|
|
|
|
import System.IO.UTF8
|
|
|
|
|
import System.IO (stdin)
|
2008-10-08 22:25:51 +04:00
|
|
|
|
import Ledger.Utils
|
|
|
|
|
import Ledger.Types
|
2008-11-27 03:35:00 +03:00
|
|
|
|
import Ledger.Dates
|
2009-06-05 22:02:22 +04:00
|
|
|
|
import Ledger.AccountName (accountNameFromComponents,accountNameComponents)
|
2008-10-13 01:52:48 +04:00
|
|
|
|
import Ledger.Amount
|
2009-04-03 14:58:05 +04:00
|
|
|
|
import Ledger.LedgerTransaction
|
2009-05-25 21:28:41 +04:00
|
|
|
|
import Ledger.Posting
|
2008-12-08 04:49:31 +03:00
|
|
|
|
import Ledger.RawLedger
|
2009-02-05 00:27:20 +03:00
|
|
|
|
import System.FilePath(takeDirectory,combine)
|
2008-10-08 22:25:51 +04:00
|
|
|
|
|
2008-10-10 05:53:39 +04:00
|
|
|
|
|
2008-10-08 22:25:51 +04:00
|
|
|
|
-- utils
|
|
|
|
|
|
2009-01-25 00:15:38 +03:00
|
|
|
|
-- | Some context kept during parsing.
|
|
|
|
|
data LedgerFileCtx = Ctx {
|
2009-01-25 10:06:59 +03:00
|
|
|
|
ctxYear :: !(Maybe Integer) -- ^ the default year most recently specified with Y
|
2009-01-25 00:46:09 +03:00
|
|
|
|
, ctxCommod :: !(Maybe String) -- ^ I don't know
|
|
|
|
|
, ctxAccount :: ![String] -- ^ the current stack of "container" accounts specified by !account
|
2009-01-25 00:15:38 +03:00
|
|
|
|
} deriving (Read, Show)
|
2008-12-08 04:49:31 +03:00
|
|
|
|
|
|
|
|
|
emptyCtx :: LedgerFileCtx
|
2009-01-25 10:06:59 +03:00
|
|
|
|
emptyCtx = Ctx { ctxYear = Nothing, ctxCommod = Nothing, ctxAccount = [] }
|
2008-12-08 04:49:31 +03:00
|
|
|
|
|
2009-01-25 00:15:38 +03:00
|
|
|
|
-- containing accounts "nest" hierarchically
|
|
|
|
|
|
2008-12-08 10:21:33 +03:00
|
|
|
|
pushParentAccount :: String -> GenParser tok LedgerFileCtx ()
|
|
|
|
|
pushParentAccount parent = updateState addParentAccount
|
|
|
|
|
where addParentAccount ctx0 = ctx0 { ctxAccount = normalize parent : ctxAccount ctx0 }
|
|
|
|
|
normalize = (++ ":")
|
|
|
|
|
|
|
|
|
|
popParentAccount :: GenParser tok LedgerFileCtx ()
|
|
|
|
|
popParentAccount = do ctx0 <- getState
|
|
|
|
|
case ctxAccount ctx0 of
|
|
|
|
|
[] -> unexpected "End of account block with no beginning"
|
|
|
|
|
(_:rest) -> setState $ ctx0 { ctxAccount = rest }
|
|
|
|
|
|
|
|
|
|
getParentAccount :: GenParser tok LedgerFileCtx String
|
|
|
|
|
getParentAccount = liftM (concat . reverse . ctxAccount) getState
|
|
|
|
|
|
2009-01-23 02:42:34 +03:00
|
|
|
|
setYear :: Integer -> GenParser tok LedgerFileCtx ()
|
|
|
|
|
setYear y = updateState (\ctx -> ctx{ctxYear=Just y})
|
|
|
|
|
|
|
|
|
|
getYear :: GenParser tok LedgerFileCtx (Maybe Integer)
|
|
|
|
|
getYear = liftM ctxYear getState
|
|
|
|
|
|
2009-01-25 10:06:59 +03:00
|
|
|
|
printParseError :: (Show a) => a -> IO ()
|
|
|
|
|
printParseError e = do putStr "ledger parse error at "; print e
|
2009-01-25 00:46:09 +03:00
|
|
|
|
|
2009-01-25 00:15:38 +03:00
|
|
|
|
-- let's get to it
|
|
|
|
|
|
2009-01-25 10:06:59 +03:00
|
|
|
|
parseLedgerFile :: LocalTime -> FilePath -> ErrorT String IO RawLedger
|
|
|
|
|
parseLedgerFile t "-" = liftIO (hGetContents stdin) >>= parseLedger t "-"
|
2009-04-16 10:34:32 +04:00
|
|
|
|
parseLedgerFile t f = liftIO (readFile f) >>= parseLedger t f
|
2009-01-25 00:15:38 +03:00
|
|
|
|
|
2009-01-25 10:06:59 +03:00
|
|
|
|
-- | Parses the contents of a ledger file, or gives an error. Requires
|
|
|
|
|
-- the current (local) time to calculate any unfinished timelog sessions,
|
|
|
|
|
-- we pass it in for repeatability.
|
|
|
|
|
parseLedger :: LocalTime -> FilePath -> String -> ErrorT String IO RawLedger
|
|
|
|
|
parseLedger reftime inname intxt = do
|
|
|
|
|
case runParser ledgerFile emptyCtx inname intxt of
|
|
|
|
|
Right m -> liftM (rawLedgerConvertTimeLog reftime) $ m `ap` (return rawLedgerEmpty)
|
|
|
|
|
Left err -> throwError $ show err
|
2008-12-08 04:49:31 +03:00
|
|
|
|
|
2008-12-08 10:21:33 +03:00
|
|
|
|
|
2008-12-08 04:49:31 +03:00
|
|
|
|
ledgerFile :: GenParser Char LedgerFileCtx (ErrorT String IO (RawLedger -> RawLedger))
|
2009-04-10 09:42:26 +04:00
|
|
|
|
ledgerFile = do items <- many ledgerItem
|
2008-12-08 04:49:31 +03:00
|
|
|
|
eof
|
2009-04-10 09:42:26 +04:00
|
|
|
|
return $ liftM (foldr (.) id) $ sequence items
|
2009-04-10 09:40:57 +04:00
|
|
|
|
where
|
|
|
|
|
-- As all ledger line types can be distinguished by the first
|
|
|
|
|
-- character, excepting transactions versus empty (blank or
|
|
|
|
|
-- comment-only) lines, can use choice w/o try
|
|
|
|
|
ledgerItem = choice [ ledgerDirective
|
|
|
|
|
, liftM (return . addLedgerTransaction) ledgerTransaction
|
|
|
|
|
, liftM (return . addModifierTransaction) ledgerModifierTransaction
|
|
|
|
|
, liftM (return . addPeriodicTransaction) ledgerPeriodicTransaction
|
|
|
|
|
, liftM (return . addHistoricalPrice) ledgerHistoricalPrice
|
|
|
|
|
, ledgerDefaultYear
|
|
|
|
|
, emptyLine >> return (return id)
|
|
|
|
|
, liftM (return . addTimeLogEntry) timelogentry
|
|
|
|
|
]
|
2008-12-08 04:49:31 +03:00
|
|
|
|
|
2008-12-08 10:21:33 +03:00
|
|
|
|
ledgerDirective :: GenParser Char LedgerFileCtx (ErrorT String IO (RawLedger -> RawLedger))
|
2009-04-10 08:38:46 +04:00
|
|
|
|
ledgerDirective = do char '!' <?> "directive"
|
2008-12-08 10:21:33 +03:00
|
|
|
|
directive <- many nonspace
|
|
|
|
|
case directive of
|
|
|
|
|
"include" -> ledgerInclude
|
|
|
|
|
"account" -> ledgerAccountBegin
|
|
|
|
|
"end" -> ledgerAccountEnd
|
2009-06-05 13:44:20 +04:00
|
|
|
|
_ -> mzero
|
2008-12-08 10:21:33 +03:00
|
|
|
|
|
2008-12-08 04:49:31 +03:00
|
|
|
|
ledgerInclude :: GenParser Char LedgerFileCtx (ErrorT String IO (RawLedger -> RawLedger))
|
2008-12-08 10:21:33 +03:00
|
|
|
|
ledgerInclude = do many1 spacenonewline
|
2008-12-08 04:49:31 +03:00
|
|
|
|
filename <- restofline
|
|
|
|
|
outerState <- getState
|
|
|
|
|
outerPos <- getPosition
|
|
|
|
|
let inIncluded = show outerPos ++ " in included file " ++ show filename ++ ":\n"
|
2009-02-05 00:27:20 +03:00
|
|
|
|
return $ do contents <- expandPath outerPos filename >>= readFileE outerPos
|
2008-12-08 04:49:31 +03:00
|
|
|
|
case runParser ledgerFile outerState filename contents of
|
2009-09-22 19:56:59 +04:00
|
|
|
|
Right l -> l `catchError` (throwError . (inIncluded ++))
|
2008-12-08 04:49:31 +03:00
|
|
|
|
Left perr -> throwError $ inIncluded ++ show perr
|
|
|
|
|
where readFileE outerPos filename = ErrorT $ do (liftM Right $ readFile filename) `catch` leftError
|
|
|
|
|
where leftError err = return $ Left $ currentPos ++ whileReading ++ show err
|
|
|
|
|
currentPos = show outerPos
|
|
|
|
|
whileReading = " reading " ++ show filename ++ ":\n"
|
|
|
|
|
|
2009-02-05 00:27:20 +03:00
|
|
|
|
expandPath :: (MonadIO m) => SourcePos -> FilePath -> m FilePath
|
|
|
|
|
expandPath pos fp = liftM mkRelative (expandHome fp)
|
|
|
|
|
where
|
|
|
|
|
mkRelative = combine (takeDirectory (sourceName pos))
|
|
|
|
|
expandHome inname | "~/" `isPrefixOf` inname = do homedir <- liftIO getHomeDirectory
|
|
|
|
|
return $ homedir ++ drop 1 inname
|
|
|
|
|
| otherwise = return inname
|
2008-12-10 20:40:05 +03:00
|
|
|
|
|
2008-12-08 10:21:33 +03:00
|
|
|
|
ledgerAccountBegin :: GenParser Char LedgerFileCtx (ErrorT String IO (RawLedger -> RawLedger))
|
|
|
|
|
ledgerAccountBegin = do many1 spacenonewline
|
|
|
|
|
parent <- ledgeraccountname
|
|
|
|
|
newline
|
|
|
|
|
pushParentAccount parent
|
|
|
|
|
return $ return id
|
2008-12-08 04:49:31 +03:00
|
|
|
|
|
2008-12-08 10:21:33 +03:00
|
|
|
|
ledgerAccountEnd :: GenParser Char LedgerFileCtx (ErrorT String IO (RawLedger -> RawLedger))
|
|
|
|
|
ledgerAccountEnd = popParentAccount >> return (return id)
|
2008-10-08 22:25:51 +04:00
|
|
|
|
|
|
|
|
|
-- parsers
|
|
|
|
|
|
|
|
|
|
-- | Parse a RawLedger from either a ledger file or a timelog file.
|
|
|
|
|
-- It tries first the timelog parser then the ledger parser; this means
|
|
|
|
|
-- parse errors for ledgers are useful while those for timelogs are not.
|
|
|
|
|
|
|
|
|
|
{-| Parse a ledger file. Here is the ledger grammar from the ledger 2.5 manual:
|
2007-03-12 10:40:33 +03:00
|
|
|
|
|
2008-10-01 05:40:32 +04:00
|
|
|
|
@
|
2008-10-01 04:40:51 +04:00
|
|
|
|
The ledger file format is quite simple, but also very flexible. It supports
|
2007-02-09 04:23:12 +03:00
|
|
|
|
many options, though typically the user can ignore most of them. They are
|
|
|
|
|
summarized below. The initial character of each line determines what the
|
|
|
|
|
line means, and how it should be interpreted. Allowable initial characters
|
|
|
|
|
are:
|
|
|
|
|
|
|
|
|
|
NUMBER A line beginning with a number denotes an entry. It may be followed by any
|
|
|
|
|
number of lines, each beginning with whitespace, to denote the entry’s account
|
2008-10-01 04:40:51 +04:00
|
|
|
|
transactions. The format of the first line is:
|
2007-02-09 04:23:12 +03:00
|
|
|
|
|
|
|
|
|
DATE[=EDATE] [*|!] [(CODE)] DESC
|
|
|
|
|
|
|
|
|
|
If ‘*’ appears after the date (with optional effective date), it indicates the entry
|
|
|
|
|
is “cleared”, which can mean whatever the user wants it t omean. If ‘!’ appears
|
|
|
|
|
after the date, it indicates d the entry is “pending”; i.e., tentatively cleared from
|
|
|
|
|
the user’s point of view, but not yet actually cleared. If a ‘CODE’ appears in
|
|
|
|
|
parentheses, it may be used to indicate a check number, or the type of the
|
|
|
|
|
transaction. Following these is the payee, or a description of the transaction.
|
|
|
|
|
The format of each following transaction is:
|
|
|
|
|
|
|
|
|
|
ACCOUNT AMOUNT [; NOTE]
|
|
|
|
|
|
|
|
|
|
The ‘ACCOUNT’ may be surrounded by parentheses if it is a virtual
|
|
|
|
|
transactions, or square brackets if it is a virtual transactions that must
|
|
|
|
|
balance. The ‘AMOUNT’ can be followed by a per-unit transaction cost,
|
2008-10-01 04:29:58 +04:00
|
|
|
|
by specifying ‘ AMOUNT’, or a complete transaction cost with ‘\@ AMOUNT’.
|
2007-02-09 04:23:12 +03:00
|
|
|
|
Lastly, the ‘NOTE’ may specify an actual and/or effective date for the
|
|
|
|
|
transaction by using the syntax ‘[ACTUAL_DATE]’ or ‘[=EFFECTIVE_DATE]’ or
|
|
|
|
|
‘[ACTUAL_DATE=EFFECtIVE_DATE]’.
|
|
|
|
|
|
|
|
|
|
= An automated entry. A value expression must appear after the equal sign.
|
|
|
|
|
After this initial line there should be a set of one or more transactions, just as
|
|
|
|
|
if it were normal entry. If the amounts of the transactions have no commodity,
|
2008-10-01 04:40:51 +04:00
|
|
|
|
they will be applied as modifiers to whichever real transaction is matched by
|
2007-02-09 04:23:12 +03:00
|
|
|
|
the value expression.
|
|
|
|
|
|
|
|
|
|
~ A period entry. A period expression must appear after the tilde.
|
|
|
|
|
After this initial line there should be a set of one or more transactions, just as
|
|
|
|
|
if it were normal entry.
|
|
|
|
|
|
|
|
|
|
! A line beginning with an exclamation mark denotes a command directive. It
|
|
|
|
|
must be immediately followed by the command word. The supported commands
|
|
|
|
|
are:
|
|
|
|
|
|
|
|
|
|
‘!include’
|
2008-10-01 04:40:51 +04:00
|
|
|
|
Include the stated ledger file.
|
2007-02-09 04:23:12 +03:00
|
|
|
|
‘!account’
|
|
|
|
|
The account name is given is taken to be the parent of all transac-
|
|
|
|
|
tions that follow, until ‘!end’ is seen.
|
|
|
|
|
‘!end’ Ends an account block.
|
|
|
|
|
|
|
|
|
|
; A line beginning with a colon indicates a comment, and is ignored.
|
|
|
|
|
|
|
|
|
|
Y If a line begins with a capital Y, it denotes the year used for all subsequent
|
|
|
|
|
entries that give a date without a year. The year should appear immediately
|
2008-10-01 04:40:51 +04:00
|
|
|
|
after the Y, for example: ‘Y2004’. This is useful at the beginning of a file, to
|
|
|
|
|
specify the year for that file. If all entries specify a year, however, this command
|
2007-02-09 04:23:12 +03:00
|
|
|
|
has no effect.
|
|
|
|
|
|
|
|
|
|
|
2008-10-01 04:40:51 +04:00
|
|
|
|
P Specifies a historical price for a commodity. These are usually found in a pricing
|
|
|
|
|
history file (see the ‘-Q’ option). The syntax is:
|
2007-02-09 04:23:12 +03:00
|
|
|
|
|
|
|
|
|
P DATE SYMBOL PRICE
|
|
|
|
|
|
|
|
|
|
N SYMBOL Indicates that pricing information is to be ignored for a given symbol, nor will
|
|
|
|
|
quotes ever be downloaded for that symbol. Useful with a home currency, such
|
|
|
|
|
as the dollar ($). It is recommended that these pricing options be set in the price
|
2008-10-01 04:40:51 +04:00
|
|
|
|
database file, which defaults to ‘~/.pricedb’. The syntax for this command is:
|
2007-02-09 04:23:12 +03:00
|
|
|
|
|
|
|
|
|
N SYMBOL
|
|
|
|
|
|
|
|
|
|
|
2008-10-01 04:40:51 +04:00
|
|
|
|
D AMOUNT Specifies the default commodity to use, by specifying an amount in the expected
|
2007-02-09 04:23:12 +03:00
|
|
|
|
format. The entry command will use this commodity as the default when none
|
|
|
|
|
other can be determined. This command may be used multiple times, to set
|
2008-10-01 04:40:51 +04:00
|
|
|
|
the default flags for different commodities; whichever is seen last is used as the
|
2007-02-09 04:23:12 +03:00
|
|
|
|
default commodity. For example, to set US dollars as the default commodity,
|
2008-10-01 04:40:51 +04:00
|
|
|
|
while also setting the thousands flag and decimal flag for that commodity, use:
|
2007-02-09 04:23:12 +03:00
|
|
|
|
|
|
|
|
|
D $1,000.00
|
|
|
|
|
|
|
|
|
|
C AMOUNT1 = AMOUNT2
|
2008-10-01 04:40:51 +04:00
|
|
|
|
Specifies a commodity conversion, where the first amount is given to be equiv-
|
|
|
|
|
alent to the second amount. The first amount should use the decimal precision
|
2007-02-09 04:23:12 +03:00
|
|
|
|
desired during reporting:
|
|
|
|
|
|
|
|
|
|
C 1.00 Kb = 1024 bytes
|
|
|
|
|
|
|
|
|
|
i, o, b, h
|
|
|
|
|
These four relate to timeclock support, which permits ledger to read timelog
|
2008-10-01 04:40:51 +04:00
|
|
|
|
files. See the timeclock’s documentation for more info on the syntax of its
|
|
|
|
|
timelog files.
|
2008-10-01 05:40:32 +04:00
|
|
|
|
@
|
2008-10-01 04:29:58 +04:00
|
|
|
|
|
2008-10-08 22:25:51 +04:00
|
|
|
|
See "Tests" for sample data.
|
2007-02-09 04:23:12 +03:00
|
|
|
|
-}
|
2007-07-04 16:05:54 +04:00
|
|
|
|
|
2008-12-08 06:45:35 +03:00
|
|
|
|
emptyLine :: GenParser Char st ()
|
|
|
|
|
emptyLine = do many spacenonewline
|
2009-04-10 08:38:46 +04:00
|
|
|
|
optional $ (char ';' <?> "comment") >> many (noneOf "\n")
|
2008-12-08 06:45:35 +03:00
|
|
|
|
newline
|
|
|
|
|
return ()
|
2007-02-09 04:23:12 +03:00
|
|
|
|
|
2008-12-08 04:49:31 +03:00
|
|
|
|
ledgercomment :: GenParser Char st String
|
2007-07-04 16:05:54 +04:00
|
|
|
|
ledgercomment =
|
|
|
|
|
try (do
|
|
|
|
|
char ';'
|
|
|
|
|
many spacenonewline
|
|
|
|
|
many (noneOf "\n")
|
|
|
|
|
)
|
|
|
|
|
<|> return "" <?> "comment"
|
2007-02-09 04:23:12 +03:00
|
|
|
|
|
2009-06-20 08:02:10 +04:00
|
|
|
|
ledgercommentline :: GenParser Char st String
|
|
|
|
|
ledgercommentline = do
|
|
|
|
|
many spacenonewline
|
|
|
|
|
s <- ledgercomment
|
|
|
|
|
optional newline
|
|
|
|
|
eof
|
|
|
|
|
return s
|
|
|
|
|
<?> "comment"
|
|
|
|
|
|
2009-04-03 14:58:05 +04:00
|
|
|
|
ledgerModifierTransaction :: GenParser Char LedgerFileCtx ModifierTransaction
|
|
|
|
|
ledgerModifierTransaction = do
|
|
|
|
|
char '=' <?> "modifier transaction"
|
2007-02-09 04:23:12 +03:00
|
|
|
|
many spacenonewline
|
|
|
|
|
valueexpr <- restofline
|
2009-04-03 14:58:05 +04:00
|
|
|
|
postings <- ledgerpostings
|
|
|
|
|
return $ ModifierTransaction valueexpr postings
|
2007-02-09 04:23:12 +03:00
|
|
|
|
|
2009-04-03 14:58:05 +04:00
|
|
|
|
ledgerPeriodicTransaction :: GenParser Char LedgerFileCtx PeriodicTransaction
|
|
|
|
|
ledgerPeriodicTransaction = do
|
2009-04-10 08:38:46 +04:00
|
|
|
|
char '~' <?> "periodic transaction"
|
2007-02-09 04:23:12 +03:00
|
|
|
|
many spacenonewline
|
|
|
|
|
periodexpr <- restofline
|
2009-04-03 14:58:05 +04:00
|
|
|
|
postings <- ledgerpostings
|
|
|
|
|
return $ PeriodicTransaction periodexpr postings
|
2007-02-09 04:23:12 +03:00
|
|
|
|
|
2008-12-16 13:54:20 +03:00
|
|
|
|
ledgerHistoricalPrice :: GenParser Char LedgerFileCtx HistoricalPrice
|
|
|
|
|
ledgerHistoricalPrice = do
|
2009-04-10 08:38:46 +04:00
|
|
|
|
char 'P' <?> "historical price"
|
2008-12-16 13:54:20 +03:00
|
|
|
|
many spacenonewline
|
|
|
|
|
date <- ledgerdate
|
|
|
|
|
many spacenonewline
|
|
|
|
|
symbol1 <- commoditysymbol
|
|
|
|
|
many spacenonewline
|
2009-06-05 13:44:20 +04:00
|
|
|
|
(Mixed [Amount c q _]) <- someamount
|
2008-12-16 13:54:20 +03:00
|
|
|
|
restofline
|
2009-06-05 13:44:20 +04:00
|
|
|
|
return $ HistoricalPrice date symbol1 (symbol c) q
|
2008-12-16 13:54:20 +03:00
|
|
|
|
|
2009-01-23 02:42:34 +03:00
|
|
|
|
-- like ledgerAccountBegin, updates the LedgerFileCtx
|
|
|
|
|
ledgerDefaultYear :: GenParser Char LedgerFileCtx (ErrorT String IO (RawLedger -> RawLedger))
|
|
|
|
|
ledgerDefaultYear = do
|
|
|
|
|
char 'Y' <?> "default year"
|
|
|
|
|
many spacenonewline
|
|
|
|
|
y <- many1 digit
|
|
|
|
|
let y' = read y
|
|
|
|
|
guard (y' >= 1000)
|
|
|
|
|
setYear y'
|
|
|
|
|
return $ return id
|
|
|
|
|
|
2009-04-01 12:55:46 +04:00
|
|
|
|
-- | Try to parse a ledger entry. If we successfully parse an entry, ensure it is balanced,
|
|
|
|
|
-- and if we cannot, raise an error.
|
2009-04-03 14:58:05 +04:00
|
|
|
|
ledgerTransaction :: GenParser Char LedgerFileCtx LedgerTransaction
|
|
|
|
|
ledgerTransaction = do
|
2009-04-10 08:38:46 +04:00
|
|
|
|
date <- ledgerdate <?> "transaction"
|
2009-07-09 03:37:44 +04:00
|
|
|
|
edate <- ledgereffectivedate
|
2009-11-25 23:12:09 +03:00
|
|
|
|
many1 spacenonewline
|
2007-02-09 04:23:12 +03:00
|
|
|
|
status <- ledgerstatus
|
|
|
|
|
code <- ledgercode
|
2009-04-10 09:37:26 +04:00
|
|
|
|
description <- liftM rstrip (many1 (noneOf ";\n") <?> "description")
|
2007-07-04 16:05:54 +04:00
|
|
|
|
comment <- ledgercomment
|
|
|
|
|
restofline
|
2009-04-03 14:58:05 +04:00
|
|
|
|
postings <- ledgerpostings
|
2009-07-09 03:37:44 +04:00
|
|
|
|
let t = LedgerTransaction date edate status code description comment postings ""
|
2009-04-03 14:58:05 +04:00
|
|
|
|
case balanceLedgerTransaction t of
|
|
|
|
|
Right t' -> return t'
|
2009-06-05 23:35:12 +04:00
|
|
|
|
Left err -> fail err
|
2007-02-09 04:23:12 +03:00
|
|
|
|
|
2009-07-09 03:37:44 +04:00
|
|
|
|
ledgereffectivedate :: GenParser Char LedgerFileCtx (Maybe Day)
|
|
|
|
|
ledgereffectivedate =
|
|
|
|
|
try (do
|
|
|
|
|
string "[="
|
|
|
|
|
edate <- ledgerdate
|
|
|
|
|
char ']'
|
|
|
|
|
return $ Just edate)
|
|
|
|
|
<|> return Nothing
|
|
|
|
|
|
2009-01-28 00:55:26 +03:00
|
|
|
|
ledgerdate :: GenParser Char LedgerFileCtx Day
|
|
|
|
|
ledgerdate = try ledgerfulldate <|> ledgerpartialdate
|
|
|
|
|
|
|
|
|
|
ledgerfulldate :: GenParser Char LedgerFileCtx Day
|
|
|
|
|
ledgerfulldate = do
|
|
|
|
|
(y,m,d) <- ymd
|
|
|
|
|
many spacenonewline
|
|
|
|
|
return $ fromGregorian (read y) (read m) (read d)
|
|
|
|
|
|
|
|
|
|
-- | Match a partial M/D date in a ledger. Warning, this terminates the
|
|
|
|
|
-- program if it finds a match when there is no default year specified.
|
|
|
|
|
ledgerpartialdate :: GenParser Char LedgerFileCtx Day
|
|
|
|
|
ledgerpartialdate = do
|
|
|
|
|
(_,m,d) <- md
|
2008-11-12 10:17:31 +03:00
|
|
|
|
many spacenonewline
|
2009-01-28 00:55:26 +03:00
|
|
|
|
y <- getYear
|
2009-06-05 23:35:12 +04:00
|
|
|
|
when (y==Nothing) $ fail "partial date found, but no default year specified"
|
2009-01-28 00:55:26 +03:00
|
|
|
|
return $ fromGregorian (fromJust y) (read m) (read d)
|
2008-11-11 15:34:05 +03:00
|
|
|
|
|
2009-01-25 10:06:59 +03:00
|
|
|
|
ledgerdatetime :: GenParser Char LedgerFileCtx LocalTime
|
2008-11-11 15:34:05 +03:00
|
|
|
|
ledgerdatetime = do
|
2008-11-27 07:01:07 +03:00
|
|
|
|
day <- ledgerdate
|
2008-11-11 15:34:05 +03:00
|
|
|
|
h <- many1 digit
|
|
|
|
|
char ':'
|
|
|
|
|
m <- many1 digit
|
2008-11-12 10:17:31 +03:00
|
|
|
|
s <- optionMaybe $ do
|
|
|
|
|
char ':'
|
|
|
|
|
many1 digit
|
|
|
|
|
many spacenonewline
|
2009-01-25 00:46:09 +03:00
|
|
|
|
let tod = TimeOfDay (read h) (read m) (maybe 0 (fromIntegral.read) s)
|
2009-01-25 10:06:59 +03:00
|
|
|
|
return $ LocalTime day tod
|
2007-02-09 04:23:12 +03:00
|
|
|
|
|
2008-12-08 04:49:31 +03:00
|
|
|
|
ledgerstatus :: GenParser Char st Bool
|
2009-04-10 08:38:46 +04:00
|
|
|
|
ledgerstatus = try (do { char '*' <?> "status"; many1 spacenonewline; return True } ) <|> return False
|
2007-02-09 04:23:12 +03:00
|
|
|
|
|
2008-12-08 04:49:31 +03:00
|
|
|
|
ledgercode :: GenParser Char st String
|
2009-04-10 08:38:46 +04:00
|
|
|
|
ledgercode = try (do { char '(' <?> "code"; code <- anyChar `manyTill` char ')'; many1 spacenonewline; return code } ) <|> return ""
|
2007-02-09 04:23:12 +03:00
|
|
|
|
|
2009-06-20 08:02:10 +04:00
|
|
|
|
-- Complicated to handle intermixed comment lines.. please make me better.
|
2009-04-03 14:58:05 +04:00
|
|
|
|
ledgerpostings :: GenParser Char LedgerFileCtx [Posting]
|
2009-06-20 08:02:10 +04:00
|
|
|
|
ledgerpostings = do
|
|
|
|
|
ctx <- getState
|
2009-09-22 19:56:59 +04:00
|
|
|
|
let parses p = isRight . parseWithCtx ctx p
|
2009-06-20 08:02:10 +04:00
|
|
|
|
ls <- many1 linebeginningwithspaces
|
|
|
|
|
let ls' = filter (not . (ledgercommentline `parses`)) ls
|
|
|
|
|
guard (not $ null ls')
|
|
|
|
|
return $ map (fromparse . parseWithCtx ctx ledgerposting) ls'
|
|
|
|
|
<?> "ledger postings"
|
|
|
|
|
|
|
|
|
|
linebeginningwithspaces :: GenParser Char st String
|
|
|
|
|
linebeginningwithspaces = do
|
|
|
|
|
sp <- many1 spacenonewline
|
|
|
|
|
c <- nonspace
|
|
|
|
|
cs <- restofline
|
|
|
|
|
return $ sp ++ (c:cs) ++ "\n"
|
2007-02-09 04:23:12 +03:00
|
|
|
|
|
2009-04-03 14:58:05 +04:00
|
|
|
|
ledgerposting :: GenParser Char LedgerFileCtx Posting
|
2009-05-25 21:28:41 +04:00
|
|
|
|
ledgerposting = do
|
|
|
|
|
many1 spacenonewline
|
2009-01-23 03:14:12 +03:00
|
|
|
|
status <- ledgerstatus
|
2008-12-08 10:21:33 +03:00
|
|
|
|
account <- transactionaccountname
|
2009-05-25 21:28:41 +04:00
|
|
|
|
let (ptype, account') = (postingTypeFromAccountName account, unbracket account)
|
2009-04-08 01:18:51 +04:00
|
|
|
|
amount <- postingamount
|
2008-10-16 10:00:46 +04:00
|
|
|
|
many spacenonewline
|
|
|
|
|
comment <- ledgercomment
|
|
|
|
|
restofline
|
2009-05-25 21:28:41 +04:00
|
|
|
|
return (Posting status account' amount comment ptype)
|
2007-02-09 04:23:12 +03:00
|
|
|
|
|
2008-12-08 10:21:33 +03:00
|
|
|
|
-- Qualify with the parent account from parsing context
|
|
|
|
|
transactionaccountname :: GenParser Char LedgerFileCtx AccountName
|
|
|
|
|
transactionaccountname = liftM2 (++) getParentAccount ledgeraccountname
|
|
|
|
|
|
2009-06-05 22:02:22 +04:00
|
|
|
|
-- | Account names may have single spaces inside them, and are terminated
|
|
|
|
|
-- by two or more spaces. They should have one or more components of at
|
|
|
|
|
-- least one character, separated by the account separator char.
|
|
|
|
|
|
2008-12-08 04:49:31 +03:00
|
|
|
|
ledgeraccountname :: GenParser Char st String
|
2008-10-08 22:25:51 +04:00
|
|
|
|
ledgeraccountname = do
|
2009-06-05 22:02:22 +04:00
|
|
|
|
a <- many1 (nonspace <|> singlespace)
|
|
|
|
|
let a' = striptrailingspace a
|
|
|
|
|
when (accountNameFromComponents (accountNameComponents a') /= a')
|
|
|
|
|
(fail $ "accountname seems ill-formed: "++a')
|
|
|
|
|
return a'
|
2008-10-03 13:47:50 +04:00
|
|
|
|
where
|
|
|
|
|
singlespace = try (do {spacenonewline; do {notFollowedBy spacenonewline; return ' '}})
|
|
|
|
|
-- couldn't avoid consuming a final space sometimes, harmless
|
2008-10-08 23:36:22 +04:00
|
|
|
|
striptrailingspace s = if last s == ' ' then init s else s
|
2007-02-09 04:23:12 +03:00
|
|
|
|
|
2009-05-25 21:28:41 +04:00
|
|
|
|
-- accountnamechar = notFollowedBy (oneOf "()[]") >> nonspace
|
|
|
|
|
-- <?> "account name character (non-bracket, non-parenthesis, non-whitespace)"
|
2008-10-16 10:00:46 +04:00
|
|
|
|
|
2009-04-08 01:18:51 +04:00
|
|
|
|
postingamount :: GenParser Char st MixedAmount
|
|
|
|
|
postingamount =
|
2008-10-13 01:52:48 +04:00
|
|
|
|
try (do
|
|
|
|
|
many1 spacenonewline
|
2008-11-22 19:26:01 +03:00
|
|
|
|
a <- someamount <|> return missingamt
|
2008-10-13 01:52:48 +04:00
|
|
|
|
return a
|
2008-10-19 00:29:42 +04:00
|
|
|
|
) <|> return missingamt
|
2008-10-13 01:52:48 +04:00
|
|
|
|
|
2009-04-08 01:38:38 +04:00
|
|
|
|
someamount :: GenParser Char st MixedAmount
|
2008-11-22 19:26:01 +03:00
|
|
|
|
someamount = try leftsymbolamount <|> try rightsymbolamount <|> nosymbolamount
|
|
|
|
|
|
2008-12-08 04:49:31 +03:00
|
|
|
|
leftsymbolamount :: GenParser Char st MixedAmount
|
2008-10-13 01:52:48 +04:00
|
|
|
|
leftsymbolamount = do
|
|
|
|
|
sym <- commoditysymbol
|
|
|
|
|
sp <- many spacenonewline
|
2008-10-15 03:14:31 +04:00
|
|
|
|
(q,p,comma) <- amountquantity
|
2008-11-22 19:26:01 +03:00
|
|
|
|
pri <- priceamount
|
2008-10-18 14:46:49 +04:00
|
|
|
|
let c = Commodity {symbol=sym,side=L,spaced=not $ null sp,comma=comma,precision=p}
|
2008-11-22 19:26:01 +03:00
|
|
|
|
return $ Mixed [Amount c q pri]
|
2008-10-13 01:52:48 +04:00
|
|
|
|
<?> "left-symbol amount"
|
|
|
|
|
|
2008-12-08 04:49:31 +03:00
|
|
|
|
rightsymbolamount :: GenParser Char st MixedAmount
|
2008-10-13 01:52:48 +04:00
|
|
|
|
rightsymbolamount = do
|
2008-10-15 03:14:31 +04:00
|
|
|
|
(q,p,comma) <- amountquantity
|
2008-10-13 01:52:48 +04:00
|
|
|
|
sp <- many spacenonewline
|
|
|
|
|
sym <- commoditysymbol
|
2008-11-22 19:26:01 +03:00
|
|
|
|
pri <- priceamount
|
2008-10-18 14:46:49 +04:00
|
|
|
|
let c = Commodity {symbol=sym,side=R,spaced=not $ null sp,comma=comma,precision=p}
|
2008-11-22 19:26:01 +03:00
|
|
|
|
return $ Mixed [Amount c q pri]
|
2008-10-13 01:52:48 +04:00
|
|
|
|
<?> "right-symbol amount"
|
|
|
|
|
|
2008-12-08 04:49:31 +03:00
|
|
|
|
nosymbolamount :: GenParser Char st MixedAmount
|
2008-10-13 01:52:48 +04:00
|
|
|
|
nosymbolamount = do
|
2008-10-15 03:14:31 +04:00
|
|
|
|
(q,p,comma) <- amountquantity
|
2008-11-22 19:26:01 +03:00
|
|
|
|
pri <- priceamount
|
2008-10-18 14:46:49 +04:00
|
|
|
|
let c = Commodity {symbol="",side=L,spaced=False,comma=comma,precision=p}
|
2008-11-22 19:26:01 +03:00
|
|
|
|
return $ Mixed [Amount c q pri]
|
2008-10-13 01:52:48 +04:00
|
|
|
|
<?> "no-symbol amount"
|
|
|
|
|
|
2008-12-08 04:49:31 +03:00
|
|
|
|
commoditysymbol :: GenParser Char st String
|
2008-10-13 01:52:48 +04:00
|
|
|
|
commoditysymbol = many1 (noneOf "-.0123456789;\n ") <?> "commodity symbol"
|
2008-10-15 03:14:31 +04:00
|
|
|
|
|
2008-12-08 04:49:31 +03:00
|
|
|
|
priceamount :: GenParser Char st (Maybe MixedAmount)
|
2008-11-22 19:26:01 +03:00
|
|
|
|
priceamount =
|
|
|
|
|
try (do
|
|
|
|
|
many spacenonewline
|
|
|
|
|
char '@'
|
|
|
|
|
many spacenonewline
|
|
|
|
|
a <- someamount
|
|
|
|
|
return $ Just a
|
|
|
|
|
) <|> return Nothing
|
|
|
|
|
|
2008-10-15 03:14:31 +04:00
|
|
|
|
-- gawd.. trying to parse a ledger number without error:
|
|
|
|
|
|
2008-10-15 04:33:15 +04:00
|
|
|
|
-- | parse a ledger-style numeric quantity and also return the number of
|
|
|
|
|
-- digits to the right of the decimal point and whether thousands are
|
|
|
|
|
-- separated by comma.
|
2008-12-08 04:49:31 +03:00
|
|
|
|
amountquantity :: GenParser Char st (Double, Int, Bool)
|
2008-10-15 03:14:31 +04:00
|
|
|
|
amountquantity = do
|
|
|
|
|
sign <- optionMaybe $ string "-"
|
|
|
|
|
(intwithcommas,frac) <- numberparts
|
|
|
|
|
let comma = ',' `elem` intwithcommas
|
|
|
|
|
let precision = length frac
|
|
|
|
|
-- read the actual value. We expect this read to never fail.
|
|
|
|
|
let int = filter (/= ',') intwithcommas
|
|
|
|
|
let int' = if null int then "0" else int
|
|
|
|
|
let frac' = if null frac then "0" else frac
|
|
|
|
|
let sign' = fromMaybe "" sign
|
|
|
|
|
let quantity = read $ sign'++int'++"."++frac'
|
|
|
|
|
return (quantity, precision, comma)
|
2008-10-13 01:52:48 +04:00
|
|
|
|
<?> "commodity quantity"
|
2008-10-15 03:14:31 +04:00
|
|
|
|
|
2008-10-15 10:00:10 +04:00
|
|
|
|
-- | parse the two strings of digits before and after a possible decimal
|
|
|
|
|
-- point. The integer part may contain commas, or either part may be
|
|
|
|
|
-- empty, or there may be no point.
|
2008-12-08 04:49:31 +03:00
|
|
|
|
numberparts :: GenParser Char st (String,String)
|
2008-10-15 03:14:31 +04:00
|
|
|
|
numberparts = numberpartsstartingwithdigit <|> numberpartsstartingwithpoint
|
|
|
|
|
|
2008-12-08 04:49:31 +03:00
|
|
|
|
numberpartsstartingwithdigit :: GenParser Char st (String,String)
|
2008-10-15 03:14:31 +04:00
|
|
|
|
numberpartsstartingwithdigit = do
|
|
|
|
|
let digitorcomma = digit <|> char ','
|
|
|
|
|
first <- digit
|
|
|
|
|
rest <- many digitorcomma
|
|
|
|
|
frac <- try (do {char '.'; many digit >>= return}) <|> return ""
|
|
|
|
|
return (first:rest,frac)
|
|
|
|
|
|
2008-12-08 04:49:31 +03:00
|
|
|
|
numberpartsstartingwithpoint :: GenParser Char st (String,String)
|
2008-10-15 03:14:31 +04:00
|
|
|
|
numberpartsstartingwithpoint = do
|
|
|
|
|
char '.'
|
|
|
|
|
frac <- many1 digit
|
|
|
|
|
return ("",frac)
|
|
|
|
|
|
|
|
|
|
|
2009-04-03 15:05:16 +04:00
|
|
|
|
{-| Parse a timelog entry. Here is the timelog grammar from timeclock.el 2.6:
|
2007-03-12 03:13:53 +03:00
|
|
|
|
|
2008-10-01 22:53:43 +04:00
|
|
|
|
@
|
2007-03-12 03:13:53 +03:00
|
|
|
|
A timelog contains data in the form of a single entry per line.
|
|
|
|
|
Each entry has the form:
|
|
|
|
|
|
|
|
|
|
CODE YYYY/MM/DD HH:MM:SS [COMMENT]
|
|
|
|
|
|
|
|
|
|
CODE is one of: b, h, i, o or O. COMMENT is optional when the code is
|
|
|
|
|
i, o or O. The meanings of the codes are:
|
|
|
|
|
|
|
|
|
|
b Set the current time balance, or \"time debt\". Useful when
|
|
|
|
|
archiving old log data, when a debt must be carried forward.
|
|
|
|
|
The COMMENT here is the number of seconds of debt.
|
|
|
|
|
|
|
|
|
|
h Set the required working time for the given day. This must
|
|
|
|
|
be the first entry for that day. The COMMENT in this case is
|
|
|
|
|
the number of hours in this workday. Floating point amounts
|
|
|
|
|
are allowed.
|
|
|
|
|
|
|
|
|
|
i Clock in. The COMMENT in this case should be the name of the
|
|
|
|
|
project worked on.
|
|
|
|
|
|
|
|
|
|
o Clock out. COMMENT is unnecessary, but can be used to provide
|
|
|
|
|
a description of how the period went, for example.
|
|
|
|
|
|
|
|
|
|
O Final clock out. Whatever project was being worked on, it is
|
|
|
|
|
now finished. Useful for creating summary reports.
|
2008-10-08 22:25:51 +04:00
|
|
|
|
@
|
2007-03-12 03:13:53 +03:00
|
|
|
|
|
2008-10-08 22:25:51 +04:00
|
|
|
|
Example:
|
2007-03-12 03:13:53 +03:00
|
|
|
|
|
|
|
|
|
i 2007/03/10 12:26:00 hledger
|
|
|
|
|
o 2007/03/10 17:26:02
|
2008-10-08 22:25:51 +04:00
|
|
|
|
|
2007-03-12 03:13:53 +03:00
|
|
|
|
-}
|
2008-12-10 20:40:36 +03:00
|
|
|
|
timelogentry :: GenParser Char LedgerFileCtx TimeLogEntry
|
2007-03-12 03:13:53 +03:00
|
|
|
|
timelogentry = do
|
|
|
|
|
code <- oneOf "bhioO"
|
|
|
|
|
many1 spacenonewline
|
2008-11-11 15:34:05 +03:00
|
|
|
|
datetime <- ledgerdatetime
|
2008-12-10 20:40:36 +03:00
|
|
|
|
comment <- liftM2 (++) getParentAccount restofline
|
2009-04-04 00:04:51 +04:00
|
|
|
|
return $ TimeLogEntry (read [code]) datetime comment
|
2007-03-12 03:13:53 +03:00
|
|
|
|
|
2008-11-22 15:18:19 +03:00
|
|
|
|
|
|
|
|
|
-- misc parsing
|
2008-11-27 02:21:24 +03:00
|
|
|
|
|
2008-11-27 00:34:26 +03:00
|
|
|
|
-- | Parse a --display expression which is a simple date predicate, like
|
|
|
|
|
-- "d>[DATE]" or "d<=[DATE]", and return a transaction-matching predicate.
|
2008-12-08 04:49:31 +03:00
|
|
|
|
datedisplayexpr :: GenParser Char st (Transaction -> Bool)
|
2008-11-25 00:51:31 +03:00
|
|
|
|
datedisplayexpr = do
|
|
|
|
|
char 'd'
|
2008-11-27 00:18:24 +03:00
|
|
|
|
op <- compareop
|
2008-11-25 21:47:26 +03:00
|
|
|
|
char '['
|
2008-11-25 00:51:31 +03:00
|
|
|
|
(y,m,d) <- smartdate
|
2008-11-25 21:47:26 +03:00
|
|
|
|
char ']'
|
2009-06-05 13:44:20 +04:00
|
|
|
|
let date = parsedate $ printf "%04s/%02s/%02s" y m d
|
|
|
|
|
test op = return $ (`op` date) . tdate
|
|
|
|
|
case op of
|
|
|
|
|
"<" -> test (<)
|
|
|
|
|
"<=" -> test (<=)
|
|
|
|
|
"=" -> test (==)
|
|
|
|
|
"==" -> test (==)
|
|
|
|
|
">=" -> test (>=)
|
|
|
|
|
">" -> test (>)
|
|
|
|
|
_ -> mzero
|
2008-11-27 00:18:24 +03:00
|
|
|
|
|
|
|
|
|
compareop = choice $ map (try . string) ["<=",">=","==","<","=",">"]
|
2008-11-27 03:35:00 +03:00
|
|
|
|
|