hledger/hledger-lib/tests/doctests.hs

12 lines
295 B
Haskell
Raw Normal View History

2016-06-07 05:45:59 +03:00
{-# LANGUAGE PackageImports #-}
import Data.List
import "Glob" System.FilePath.Glob
2016-04-23 21:27:39 +03:00
import Test.DocTest
main = do
fs1 <- glob "Hledger/**/*.hs"
fs2 <- glob "Text/**/*.hs"
--fs3 <- glob "other/ledger-parse/**/*.hs"
doctest $ filter (not . isInfixOf "/.") $ ["Hledger.hs"] ++ fs1 ++ fs2