Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Hledger.Cli.Script
Description
A convenient module to import in hledger scripts, aiming to provide the most useful imports and reduce boilerplate. |
Synopsis
- data Text
- data Char
- data Ordering
- data Maybe a
- class Functor f => Applicative (f :: Type -> Type) where
- class Functor (f :: Type -> Type) where
- class Applicative m => Monad (m :: Type -> Type) where
- data IO a
- class Eq a => Ord a where
- type Name = String
- type FilePath = String
- data CliOpts = CliOpts {
- rawopts_ :: RawOpts
- command_ :: String
- file_ :: [FilePath]
- inputopts_ :: InputOpts
- reportspec_ :: ReportSpec
- output_file_ :: Maybe FilePath
- output_format_ :: Maybe String
- debug_ :: Int
- no_new_accounts_ :: Bool
- width_ :: Maybe String
- available_width_ :: Int
- progstarttime_ :: POSIXTime
- class HasCliOpts c where
- cliOpts :: Lens' c CliOpts
- available_width :: Lens' c Int
- command :: Lens' c String
- debug__ :: Lens' c Int
- file__ :: Lens' c [FilePath]
- inputopts :: Lens' c InputOpts
- no_new_accounts :: Lens' c Bool
- output_file :: Lens' c (Maybe FilePath)
- output_format :: Lens' c (Maybe String)
- progstarttime :: Lens' c POSIXTime
- rawopts__ :: Lens' c RawOpts
- reportspec :: Lens' c ReportSpec
- width__ :: Lens' c (Maybe String)
- type CommandDoc = String
- data Either a b
- type Balance = MixedAmount
- type Help = String
- newtype Day = ModifiedJulianDay {
- toModifiedJulianDay :: Integer
- data Group a = Group {
- groupUnnamed :: [a]
- groupHidden :: [a]
- groupNamed :: [(Help, [a])]
- data CompoundBalanceCommandSpec = CompoundBalanceCommandSpec {
- cbcdoc :: CommandDoc
- cbctitle :: String
- cbcqueries :: [CBCSubreportSpec DisplayName]
- cbcaccum :: BalanceAccumulation
- type Topic = String
- type ProgramName = String
- type PackageVersion = String
- type VersionString = String
- data Journal = Journal {
- jparsedefaultyear :: Maybe Year
- jparsedefaultcommodity :: Maybe (CommoditySymbol, AmountStyle)
- jparsedecimalmark :: Maybe DecimalMark
- jparseparentaccounts :: [AccountName]
- jparsealiases :: [AccountAlias]
- jparsetimeclockentries :: [TimeclockEntry]
- jincludefilestack :: [FilePath]
- jdeclaredpayees :: [(Payee, PayeeDeclarationInfo)]
- jdeclaredtags :: [(TagName, TagDeclarationInfo)]
- jdeclaredaccounts :: [(AccountName, AccountDeclarationInfo)]
- jdeclaredaccounttags :: Map AccountName [Tag]
- jdeclaredaccounttypes :: Map AccountType [AccountName]
- jaccounttypes :: Map AccountName AccountType
- jglobalcommoditystyles :: Map CommoditySymbol AmountStyle
- jcommodities :: Map CommoditySymbol Commodity
- jinferredcommodities :: Map CommoditySymbol AmountStyle
- jpricedirectives :: [PriceDirective]
- jinferredmarketprices :: [MarketPrice]
- jtxnmodifiers :: [TransactionModifier]
- jperiodictxns :: [PeriodicTransaction]
- jtxns :: [Transaction]
- jfinalcommentlines :: Text
- jfiles :: [(FilePath, Text)]
- jlastreadtime :: POSIXTime
- data Posting = Posting {
- pdate :: Maybe Day
- pdate2 :: Maybe Day
- pstatus :: Status
- paccount :: AccountName
- pamount :: MixedAmount
- pcomment :: Text
- ptype :: PostingType
- ptags :: [Tag]
- pbalanceassertion :: Maybe BalanceAssertion
- ptransaction :: Maybe Transaction
- poriginal :: Maybe Posting
- data Transaction = Transaction {}
- type AccountName = Text
- class Monad m => MonadFail (m :: Type -> Type) where
- fail :: String -> m a
- type IOError = IOException
- class Applicative f => Alternative (f :: Type -> Type) where
- class (Alternative m, Monad m) => MonadPlus (m :: Type -> Type) where
- class PrintfArg a where
- formatArg :: a -> FieldFormatter
- parseFormat :: a -> ModifierParser
- type FieldFormatter = FieldFormat -> ShowS
- data FieldFormat = FieldFormat {
- fmtWidth :: Maybe Int
- fmtPrecision :: Maybe Int
- fmtAdjust :: Maybe FormatAdjustment
- fmtSign :: Maybe FormatSign
- fmtAlternate :: Bool
- fmtModifiers :: String
- fmtChar :: Char
- type ModifierParser = String -> FormatParse
- data FormatParse = FormatParse {
- fpModifiers :: String
- fpChar :: Char
- fpRest :: String
- type HasCallStack = ?callStack :: CallStack
- data AmountDisplayOpts = AmountDisplayOpts {
- displayCommodity :: Bool
- displayZeroCommodity :: Bool
- displayCommodityOrder :: Maybe [CommoditySymbol]
- displayDigitGroups :: Bool
- displayForceDecimalMark :: Bool
- displayOneLine :: Bool
- displayMinWidth :: Maybe Int
- displayMaxWidth :: Maybe Int
- displayCost :: Bool
- displayColour :: Bool
- data BalancingOpts = BalancingOpts {
- ignore_assertions_ :: Bool
- infer_balancing_costs_ :: Bool
- commodity_styles_ :: Maybe (Map CommoditySymbol AmountStyle)
- class HasBalancingOpts c where
- balancingOpts :: Lens' c BalancingOpts
- commodity_styles :: Lens' c (Maybe (Map CommoditySymbol AmountStyle))
- ignore_assertions :: Lens' c Bool
- infer_balancing_costs :: Lens' c Bool
- type ErroringJournalParser (m :: Type -> Type) a = StateT Journal (ParsecT HledgerParseErrorData Text (ExceptT FinalParseError m)) a
- type JournalParser (m :: Type -> Type) a = StateT Journal (ParsecT HledgerParseErrorData Text m) a
- data RawOpts
- data ReportItemField
- data StringFormat
- data StringFormatComponent
- = FormatLiteral Text
- | FormatField Bool (Maybe Int) (Maybe Int) ReportItemField
- data Account = Account {
- aname :: AccountName
- adeclarationinfo :: Maybe AccountDeclarationInfo
- asubs :: [Account]
- aparent :: Maybe Account
- aboring :: Bool
- anumpostings :: Int
- aebalance :: MixedAmount
- aibalance :: MixedAmount
- data AccountAlias
- data AccountDeclarationInfo = AccountDeclarationInfo {
- adicomment :: Text
- aditags :: [Tag]
- adideclarationorder :: Int
- adisourcepos :: SourcePos
- data AccountType
- data Amount = Amount {
- acommodity :: !CommoditySymbol
- aquantity :: !Quantity
- astyle :: !AmountStyle
- aprice :: !(Maybe AmountPrice)
- data AmountPrecision
- = Precision !Word8
- | NaturalPrecision
- data AmountPrice
- = UnitPrice !Amount
- | TotalPrice !Amount
- data AmountStyle = AmountStyle {
- ascommodityside :: !Side
- ascommodityspaced :: !Bool
- asdigitgroups :: !(Maybe DigitGroupStyle)
- asdecimalmark :: !(Maybe Char)
- asprecision :: !AmountPrecision
- asrounding :: !Rounding
- data BalanceAssertion = BalanceAssertion {
- baamount :: Amount
- batotal :: Bool
- bainclusive :: Bool
- baposition :: SourcePos
- data Commodity = Commodity {}
- type CommoditySymbol = Text
- data DateSpan = DateSpan (Maybe EFDay) (Maybe EFDay)
- type DateTag = (TagName, Day)
- type DayOfMonth = Int
- class Ord p => DayPeriod p where
- periodFirstDay :: p -> Day
- periodLastDay :: p -> Day
- dayPeriod :: Day -> p
- type DecimalMark = Char
- data DigitGroupStyle = DigitGroups !Char ![Word8]
- data EFDay
- class HasAmounts a where
- styleAmounts :: Map CommoditySymbol AmountStyle -> a -> a
- data Interval
- = NoInterval
- | Days Int
- | Weeks Int
- | Months Int
- | Quarters Int
- | Years Int
- | DayOfMonth Int
- | WeekdayOfMonth Int Int
- | DaysOfWeek [Int]
- | DayOfYear Int Int
- data Ledger = Ledger {}
- data MarketPrice = MarketPrice {
- mpdate :: Day
- mpfrom :: CommoditySymbol
- mpto :: CommoditySymbol
- mprate :: Quantity
- data MixedAmount
- type Month = Int
- type MonthDay = Int
- type MonthWeek = Int
- data NormalSign
- type ParsedJournal = Journal
- type Payee = Text
- data PayeeDeclarationInfo = PayeeDeclarationInfo {
- pdicomment :: Text
- pditags :: [Tag]
- data Period
- data PeriodicTransaction = PeriodicTransaction {
- ptperiodexpr :: Text
- ptinterval :: Interval
- ptspan :: DateSpan
- ptsourcepos :: (SourcePos, SourcePos)
- ptstatus :: Status
- ptcode :: Text
- ptdescription :: Text
- ptcomment :: Text
- pttags :: [Tag]
- ptpostings :: [Posting]
- data PostingType
- data PriceDirective = PriceDirective {}
- type Quantity = Decimal
- type Quarter = Int
- data Rounding
- data Side
- data SmartDate
- data SmartInterval
- data Status
- type StorageFormat = String
- data TMPostingRule = TMPostingRule {
- tmprPosting :: Posting
- tmprIsMultiplier :: Bool
- type Tag = (TagName, TagValue)
- newtype TagDeclarationInfo = TagDeclarationInfo {
- tdicomment :: Text
- type TagName = Text
- type TagValue = Text
- data TimeclockCode
- = SetBalance
- | SetRequiredHours
- | In
- | Out
- | FinalOut
- data TimeclockEntry = TimeclockEntry {
- tlsourcepos :: SourcePos
- tlcode :: TimeclockCode
- tldatetime :: LocalTime
- tlaccount :: AccountName
- tldescription :: Text
- tlcomment :: Text
- tltags :: [Tag]
- data TransactionModifier = TransactionModifier {}
- type WeekDay = Int
- data WhichDate
- type Year = Integer
- type YearDay = Int
- type YearWeek = Int
- data ConversionOp
- type PriceOracle = (Day, CommoditySymbol, Maybe CommoditySymbol) -> Maybe (CommoditySymbol, Quantity)
- data ValuationType
- data TestTree
- data Complete
- = CompleteValue String
- | CompleteFile String FilePath
- | CompleteDir String FilePath
- data Handle
- data TimeLocale = TimeLocale {
- wDays :: [(String, String)]
- months :: [(String, String)]
- amPm :: (String, String)
- dateTimeFmt :: String
- dateFmt :: String
- timeFmt :: String
- time12Fmt :: String
- knownTimeZones :: [TimeZone]
- newtype Down a = Down {
- getDown :: a
- data WideBuilder = WideBuilder {}
- type TextParser (m :: Type -> Type) a = ParsecT HledgerParseErrorData Text m a
- type HledgerParseErrors = ParseErrorBundle Text HledgerParseErrorData
- data HledgerParseErrorData
- data SourcePos = SourcePos {
- sourceName :: FilePath
- sourceLine :: !Pos
- sourceColumn :: !Pos
- data UTCTime = UTCTime {
- utctDay :: Day
- utctDayTime :: DiffTime
- data LocalTime = LocalTime {}
- data Query
- type RegexError = String
- data Regexp
- type Replacement = String
- data TimeOfDay = TimeOfDay {}
- newtype Const a (b :: k) = Const {
- getConst :: a
- data CalendarDiffDays = CalendarDiffDays {}
- type MonthOfYear = Int
- data DiffTime
- data DayOfWeek
- data NominalDiffTime
- newtype UniversalTime = ModJulianDate {
- getModJulianDate :: Rational
- class FormatTime t
- data CalendarDiffTime = CalendarDiffTime {
- ctMonths :: Integer
- ctTime :: NominalDiffTime
- data TimeZone = TimeZone {
- timeZoneMinutes :: Int
- timeZoneSummerOnly :: Bool
- timeZoneName :: String
- data ZonedTime = ZonedTime {}
- class ParseTime t
- data Arg a = Arg {
- argValue :: Update a
- argType :: FlagHelp
- argRequire :: Bool
- data ThreadId
- data SeekMode
- data TextEncoding
- data HandlePosn
- data BufferMode
- = NoBuffering
- | LineBuffering
- | BlockBuffering (Maybe Int)
- data Newline
- data NewlineMode = NewlineMode {}
- data IOMode
- data FormatAdjustment
- data FormatSign
- data CmdSpec
- = ShellCommand String
- | RawCommand FilePath [String]
- data CreateProcess = CreateProcess {
- cmdspec :: CmdSpec
- cwd :: Maybe FilePath
- env :: Maybe [(String, String)]
- std_in :: StdStream
- std_out :: StdStream
- std_err :: StdStream
- close_fds :: Bool
- create_group :: Bool
- delegate_ctlc :: Bool
- detach_console :: Bool
- create_new_console :: Bool
- new_session :: Bool
- child_group :: Maybe GroupID
- child_user :: Maybe UserID
- use_process_jobs :: Bool
- data ProcessHandle
- data StdStream
- type Pid = CPid
- data ExitCode
- = ExitSuccess
- | ExitFailure Int
- type SimpleStringParser a = Parsec HledgerParseErrorData String a
- type SimpleTextParser = Parsec HledgerParseErrorData Text
- data DependencyType
- type TestName = String
- data Timeout
- class Assertable t where
- type Assertion = IO ()
- class AssertionPredicable t where
- assertionPredicate :: t -> IO Bool
- type AssertionPredicate = IO Bool
- data HUnitFailure = HUnitFailure (Maybe SrcLoc) String
- class HPrintfType t
- class IsChar c where
- class PrintfType t
- data MVar a
- data Flag a = Flag {}
- type FlagHelp = String
- data Mode a = Mode {
- modeGroupModes :: Group (Mode a)
- modeNames :: [Name]
- modeValue :: a
- modeCheck :: a -> Either String a
- modeReform :: a -> Maybe [String]
- modeExpandAt :: Bool
- modeHelp :: Help
- modeHelpSuffix :: [String]
- modeArgs :: ([Arg a], Maybe (Arg a))
- modeGroupFlags :: Group (Flag a)
- data InputOpts = InputOpts {
- mformat_ :: Maybe StorageFormat
- mrules_file_ :: Maybe FilePath
- aliases_ :: [String]
- anon_ :: Bool
- new_ :: Bool
- new_save_ :: Bool
- pivot_ :: String
- forecast_ :: Maybe DateSpan
- verbose_tags_ :: Bool
- reportspan_ :: DateSpan
- auto_ :: Bool
- infer_equity_ :: Bool
- infer_costs_ :: Bool
- balancingopts_ :: BalancingOpts
- strict_ :: Bool
- _ioDay :: Day
- data ReportSpec = ReportSpec {
- _rsReportOpts :: ReportOpts
- _rsDay :: Day
- _rsQuery :: Query
- _rsQueryOpts :: [QueryOpt]
- type PrefixedFilePath = FilePath
- class HasInputOpts c where
- inputOpts :: Lens' c InputOpts
- aliases :: Lens' c [String]
- anon__ :: Lens' c Bool
- auto__ :: Lens' c Bool
- balancingopts :: Lens' c BalancingOpts
- forecast :: Lens' c (Maybe DateSpan)
- infer_costs :: Lens' c Bool
- infer_equity :: Lens' c Bool
- ioDay :: Lens' c Day
- mformat :: Lens' c (Maybe StorageFormat)
- mrules_file :: Lens' c (Maybe FilePath)
- new__ :: Lens' c Bool
- new_save :: Lens' c Bool
- pivot :: Lens' c String
- reportspan :: Lens' c DateSpan
- strict :: Lens' c Bool
- verbose_tags :: Lens' c Bool
- class HasReportSpec c where
- reportSpec :: Lens' c ReportSpec
- rsDay :: Lens' c Day
- rsQuery :: Lens' c Query
- rsQueryOpts :: Lens' c [QueryOpt]
- rsReportOpts :: Lens' c ReportOpts
- class HasReportOptsNoUpdate c where
- reportOptsNoUpdate :: Lens' c ReportOpts
- accountlistmode :: Lens' c AccountListMode
- average :: Lens' c Bool
- balanceaccum :: Lens' c BalanceAccumulation
- balancecalc :: Lens' c BalanceCalculation
- budgetpat :: Lens' c (Maybe Text)
- color__ :: Lens' c Bool
- conversionop :: Lens' c (Maybe ConversionOp)
- date2NoUpdate :: Lens' c Bool
- declared :: Lens' c Bool
- depthNoUpdate :: Lens' c (Maybe Int)
- drop__ :: Lens' c Int
- empty__ :: Lens' c Bool
- format :: Lens' c StringFormat
- infer_prices :: Lens' c Bool
- interval :: Lens' c Interval
- invert :: Lens' c Bool
- layout :: Lens' c Layout
- no_elide :: Lens' c Bool
- no_total :: Lens' c Bool
- normalbalance :: Lens' c (Maybe NormalSign)
- percent :: Lens' c Bool
- periodNoUpdate :: Lens' c Period
- pretty :: Lens' c Bool
- querystringNoUpdate :: Lens' c [Text]
- realNoUpdate :: Lens' c Bool
- related :: Lens' c Bool
- row_total :: Lens' c Bool
- show_costs :: Lens' c Bool
- sort_amount :: Lens' c Bool
- statusesNoUpdate :: Lens' c [Status]
- summary_only :: Lens' c Bool
- transpose__ :: Lens' c Bool
- txn_dates :: Lens' c Bool
- value :: Lens' c (Maybe ValuationType)
- class HasReportOptsNoUpdate a => HasReportOpts a where
- reportOpts :: ReportableLens' a ReportOpts
- period :: ReportableLens' a Period
- statuses :: ReportableLens' a [Status]
- depth :: ReportableLens' a (Maybe Int)
- date2 :: ReportableLens' a Bool
- real :: ReportableLens' a Bool
- querystring :: ReportableLens' a [Text]
- data GeneralCategory
- = UppercaseLetter
- | LowercaseLetter
- | TitlecaseLetter
- | ModifierLetter
- | OtherLetter
- | NonSpacingMark
- | SpacingCombiningMark
- | EnclosingMark
- | DecimalNumber
- | LetterNumber
- | OtherNumber
- | ConnectorPunctuation
- | DashPunctuation
- | OpenPunctuation
- | ClosePunctuation
- | InitialQuote
- | FinalQuote
- | OtherPunctuation
- | MathSymbol
- | CurrencySymbol
- | ModifierSymbol
- | OtherSymbol
- | Space
- | LineSeparator
- | ParagraphSeparator
- | Control
- | Format
- | Surrogate
- | PrivateUse
- | NotAssigned
- data HelpFormat
- data FlagInfo
- = FlagReq
- | FlagOpt String
- | FlagOptRare String
- | FlagNone
- class Remap (m :: Type -> Type) where
- remap :: (a -> b) -> (b -> (a, a -> b)) -> m a -> m b
- type Update a = String -> a -> Either String a
- data Permissions
- data XdgDirectory
- data XdgDirectoryList
- data OrdPlus
- data QueryOpt
- data Reader (m :: Type -> Type) = Reader {
- rFormat :: StorageFormat
- rExtensions :: [String]
- rReadFn :: InputOpts -> FilePath -> Text -> ExceptT String IO Journal
- rParser :: MonadIO m => ErroringJournalParser m ParsedJournal
- type AccountTransactionsReport = [AccountTransactionsReportItem]
- type AccountTransactionsReportItem = (Transaction, Transaction, Bool, Text, MixedAmount, MixedAmount)
- type BalanceReport = ([BalanceReportItem], MixedAmount)
- type BalanceReportItem = (AccountName, AccountName, Int, MixedAmount)
- type BudgetAverage = Average
- type BudgetCell = (Maybe Change, Maybe BudgetGoal)
- type BudgetGoal = Change
- type BudgetReport = PeriodicReport DisplayName BudgetCell
- type BudgetReportRow = PeriodicReportRow DisplayName BudgetCell
- type BudgetTotal = Total
- type EntriesReport = [EntriesReportItem]
- type EntriesReportItem = Transaction
- type MultiBalanceReport = PeriodicReport DisplayName MixedAmount
- type MultiBalanceReportRow = PeriodicReportRow DisplayName MixedAmount
- type PostingsReport = [PostingsReportItem]
- type PostingsReportItem = (Maybe Day, Maybe Period, Maybe Text, Posting, MixedAmount)
- data AccountListMode
- data BalanceAccumulation
- data BalanceCalculation
- data Layout
- = LayoutWide (Maybe Int)
- | LayoutTall
- | LayoutBare
- | LayoutTidy
- data ReportOpts = ReportOpts {
- period_ :: Period
- interval_ :: Interval
- statuses_ :: [Status]
- conversionop_ :: Maybe ConversionOp
- value_ :: Maybe ValuationType
- infer_prices_ :: Bool
- depth_ :: Maybe Int
- date2_ :: Bool
- empty_ :: Bool
- no_elide_ :: Bool
- real_ :: Bool
- format_ :: StringFormat
- pretty_ :: Bool
- querystring_ :: [Text]
- average_ :: Bool
- related_ :: Bool
- txn_dates_ :: Bool
- balancecalc_ :: BalanceCalculation
- balanceaccum_ :: BalanceAccumulation
- budgetpat_ :: Maybe Text
- accountlistmode_ :: AccountListMode
- drop_ :: Int
- declared_ :: Bool
- row_total_ :: Bool
- no_total_ :: Bool
- summary_only_ :: Bool
- show_costs_ :: Bool
- sort_amount_ :: Bool
- percent_ :: Bool
- invert_ :: Bool
- normalbalance_ :: Maybe NormalSign
- color_ :: Bool
- transpose_ :: Bool
- layout_ :: Layout
- type Average = MixedAmount
- data CBCSubreportSpec a = CBCSubreportSpec {}
- type Change = MixedAmount
- data CompoundPeriodicReport a b = CompoundPeriodicReport {
- cbrTitle :: Text
- cbrDates :: [DateSpan]
- cbrSubreports :: [(Text, PeriodicReport a b, Bool)]
- cbrTotals :: PeriodicReportRow () b
- data DisplayName = DisplayName {
- displayFull :: AccountName
- displayName :: AccountName
- displayDepth :: Int
- type Percentage = Decimal
- data PeriodicReport a b = PeriodicReport {
- prDates :: [DateSpan]
- prRows :: [PeriodicReportRow a b]
- prTotals :: PeriodicReportRow () b
- data PeriodicReportRow a b = PeriodicReportRow {
- prrName :: a
- prrAmounts :: [b]
- prrTotal :: b
- prrAverage :: b
- type Total = MixedAmount
- newtype ZipList a = ZipList {
- getZipList :: [a]
- newtype WrappedArrow (a :: Type -> Type -> Type) b c = WrapArrow {
- unwrapArrow :: a b c
- newtype WrappedMonad (m :: Type -> Type) a = WrapMonad {
- unwrapMonad :: m a
- data IOErrorType
- data Chan a
- data QSem
- data QSemN
- pattern MixedAmountKeyNoPrice :: !CommoditySymbol -> MixedAmountKey
- pattern MixedAmountKeyTotalPrice :: !CommoditySymbol -> !CommoditySymbol -> MixedAmountKey
- pattern MixedAmountKeyUnitPrice :: !CommoditySymbol -> !CommoditySymbol -> !Quantity -> MixedAmountKey
- pattern April :: MonthOfYear
- pattern August :: MonthOfYear
- pattern BeforeCommonEra :: Integer -> Year
- pattern CommonEra :: Integer -> Year
- pattern December :: MonthOfYear
- pattern February :: MonthOfYear
- pattern January :: MonthOfYear
- pattern July :: MonthOfYear
- pattern June :: MonthOfYear
- pattern March :: MonthOfYear
- pattern May :: MonthOfYear
- pattern November :: MonthOfYear
- pattern October :: MonthOfYear
- pattern September :: MonthOfYear
- pattern YearMonthDay :: Year -> MonthOfYear -> DayOfMonth -> Day
- pager :: String -> IO ()
- process :: Mode a -> [String] -> Either String a
- (++) :: [a] -> [a] -> [a]
- foldr :: Foldable t => (a -> b -> b) -> b -> t a -> b
- minimum :: (Foldable t, Ord a) => t a -> a
- maximum :: (Foldable t, Ord a) => t a -> a
- foldl' :: Foldable t => (b -> a -> b) -> b -> t a -> b
- elem :: (Foldable t, Eq a) => a -> t a -> Bool
- foldl :: Foldable t => (b -> a -> b) -> b -> t a -> b
- foldl1 :: Foldable t => (a -> a -> a) -> t a -> a
- foldr1 :: Foldable t => (a -> a -> a) -> t a -> a
- length :: Foldable t => t a -> Int
- null :: Foldable t => t a -> Bool
- product :: (Foldable t, Num a) => t a -> a
- sum :: (Foldable t, Num a) => t a -> a
- map :: (a -> b) -> [a] -> [b]
- join :: Monad m => m (m a) -> m a
- cycle :: HasCallStack => [a] -> [a]
- groupBy :: (a -> a -> Bool) -> [a] -> [[a]]
- unzip :: [(a, b)] -> ([a], [b])
- ($>) :: Functor f => f a -> b -> f b
- partition :: (a -> Bool) -> [a] -> ([a], [a])
- stripPrefix :: Eq a => [a] -> [a] -> Maybe [a]
- liftM2 :: Monad m => (a1 -> a2 -> r) -> m a1 -> m a2 -> m r
- (<=<) :: Monad m => (b -> m c) -> (a -> m b) -> a -> m c
- repeat :: a -> [a]
- iterate :: (a -> a) -> a -> [a]
- void :: Functor f => f a -> f ()
- zipWith :: (a -> b -> c) -> [a] -> [b] -> [c]
- filter :: (a -> Bool) -> [a] -> [a]
- replicate :: Int -> a -> [a]
- when :: Applicative f => Bool -> f () -> f ()
- uncurry3 :: (a -> b -> c -> d) -> (a, b, c) -> d
- curry3 :: ((a, b, c) -> d) -> a -> b -> c -> d
- dropWhile :: (a -> Bool) -> [a] -> [a]
- takeWhile :: (a -> Bool) -> [a] -> [a]
- span :: (a -> Bool) -> [a] -> ([a], [a])
- comparing :: Ord a => (b -> a) -> b -> b -> Ordering
- group :: Eq a => [a] -> [[a]]
- sort :: Ord a => [a] -> [a]
- nub :: Eq a => [a] -> [a]
- unzip3 :: [(a, b, c)] -> ([a], [b], [c])
- take :: Int -> [a] -> [a]
- drop :: Int -> [a] -> [a]
- splitAt :: Int -> [a] -> ([a], [a])
- inits :: [a] -> [[a]]
- tails :: [a] -> [[a]]
- break :: (a -> Bool) -> [a] -> ([a], [a])
- isSpace :: Char -> Bool
- lines :: String -> [String]
- words :: String -> [String]
- head :: HasCallStack => [a] -> a
- tail :: HasCallStack => [a] -> [a]
- init :: HasCallStack => [a] -> [a]
- last :: HasCallStack => [a] -> a
- catMaybes :: [Maybe a] -> [a]
- zip :: [a] -> [b] -> [(a, b)]
- concat :: Foldable t => t [a] -> [a]
- proc :: FilePath -> [String] -> CreateProcess
- argsToCliOpts :: [String] -> [String] -> IO CliOpts
- helpflags :: [Flag RawOpts]
- detailedversionflag :: Flag RawOpts
- flattreeflags :: Bool -> [Flag RawOpts]
- hiddenflags :: [Flag RawOpts]
- inputflags :: [Flag RawOpts]
- reportflags :: [Flag RawOpts]
- outputFormatFlag :: [String] -> Flag RawOpts
- outputFileFlag :: Flag RawOpts
- generalflagsgroup1 :: (String, [Flag RawOpts])
- generalflagsgroup2 :: (String, [Flag RawOpts])
- generalflagsgroup3 :: (String, [Flag RawOpts])
- defMode :: Mode RawOpts
- defCommandMode :: [Name] -> Mode RawOpts
- addonCommandMode :: Name -> Mode RawOpts
- hledgerCommandMode :: CommandDoc -> [Flag RawOpts] -> [(String, [Flag RawOpts])] -> [Flag RawOpts] -> ([Arg RawOpts], Maybe (Arg RawOpts)) -> Mode RawOpts
- argsFlag :: FlagHelp -> Arg RawOpts
- showModeUsage :: Mode a -> String
- withAliases :: String -> [String] -> String
- likelyExecutablesInPath :: IO [String]
- hledgerExecutablesInPath :: IO [String]
- ensureDebugHasArg :: (Eq (t Char), IsString (t Char), Foldable t) => [t Char] -> [t Char]
- defcliopts :: CliOpts
- getHledgerCliOpts :: Mode RawOpts -> IO CliOpts
- getHledgerCliOpts' :: Mode RawOpts -> [String] -> IO CliOpts
- rawOptsToCliOpts :: RawOpts -> IO CliOpts
- outputFormats :: [String]
- defaultOutputFormat :: String
- journalFilePathFromOpts :: CliOpts -> IO [String]
- rulesFilePathFromOpts :: CliOpts -> IO (Maybe FilePath)
- outputFileFromOpts :: CliOpts -> IO (Maybe FilePath)
- outputFormatFromOpts :: CliOpts -> String
- defaultWidth :: Int
- replaceNumericFlags :: [String] -> [String]
- registerWidthsFromOpts :: CliOpts -> (Int, Maybe Int)
- hledgerAddons :: IO [String]
- topicForMode :: Mode a -> Topic
- fromRight :: b -> Either a b -> b
- isRight :: Either a b -> Bool
- intercalate :: [a] -> [[a]] -> [a]
- isInfixOf :: Eq a => [a] -> [a] -> Bool
- exitSuccess :: IO a
- isPrefixOf :: Eq a => [a] -> [a] -> Bool
- isSuffixOf :: Eq a => [a] -> [a] -> Bool
- testcmd :: CliOpts -> Journal -> IO ()
- builtinCommands :: [(Mode RawOpts, CliOpts -> Journal -> IO ())]
- builtinCommandNames :: [String]
- findBuiltinCommand :: String -> Maybe (Mode RawOpts, CliOpts -> Journal -> IO ())
- knownAddonCommands :: [String]
- knownCommands :: [String]
- printCommandsList :: String -> [String] -> IO ()
- tests_Hledger_Cli :: TestTree
- isAlphaNum :: Char -> Bool
- withArgs :: [String] -> IO a -> IO a
- tests_Cli_Utils :: TestTree
- accountsmode :: Mode RawOpts
- accounts :: CliOpts -> Journal -> IO ()
- forM_ :: (Foldable t, Monad m) => t a -> (a -> m b) -> m ()
- fromMaybe :: a -> Maybe a -> a
- headDef :: a -> [a] -> a
- sortOn :: Ord b => (a -> b) -> [a] -> [a]
- printf :: PrintfType r => String -> r
- activitymode :: Mode RawOpts
- addmode :: Mode RawOpts
- add :: CliOpts -> Journal -> IO ()
- appendToJournalFileOrStdout :: FilePath -> Text -> IO ()
- journalAddTransaction :: Journal -> CliOpts -> Transaction -> IO Journal
- toUpper :: Char -> Char
- toLower :: Char -> Char
- fromJust :: HasCallStack => Maybe a -> a
- isJust :: Maybe a -> Bool
- formatTime :: FormatTime t => TimeLocale -> String -> t -> String
- defaultTimeLocale :: TimeLocale
- headMay :: [a] -> Maybe a
- atMay :: [a] -> Int -> Maybe a
- flagNone :: [Name] -> (a -> a) -> Help -> Flag a
- stderr :: Handle
- hPutStr :: Handle -> String -> IO ()
- hPutStrLn :: Handle -> String -> IO ()
- postingsReportAsText :: CliOpts -> PostingsReport -> Text
- journalSimilarTransaction :: CliOpts -> Journal -> Text -> Maybe Transaction
- aregistermode :: Mode RawOpts
- aregister :: CliOpts -> Journal -> IO ()
- tests_Aregister :: TestTree
- find :: Foldable t => (a -> Bool) -> t a -> Maybe a
- flagReq :: [Name] -> Update a -> FlagHelp -> Help -> Flag a
- balancemode :: Mode RawOpts
- balance :: CliOpts -> Journal -> IO ()
- balanceReportAsText :: ReportOpts -> BalanceReport -> Builder
- balanceReportAsCsv :: ReportOpts -> BalanceReport -> CSV
- balanceReportItemAsText :: ReportOpts -> BalanceReportItem -> (Builder, [Int])
- multiBalanceRowAsCsvText :: ReportOpts -> [DateSpan] -> PeriodicReportRow a MixedAmount -> [[Text]]
- multiBalanceRowAsTableText :: ReportOpts -> PeriodicReportRow a MixedAmount -> [[WideBuilder]]
- multiBalanceReportAsText :: ReportOpts -> MultiBalanceReport -> Text
- multiBalanceReportAsCsv :: ReportOpts -> MultiBalanceReport -> CSV
- multiBalanceReportAsHtml :: ReportOpts -> MultiBalanceReport -> Html ()
- multiBalanceReportHtmlRows :: ReportOpts -> MultiBalanceReport -> (Html (), [Html ()], [Html ()])
- multiBalanceReportHtmlFootRow :: ReportOpts -> [Text] -> Html ()
- balanceReportAsTable :: ReportOpts -> MultiBalanceReport -> Table Text Text WideBuilder
- balanceReportTableAsText :: ReportOpts -> Table Text Text WideBuilder -> Builder
- tests_Balance :: TestTree
- transpose :: [[a]] -> [[a]]
- addDays :: Integer -> Day -> Day
- fromGregorian :: Year -> MonthOfYear -> DayOfMonth -> Day
- maximumMay :: Ord a => [a] -> Maybe a
- balancesheetmode :: Mode RawOpts
- balancesheet :: CliOpts -> Journal -> IO ()
- balancesheetequitymode :: Mode RawOpts
- balancesheetequity :: CliOpts -> Journal -> IO ()
- cashflowmode :: Mode RawOpts
- cashflow :: CliOpts -> Journal -> IO ()
- partitionEithers :: [Either a b] -> ([a], [b])
- closemode :: Mode RawOpts
- close :: CliOpts -> Journal -> IO ()
- codesmode :: Mode RawOpts
- codes :: CliOpts -> Journal -> IO ()
- commoditiesmode :: Mode RawOpts
- commodities :: CliOpts -> Journal -> IO ()
- demomode :: Mode RawOpts
- demo :: CliOpts -> Journal -> IO ()
- exitFailure :: IO a
- threadDelay :: Int -> IO ()
- callProcess :: FilePath -> [String] -> IO ()
- catchIOError :: IO a -> (IOError -> IO a) -> IO a
- readMay :: Read a => String -> Maybe a
- findIndex :: (a -> Bool) -> [a] -> Maybe Int
- dropWhileEnd :: (a -> Bool) -> [a] -> [a]
- hClose :: Handle -> IO ()
- descriptionsmode :: Mode RawOpts
- descriptions :: CliOpts -> Journal -> IO ()
- diffmode :: Mode RawOpts
- diff :: CliOpts -> Journal -> IO ()
- (\\) :: Eq a => [a] -> [a] -> [a]
- nubBy :: (a -> a -> Bool) -> [a] -> [a]
- sortBy :: (a -> a -> Ordering) -> [a] -> [a]
- diffDays :: Day -> Day -> Integer
- helpmode :: Mode RawOpts
- help' :: CliOpts -> Journal -> IO ()
- embedFileRelative :: FilePath -> Q Exp
- importmode :: Mode RawOpts
- importcmd :: CliOpts -> Journal -> IO ()
- incomestatementmode :: Mode RawOpts
- incomestatement :: CliOpts -> Journal -> IO ()
- notesmode :: Mode RawOpts
- notes :: CliOpts -> Journal -> IO ()
- payeesmode :: Mode RawOpts
- payees :: CliOpts -> Journal -> IO ()
- pricesmode :: Mode RawOpts
- prices :: CliOpts -> Journal -> IO ()
- mapMaybe :: (a -> Maybe b) -> [a] -> [b]
- printmode :: Mode RawOpts
- print' :: CliOpts -> Journal -> IO ()
- transactionWithMostlyOriginalPostings :: Transaction -> Transaction
- intersperse :: a -> [a] -> [a]
- lastMay :: [a] -> Maybe a
- minimumDef :: Ord a => a -> [a] -> a
- registermode :: Mode RawOpts
- register :: CliOpts -> Journal -> IO ()
- postingsReportItemAsText :: CliOpts -> Int -> Int -> (PostingsReportItem, [WideBuilder], [WideBuilder]) -> Builder
- tests_Register :: TestTree
- per :: Quantity -> Amount
- intersect :: Eq a => [a] -> [a] -> [a]
- rewritemode :: Mode RawOpts
- rewrite :: CliOpts -> Journal -> IO ()
- fromLeft :: a -> Either a b -> a
- isLeft :: Either a b -> Bool
- statsmode :: Mode RawOpts
- stats :: CliOpts -> Journal -> IO ()
- writeOutputLazyText :: CliOpts -> Text -> IO ()
- tagsmode :: Mode RawOpts
- tags :: CliOpts -> Journal -> IO ()
- compoundBalanceCommandMode :: CompoundBalanceCommandSpec -> Mode RawOpts
- compoundBalanceCommand :: CompoundBalanceCommandSpec -> CliOpts -> Journal -> IO ()
- unsupportedOutputFormatError :: String -> String
- printHelpForTopic :: Tool -> Maybe Topic -> IO ()
- runManForTopic :: Tool -> Maybe Topic -> IO ()
- runInfoForTopic :: Tool -> Maybe Topic -> IO ()
- runPagerForTopic :: Tool -> Maybe Topic -> IO ()
- isNothing :: Maybe a -> Bool
- first3 :: (a, b, c) -> a
- second3 :: (a, b, c) -> b
- third3 :: (a, b, c) -> c
- lookupEnv :: String -> IO (Maybe String)
- formatString :: Bool -> Maybe Int -> Maybe Int -> String -> String
- pack :: String -> Text
- unpack :: Text -> String
- at :: Amount -> Amount -> Amount
- withJournalDo :: CliOpts -> (Journal -> IO a) -> IO a
- writeOutput :: CliOpts -> String -> IO ()
- journalTransform :: CliOpts -> Journal -> Journal
- journalReload :: CliOpts -> ExceptT String IO Journal
- journalReloadIfChanged :: CliOpts -> Day -> Journal -> ExceptT String IO (Journal, Bool)
- journalFileIsNewer :: Journal -> FilePath -> IO Bool
- openBrowserOn :: String -> IO ExitCode
- writeFileWithBackup :: FilePath -> String -> IO ()
- writeFileWithBackupIfChanged :: FilePath -> Text -> IO Bool
- pivotByOpts :: CliOpts -> Journal -> Journal
- anonymiseByOpts :: CliOpts -> Journal -> Journal
- postingsOrTransactionsReportAsText :: Bool -> CliOpts -> (Int -> Int -> (a, [WideBuilder], [WideBuilder]) -> Builder) -> (a -> MixedAmount) -> (a -> MixedAmount) -> [a] -> Builder
- getModificationTime :: FilePath -> IO UTCTime
- getDirectoryContents :: FilePath -> IO [FilePath]
- copyFile :: FilePath -> FilePath -> IO ()
- doesFileExist :: FilePath -> IO Bool
- (</>) :: FilePath -> FilePath -> FilePath
- splitFileName :: FilePath -> (String, String)
- takeDirectory :: FilePath -> FilePath
- readProcessWithExitCode :: FilePath -> [String] -> String -> IO (ExitCode, String, String)
- (<&>) :: Functor f => f a -> (a -> b) -> f b
- packageversion :: PackageVersion
- packagemajorversion :: PackageVersion
- progname :: ProgramName
- versionStringWith :: Either String GitInfo -> ProgramName -> PackageVersion -> VersionString
- splitAtElement :: Eq a => a -> [a] -> [[a]]
- getEnv :: String -> IO String
- (<$>) :: Functor f => (a -> b) -> f a -> f b
- txnTieKnot :: Transaction -> Transaction
- either :: (a -> c) -> (b -> c) -> Either a b -> c
- all :: Foldable t => (a -> Bool) -> t a -> Bool
- and :: Foldable t => t Bool -> Bool
- any :: Foldable t => (a -> Bool) -> t a -> Bool
- concatMap :: Foldable t => (a -> [b]) -> t a -> [b]
- mapM_ :: (Foldable t, Monad m) => (a -> m b) -> t a -> m ()
- notElem :: (Foldable t, Eq a) => a -> t a -> Bool
- or :: Foldable t => t Bool -> Bool
- sequence_ :: (Foldable t, Monad m) => t (m a) -> m ()
- maybe :: b -> (a -> b) -> Maybe a -> b
- unlines :: [String] -> String
- unwords :: [String] -> String
- mapM :: (Traversable t, Monad m) => (a -> m b) -> t a -> m (t b)
- sequence :: (Traversable t, Monad m) => t (m a) -> m (t a)
- (=<<) :: Monad m => (a -> m b) -> m a -> m b
- ioError :: IOError -> IO a
- userError :: String -> IOError
- (!!) :: HasCallStack => [a] -> Int -> a
- lookup :: Eq a => a -> [(a, b)] -> Maybe b
- reverse :: [a] -> [a]
- scanl :: (b -> a -> b) -> b -> [a] -> [b]
- scanl1 :: (a -> a -> a) -> [a] -> [a]
- scanr :: (a -> b -> b) -> b -> [a] -> [b]
- scanr1 :: (a -> a -> a) -> [a] -> [a]
- zip3 :: [a] -> [b] -> [c] -> [(a, b, c)]
- zipWith3 :: (a -> b -> c -> d) -> [a] -> [b] -> [c] -> [d]
- appendFile :: FilePath -> String -> IO ()
- getChar :: IO Char
- getContents :: IO String
- getLine :: IO String
- interact :: (String -> String) -> IO ()
- print :: Show a => a -> IO ()
- putChar :: Char -> IO ()
- putStr :: String -> IO ()
- putStrLn :: String -> IO ()
- readFile :: FilePath -> IO String
- readIO :: Read a => String -> IO a
- readLn :: Read a => IO a
- writeFile :: FilePath -> String -> IO ()
- liftM :: Monad m => (a1 -> r) -> m a1 -> m r
- ord :: Char -> Int
- formatRealFloat :: RealFloat a => a -> FieldFormatter
- intToDigit :: Int -> Char
- isDigit :: Char -> Bool
- foldl1' :: HasCallStack => (a -> a -> a) -> [a] -> a
- toTitle :: Char -> Char
- unfoldr :: (b -> Maybe (a, b)) -> b -> [a]
- singleton :: a -> [a]
- isAscii :: Char -> Bool
- mapAccumL :: Traversable t => (s -> a -> (s, b)) -> s -> t a -> (s, t b)
- mapAccumR :: Traversable t => (s -> a -> (s, b)) -> s -> t a -> (s, t b)
- strip :: String -> String
- takeEnd :: Int -> [a] -> [a]
- uncons :: [a] -> Maybe (a, [a])
- errorShortFormat :: a
- accountSetDeclarationInfo :: Journal -> Account -> Account
- accountTree :: AccountName -> [AccountName] -> Account
- accountsFromPostings :: [Posting] -> [Account]
- accountsLevels :: Account -> [[Account]]
- anyAccounts :: (Account -> Bool) -> Account -> Bool
- clipAccounts :: Int -> Account -> Account
- clipAccountsAndAggregate :: Maybe Int -> [Account] -> [Account]
- filterAccounts :: (Account -> Bool) -> Account -> [Account]
- flattenAccounts :: Account -> [Account]
- lookupAccount :: AccountName -> [Account] -> Maybe Account
- mapAccounts :: (Account -> Account) -> Account -> Account
- nullacct :: Account
- parentAccounts :: Account -> [Account]
- printAccounts :: Account -> IO ()
- pruneAccounts :: (Account -> Bool) -> Account -> Maybe Account
- showAccounts :: Account -> String
- showAccountsBoringFlag :: Account -> String
- sortAccountNamesByDeclaration :: Journal -> Bool -> [AccountName] -> [AccountName]
- sortAccountTreeByAmount :: NormalSign -> Account -> Account
- sumAccounts :: Account -> Account
- accountLeafName :: AccountName -> Text
- accountNameApplyAliases :: [AccountAlias] -> AccountName -> Either RegexError AccountName
- accountNameApplyAliasesMemo :: [AccountAlias] -> AccountName -> Either RegexError AccountName
- accountNameComponents :: AccountName -> [Text]
- accountNameDrop :: Int -> AccountName -> AccountName
- accountNameFromComponents :: [Text] -> AccountName
- accountNameInferType :: AccountName -> Maybe AccountType
- accountNameLevel :: AccountName -> Int
- accountNamePostingType :: AccountName -> PostingType
- accountNameToAccountOnlyRegex :: AccountName -> Regexp
- accountNameToAccountOnlyRegexCI :: AccountName -> Regexp
- accountNameToAccountRegex :: AccountName -> Regexp
- accountNameToAccountRegexCI :: AccountName -> Regexp
- accountNameToBeancount :: AccountName -> BeancountAccountName
- accountNameTreeFrom :: [AccountName] -> Tree AccountName
- accountNameType :: Map AccountName AccountType -> AccountName -> Maybe AccountType
- accountNameWithPostingType :: PostingType -> AccountName -> AccountName
- accountNameWithoutPostingType :: AccountName -> AccountName
- accountSummarisedName :: AccountName -> Text
- acctsep :: Text
- acctsepchar :: Char
- assetAccountRegex :: Regexp
- beancountTopLevelAccounts :: IsString a => [a]
- cashAccountRegex :: Regexp
- clipAccountName :: Maybe Int -> AccountName -> AccountName
- clipOrEllipsifyAccountName :: Maybe Int -> AccountName -> AccountName
- concatAccountNames :: [AccountName] -> AccountName
- conversionAccountRegex :: Regexp
- elideAccountName :: Int -> AccountName -> AccountName
- equityAccountRegex :: Regexp
- escapeName :: AccountName -> Text
- expandAccountName :: AccountName -> [AccountName]
- expandAccountNames :: [AccountName] -> [AccountName]
- expenseAccountRegex :: Regexp
- isAccountNamePrefixOf :: AccountName -> AccountName -> Bool
- isSubAccountNameOf :: AccountName -> AccountName -> Bool
- joinAccountNames :: AccountName -> AccountName -> AccountName
- liabilityAccountRegex :: Regexp
- parentAccountName :: AccountName -> AccountName
- parentAccountNames :: AccountName -> [AccountName]
- revenueAccountRegex :: Regexp
- subAccountNamesFrom :: [AccountName] -> AccountName -> [AccountName]
- tests_AccountName :: TestTree
- topAccountName :: AccountName -> AccountName
- topAccountNames :: [AccountName] -> [AccountName]
- unbudgetedAccountName :: Text
- (@@) :: Amount -> Amount -> Amount
- amountCost :: Amount -> Amount
- amountDisplayPrecision :: Amount -> Word8
- amountInternalPrecision :: Amount -> Word8
- amountIsZero :: Amount -> Bool
- amountLooksZero :: Amount -> Bool
- amountSetFullPrecision :: Amount -> Amount
- amountSetFullPrecisionOr :: Maybe Word8 -> Amount -> Amount
- amountSetPrecision :: AmountPrecision -> Amount -> Amount
- amountSetPrecisionMax :: Word8 -> Amount -> Amount
- amountSetPrecisionMin :: Word8 -> Amount -> Amount
- amountSetStyles :: Map CommoditySymbol AmountStyle -> Amount -> Amount
- amountStripCost :: Amount -> Amount
- amountStyleSetRounding :: Rounding -> AmountStyle -> AmountStyle
- amountStylesSetRounding :: Rounding -> Map CommoditySymbol AmountStyle -> Map CommoditySymbol AmountStyle
- amountUnstyled :: Amount -> Amount
- amountWithCommodity :: CommoditySymbol -> Amount -> Amount
- amounts :: MixedAmount -> [Amount]
- amountsPreservingZeros :: MixedAmount -> [Amount]
- amountsRaw :: MixedAmount -> [Amount]
- amountstyle :: AmountStyle
- averageMixedAmounts :: [MixedAmount] -> MixedAmount
- canonicaliseAmount :: Map CommoditySymbol AmountStyle -> Amount -> Amount
- canonicaliseMixedAmount :: Map CommoditySymbol AmountStyle -> MixedAmount -> MixedAmount
- cshowAmount :: Amount -> String
- csvDisplay :: AmountDisplayOpts
- defaultMaxPrecision :: Word8
- divideAmount :: Quantity -> Amount -> Amount
- divideMixedAmount :: Quantity -> MixedAmount -> MixedAmount
- eur :: DecimalRaw Integer -> Amount
- filterMixedAmount :: (Amount -> Bool) -> MixedAmount -> MixedAmount
- filterMixedAmountByCommodity :: CommoditySymbol -> MixedAmount -> MixedAmount
- gbp :: DecimalRaw Integer -> Amount
- hrs :: Quantity -> Amount
- invertAmount :: Amount -> Amount
- isMissingMixedAmount :: MixedAmount -> Bool
- isNegativeAmount :: Amount -> Bool
- isNegativeMixedAmount :: MixedAmount -> Maybe Bool
- isNonsimpleCommodityChar :: Char -> Bool
- maAddAmount :: MixedAmount -> Amount -> MixedAmount
- maAddAmounts :: Foldable t => MixedAmount -> t Amount -> MixedAmount
- maCommodities :: MixedAmount -> Set CommoditySymbol
- maIsNonZero :: MixedAmount -> Bool
- maIsZero :: MixedAmount -> Bool
- maMinus :: MixedAmount -> MixedAmount -> MixedAmount
- maNegate :: MixedAmount -> MixedAmount
- maPlus :: MixedAmount -> MixedAmount -> MixedAmount
- maSum :: Foldable t => t MixedAmount -> MixedAmount
- mapMixedAmount :: (Amount -> Amount) -> MixedAmount -> MixedAmount
- missingamt :: Amount
- missingmixedamt :: MixedAmount
- mixed :: Foldable t => t Amount -> MixedAmount
- mixedAmount :: Amount -> MixedAmount
- mixedAmountCost :: MixedAmount -> MixedAmount
- mixedAmountIsZero :: MixedAmount -> Bool
- mixedAmountLooksZero :: MixedAmount -> Bool
- mixedAmountSetFullPrecision :: MixedAmount -> MixedAmount
- mixedAmountSetPrecision :: AmountPrecision -> MixedAmount -> MixedAmount
- mixedAmountSetPrecisionMax :: Word8 -> MixedAmount -> MixedAmount
- mixedAmountSetPrecisionMin :: Word8 -> MixedAmount -> MixedAmount
- mixedAmountSetStyles :: Map CommoditySymbol AmountStyle -> MixedAmount -> MixedAmount
- mixedAmountStripPrices :: MixedAmount -> MixedAmount
- mixedAmountUnstyled :: MixedAmount -> MixedAmount
- multiplyAmount :: Quantity -> Amount -> Amount
- multiplyMixedAmount :: Quantity -> MixedAmount -> MixedAmount
- noColour :: AmountDisplayOpts
- noCost :: AmountDisplayOpts
- nullamt :: Amount
- nullmixedamt :: MixedAmount
- num :: Quantity -> Amount
- oneLine :: AmountDisplayOpts
- quoteCommoditySymbolIfNeeded :: Text -> Text
- setAmountDecimalPoint :: Maybe Char -> Amount -> Amount
- setAmountInternalPrecision :: Word8 -> Amount -> Amount
- showAmount :: Amount -> String
- showAmountB :: AmountDisplayOpts -> Amount -> WideBuilder
- showAmountCostB :: Amount -> WideBuilder
- showAmountDebug :: Amount -> String
- showAmountWith :: AmountDisplayOpts -> Amount -> String
- showAmountWithZeroCommodity :: Amount -> String
- showAmountWithoutPrice :: Amount -> String
- showCommoditySymbol :: Text -> Text
- showMixedAmount :: MixedAmount -> String
- showMixedAmountB :: AmountDisplayOpts -> MixedAmount -> WideBuilder
- showMixedAmountDebug :: MixedAmount -> String
- showMixedAmountElided :: Int -> Bool -> MixedAmount -> String
- showMixedAmountLinesB :: AmountDisplayOpts -> MixedAmount -> [WideBuilder]
- showMixedAmountOneLine :: MixedAmount -> String
- showMixedAmountOneLineWithoutPrice :: Bool -> MixedAmount -> String
- showMixedAmountWith :: AmountDisplayOpts -> MixedAmount -> String
- showMixedAmountWithZeroCommodity :: MixedAmount -> String
- showMixedAmountWithoutPrice :: Bool -> MixedAmount -> String
- styleAmount :: Map CommoditySymbol AmountStyle -> Amount -> Amount
- styleMixedAmount :: Map CommoditySymbol AmountStyle -> MixedAmount -> MixedAmount
- tests_Amount :: TestTree
- unifyMixedAmount :: MixedAmount -> Maybe Amount
- usd :: DecimalRaw Integer -> Amount
- withDecimalPoint :: Amount -> Maybe Char -> Amount
- withInternalPrecision :: Amount -> Word8 -> Amount
- withPrecision :: Amount -> AmountPrecision -> Amount
- balanceTransaction :: BalancingOpts -> Transaction -> Either String Transaction
- balanceTransactionHelper :: BalancingOpts -> Transaction -> Either String (Transaction, [(AccountName, MixedAmount)])
- defbalancingopts :: BalancingOpts
- isTransactionBalanced :: BalancingOpts -> Transaction -> Bool
- journalBalanceTransactions :: BalancingOpts -> Journal -> Either String Journal
- journalCheckBalanceAssertions :: Journal -> Maybe String
- tests_Balancing :: TestTree
- datesepchar :: forall (m :: Type -> Type). TextParser m Char
- datesepchars :: String
- daysInSpan :: DateSpan -> Maybe Integer
- daysSpan :: [Day] -> DateSpan
- elapsedSeconds :: Fractional a => UTCTime -> UTCTime -> a
- emptydatespan :: DateSpan
- fixSmartDate :: Day -> SmartDate -> EFDay
- fixSmartDateStr :: Day -> Text -> Text
- fixSmartDateStrEither :: Day -> Text -> Either HledgerParseErrors Text
- fixSmartDateStrEither' :: Day -> Text -> Either HledgerParseErrors EFDay
- getCurrentDay :: IO Day
- getCurrentMonth :: IO Int
- getCurrentYear :: IO Integer
- groupByDateSpan :: Bool -> (a -> Day) -> [DateSpan] -> [a] -> [(DateSpan, [a])]
- intervalBoundaryBefore :: Interval -> Day -> Day
- isDateSepChar :: Char -> Bool
- latestSpanContaining :: [DateSpan] -> Day -> Maybe DateSpan
- nulldate :: Day
- nulldatespan :: DateSpan
- parsePeriodExpr :: Day -> Text -> Either HledgerParseErrors (Interval, DateSpan)
- parsePeriodExpr' :: Day -> Text -> (Interval, DateSpan)
- parsedateM :: String -> Maybe Day
- periodContainsDate :: Period -> Day -> Bool
- periodexprp :: forall (m :: Type -> Type). Day -> TextParser m (Interval, DateSpan)
- prevday :: Day -> Day
- showDate :: Day -> Text
- showDateSpan :: DateSpan -> Text
- showDateSpanDebug :: DateSpan -> String
- showDateSpanMonthAbbrev :: DateSpan -> Text
- showEFDate :: EFDay -> Text
- smartdate :: forall (m :: Type -> Type). TextParser m SmartDate
- spanContainsDate :: DateSpan -> Day -> Bool
- spanDefaultsFrom :: DateSpan -> DateSpan -> DateSpan
- spanEnd :: DateSpan -> Maybe Day
- spanEndYear :: DateSpan -> Maybe Year
- spanIntersect :: DateSpan -> DateSpan -> DateSpan
- spanStart :: DateSpan -> Maybe Day
- spanStartYear :: DateSpan -> Maybe Year
- spanUnion :: DateSpan -> DateSpan -> DateSpan
- spanYears :: DateSpan -> [Year]
- spansFromBoundaries :: Day -> [Day] -> [DateSpan]
- spansIntersect :: [DateSpan] -> DateSpan
- spansSpan :: [DateSpan] -> DateSpan
- spansUnion :: [DateSpan] -> DateSpan
- splitSpan :: Bool -> Interval -> DateSpan -> [DateSpan]
- tests_Dates :: TestTree
- yearp :: forall (m :: Type -> Type). TextParser m Integer
- makeAccountTagErrorExcerpt :: (AccountName, AccountDeclarationInfo) -> TagName -> (FilePath, Int, Maybe (Int, Maybe Int), Text)
- makeBalanceAssertionErrorExcerpt :: Posting -> (FilePath, Int, Maybe (Int, Maybe Int), Text)
- makePostingAccountErrorExcerpt :: Posting -> (FilePath, Int, Maybe (Int, Maybe Int), Text)
- makePostingErrorExcerpt :: Posting -> (Posting -> Transaction -> Text -> Maybe (Int, Maybe Int)) -> (FilePath, Int, Maybe (Int, Maybe Int), Text)
- makeTransactionErrorExcerpt :: Transaction -> (Transaction -> Maybe (Int, Maybe Int)) -> (FilePath, Int, Maybe (Int, Maybe Int), Text)
- transactionFindPostingIndex :: (Posting -> Bool) -> Transaction -> Maybe Int
- addPeriodicTransaction :: PeriodicTransaction -> Journal -> Journal
- addPriceDirective :: PriceDirective -> Journal -> Journal
- addTransaction :: Transaction -> Journal -> Journal
- addTransactionModifier :: TransactionModifier -> Journal -> Journal
- canonicalStyleFrom :: [AmountStyle] -> AmountStyle
- commodityStylesFromAmounts :: [Amount] -> Either String (Map CommoditySymbol AmountStyle)
- dbgJournalAcctDeclOrder :: String -> Journal -> Journal
- filterJournalAmounts :: Query -> Journal -> Journal
- filterJournalPostings :: Query -> Journal -> Journal
- filterJournalRelatedPostings :: Query -> Journal -> Journal
- filterJournalTransactions :: Query -> Journal -> Journal
- filterPostingAmount :: Query -> Posting -> Maybe Posting
- filterTransactionAmounts :: Query -> Transaction -> Transaction
- filterTransactionPostings :: Query -> Transaction -> Transaction
- filterTransactionPostingsExtra :: (AccountName -> Maybe AccountType) -> Query -> Transaction -> Transaction
- filterTransactionRelatedPostings :: Query -> Transaction -> Transaction
- journalAccountNameTree :: Journal -> Tree AccountName
- journalAccountNames :: Journal -> [AccountName]
- journalAccountNamesDeclared :: Journal -> [AccountName]
- journalAccountNamesDeclaredOrImplied :: Journal -> [AccountName]
- journalAccountNamesDeclaredOrUsed :: Journal -> [AccountName]
- journalAccountNamesImplied :: Journal -> [AccountName]
- journalAccountNamesUsed :: Journal -> [AccountName]
- journalAccountTags :: Journal -> AccountName -> [Tag]
- journalAccountType :: Journal -> AccountName -> Maybe AccountType
- journalAccountTypes :: Journal -> Map AccountName AccountType
- journalAddAccountTypes :: Journal -> Journal
- journalApplyAliases :: [AccountAlias] -> Journal -> Either RegexError Journal
- journalCommodities :: Journal -> Set CommoditySymbol
- journalCommoditiesDeclared :: Journal -> [CommoditySymbol]
- journalCommodityStyles :: Journal -> Map CommoditySymbol AmountStyle
- journalCommodityStylesWith :: Rounding -> Journal -> Map CommoditySymbol AmountStyle
- journalConcat :: Journal -> Journal -> Journal
- journalConversionAccount :: Journal -> AccountName
- journalConversionAccounts :: Journal -> [AccountName]
- journalDateSpan :: Bool -> Journal -> DateSpan
- journalDateSpanBothDates :: Journal -> DateSpan
- journalDescriptions :: Journal -> [Text]
- journalEndDate :: Bool -> Journal -> Maybe Day
- journalFilePath :: Journal -> FilePath
- journalFilePaths :: Journal -> [FilePath]
- journalInferCommodityStyles :: Journal -> Either String Journal
- journalInferCostsFromEquity :: Journal -> Either String Journal
- journalInferEquityFromCosts :: Bool -> Journal -> Journal
- journalInferMarketPricesFromTransactions :: Journal -> Journal
- journalInheritedAccountTags :: Journal -> AccountName -> [Tag]
- journalLastDay :: Bool -> Journal -> Maybe Day
- journalLeafAccountNames :: Journal -> [AccountName]
- journalLeafAccountNamesDeclared :: Journal -> [AccountName]
- journalMapPostingAmounts :: (MixedAmount -> MixedAmount) -> Journal -> Journal
- journalMapPostings :: (Posting -> Posting) -> Journal -> Journal
- journalMapTransactions :: (Transaction -> Transaction) -> Journal -> Journal
- journalMarkRedundantCosts :: Journal -> Either String Journal
- journalModifyTransactions :: Bool -> Day -> Journal -> Either String Journal
- journalNextTransaction :: Journal -> Transaction -> Maybe Transaction
- journalNumberAndTieTransactions :: Journal -> Journal
- journalNumberTransactions :: Journal -> Journal
- journalPayeesDeclared :: Journal -> [Payee]
- journalPayeesDeclaredOrUsed :: Journal -> [Payee]
- journalPayeesUsed :: Journal -> [Payee]
- journalPivot :: Text -> Journal -> Journal
- journalPostingAmounts :: Journal -> [MixedAmount]
- journalPostings :: Journal -> [Posting]
- journalPostingsAddAccountTags :: Journal -> Journal
- journalPrevTransaction :: Journal -> Transaction -> Maybe Transaction
- journalRenumberAccountDeclarations :: Journal -> Journal
- journalReverse :: Journal -> Journal
- journalSetLastReadTime :: POSIXTime -> Journal -> Journal
- journalStartDate :: Bool -> Journal -> Maybe Day
- journalStyleAmounts :: Journal -> Either String Journal
- journalTagsDeclared :: Journal -> [TagName]
- journalTagsDeclaredOrUsed :: Journal -> [TagName]
- journalTagsUsed :: Journal -> [TagName]
- journalToCost :: ConversionOp -> Journal -> Journal
- journalTransactionAt :: Journal -> Integer -> Maybe Transaction
- journalTransactionsSimilarTo :: Journal -> Text -> Query -> SimilarityScore -> Int -> [(DateWeightedSimilarityScore, Age, SimilarityScore, Transaction)]
- journalUntieTransactions :: Transaction -> Transaction
- nulljournal :: Journal
- samplejournal :: Journal
- samplejournalMaybeExplicit :: Bool -> Journal
- showJournalAmountsDebug :: Journal -> String
- tests_Journal :: TestTree
- journalCheckAccounts :: Journal -> Either String ()
- journalCheckCommodities :: Journal -> Either String ()
- journalCheckPairedConversionPostings :: Journal -> Either String ()
- journalCheckPayees :: Journal -> Either String ()
- journalCheckRecentAssertions :: Day -> Journal -> Either String ()
- journalCheckTags :: Journal -> Either String ()
- journalCheckOrdereddates :: WhichDate -> Journal -> Either String ()
- journalCheckUniqueleafnames :: Journal -> Either String ()
- readJsonFile :: FromJSON a => FilePath -> IO a
- toJsonText :: ToJSON a => a -> Text
- writeJsonFile :: ToJSON a => FilePath -> a -> IO ()
- ledgerAccount :: Ledger -> AccountName -> Maybe Account
- ledgerAccountNames :: Ledger -> [AccountName]
- ledgerCommodities :: Ledger -> [CommoditySymbol]
- ledgerDateSpan :: Ledger -> DateSpan
- ledgerFromJournal :: Query -> Journal -> Ledger
- ledgerLeafAccounts :: Ledger -> [Account]
- ledgerPostings :: Ledger -> [Posting]
- ledgerRootAccount :: Ledger -> Account
- ledgerTopAccounts :: Ledger -> [Account]
- nullledger :: Ledger
- tests_Ledger :: TestTree
- dateSpanAsPeriod :: DateSpan -> Period
- firstMonthOfQuarter :: Num a => a -> a
- isLastDayOfMonth :: (Eq a1, Eq a2, Num a1, Num a2) => Year -> a1 -> a2 -> Bool
- isStandardPeriod :: Period -> Bool
- mondayBefore :: Day -> Day
- periodAsDateSpan :: Period -> DateSpan
- periodEnd :: Period -> Maybe Day
- periodGrow :: Period -> Period
- periodMoveTo :: Day -> Period -> Period
- periodNext :: Period -> Period
- periodNextIn :: DateSpan -> Period -> Period
- periodPrevious :: Period -> Period
- periodPreviousIn :: DateSpan -> Period -> Period
- periodShrink :: Day -> Period -> Period
- periodStart :: Period -> Maybe Day
- periodTextWidth :: Period -> Int
- quarterContainingMonth :: Integral a => a -> a
- showPeriod :: Period -> Text
- showPeriodMonthAbbrev :: Period -> Text
- simplifyPeriod :: Period -> Period
- startOfFirstWeekInMonth :: Integer -> Int -> Day
- yearMonthContainingWeekStarting :: Day -> (Year, MonthOfYear)
- checkPeriodicTransactionStartDate :: Interval -> DateSpan -> Text -> Maybe String
- runPeriodicTransaction :: Bool -> PeriodicTransaction -> DateSpan -> [Transaction]
- accountNamesFromPostings :: [Posting] -> [AccountName]
- balassert :: Amount -> Maybe BalanceAssertion
- balassertParInc :: Amount -> Maybe BalanceAssertion
- balassertTot :: Amount -> Maybe BalanceAssertion
- balassertTotInc :: Amount -> Maybe BalanceAssertion
- commentAddTag :: Text -> Tag -> Text
- commentAddTagNextLine :: Text -> Tag -> Text
- commentAddTagUnspaced :: Text -> Tag -> Text
- commentJoin :: Text -> Text -> Text
- hasAmount :: Posting -> Bool
- hasBalanceAssignment :: Posting -> Bool
- isBalancedVirtual :: Posting -> Bool
- isEmptyPosting :: Posting -> Bool
- isPostingInDateSpan :: DateSpan -> Posting -> Bool
- isPostingInDateSpan' :: WhichDate -> DateSpan -> Posting -> Bool
- isReal :: Posting -> Bool
- isVirtual :: Posting -> Bool
- nullassertion :: BalanceAssertion
- nullposting :: Posting
- nullsourcepos :: (SourcePos, SourcePos)
- originalPosting :: Posting -> Posting
- post :: AccountName -> Amount -> Posting
- post' :: AccountName -> Amount -> Maybe BalanceAssertion -> Posting
- posting :: Posting
- postingAddInferredEquityPostings :: Bool -> Text -> Posting -> [Posting]
- postingAddTags :: Posting -> [Tag] -> Posting
- postingAllTags :: Posting -> [Tag]
- postingApplyAliases :: [AccountAlias] -> Posting -> Either RegexError Posting
- postingApplyCommodityStyles :: Map CommoditySymbol AmountStyle -> Posting -> Posting
- postingApplyValuation :: PriceOracle -> Map CommoditySymbol AmountStyle -> Day -> Day -> ValuationType -> Posting -> Posting
- postingAsLines :: Bool -> Bool -> Int -> Int -> Posting -> ([Text], Int, Int)
- postingAsLinesBeancount :: Bool -> Int -> Int -> Posting -> ([Text], Int, Int)
- postingDate :: Posting -> Day
- postingDate2 :: Posting -> Day
- postingDateOrDate2 :: WhichDate -> Posting -> Day
- postingPriceDirectivesFromCost :: Posting -> [PriceDirective]
- postingStatus :: Posting -> Status
- postingStripPrices :: Posting -> Posting
- postingStyleAmounts :: Map CommoditySymbol AmountStyle -> Posting -> Posting
- postingToCost :: ConversionOp -> Posting -> Maybe Posting
- postingTransformAmount :: (MixedAmount -> MixedAmount) -> Posting -> Posting
- postingsAsLines :: Bool -> [Posting] -> [Text]
- postingsAsLinesBeancount :: [Posting] -> [Text]
- relatedPostings :: Posting -> [Posting]
- renderCommentLines :: Text -> [Text]
- showAccountName :: Maybe Int -> PostingType -> AccountName -> Text
- showAccountNameBeancount :: Maybe Int -> AccountName -> Text
- showBalanceAssertion :: BalanceAssertion -> WideBuilder
- showPosting :: Posting -> String
- showPostingLines :: Posting -> [Text]
- sumPostings :: [Posting] -> MixedAmount
- tests_Posting :: TestTree
- transactionAllTags :: Transaction -> [Tag]
- vpost :: AccountName -> Amount -> Posting
- vpost' :: AccountName -> Amount -> Maybe BalanceAssertion -> Posting
- appendopts :: [(String, String)] -> RawOpts -> RawOpts
- boolopt :: String -> RawOpts -> Bool
- choiceopt :: (String -> Maybe a) -> RawOpts -> Maybe a
- collectopts :: ((String, String) -> Maybe a) -> RawOpts -> [a]
- intopt :: String -> RawOpts -> Int
- listofstringopt :: String -> RawOpts -> [String]
- maybecharopt :: String -> RawOpts -> Maybe Char
- maybeintopt :: String -> RawOpts -> Maybe Int
- maybeposintopt :: String -> RawOpts -> Maybe Int
- maybestringopt :: String -> RawOpts -> Maybe String
- mkRawOpts :: [(String, String)] -> RawOpts
- overRawOpts :: ([(String, String)] -> [(String, String)]) -> RawOpts -> RawOpts
- posintopt :: String -> RawOpts -> Int
- setboolopt :: String -> RawOpts -> RawOpts
- setopt :: String -> String -> RawOpts -> RawOpts
- stringopt :: String -> RawOpts -> String
- toggleopt :: String -> RawOpts -> Bool
- unsetboolopt :: String -> RawOpts -> RawOpts
- defaultBalanceLineFormat :: StringFormat
- defaultStringFormatStyle :: [StringFormatComponent] -> StringFormat
- parseStringFormat :: Text -> Either String StringFormat
- tests_StringFormat :: TestTree
- tests_Timeclock :: TestTree
- timeclockEntriesToTransactions :: LocalTime -> [TimeclockEntry] -> [Transaction]
- annotateErrorWithTransaction :: Transaction -> String -> String
- assignmentPostings :: Transaction -> [Posting]
- balancedVirtualPostings :: Transaction -> [Posting]
- hasRealPostings :: Transaction -> Bool
- nulltransaction :: Transaction
- partitionAndCheckConversionPostings :: Bool -> [AccountName] -> [IdxPosting] -> Either Text ([(IdxPosting, IdxPosting)], ([IdxPosting], [IdxPosting]))
- realPostings :: Transaction -> [Posting]
- showTransaction :: Transaction -> Text
- showTransactionBeancount :: Transaction -> Text
- showTransactionLineFirstPart :: Transaction -> Text
- showTransactionOneLineAmounts :: Transaction -> Text
- tests_Transaction :: TestTree
- transaction :: Day -> [Posting] -> Transaction
- transactionAddInferredEquityPostings :: Bool -> AccountName -> Transaction -> Transaction
- transactionAmounts :: Transaction -> [MixedAmount]
- transactionApplyAliases :: [AccountAlias] -> Transaction -> Either RegexError Transaction
- transactionApplyValuation :: PriceOracle -> Map CommoditySymbol AmountStyle -> Day -> Day -> ValuationType -> Transaction -> Transaction
- transactionDate2 :: Transaction -> Day
- transactionDateOrDate2 :: WhichDate -> Transaction -> Day
- transactionFile :: Transaction -> FilePath
- transactionInferCostsFromEquity :: Bool -> [AccountName] -> Transaction -> Either String Transaction
- transactionMapPostingAmounts :: (MixedAmount -> MixedAmount) -> Transaction -> Transaction
- transactionMapPostings :: (Posting -> Posting) -> Transaction -> Transaction
- transactionNote :: Transaction -> Text
- transactionPayee :: Transaction -> Text
- transactionToCost :: ConversionOp -> Transaction -> Transaction
- transactionTransformPostings :: (Posting -> Posting) -> Transaction -> Transaction
- transactionsPostings :: [Transaction] -> [Posting]
- txnUntieKnot :: Transaction -> Transaction
- virtualPostings :: Transaction -> [Posting]
- modifyTransactions :: (AccountName -> Maybe AccountType) -> (AccountName -> [Tag]) -> Map CommoditySymbol AmountStyle -> Day -> Bool -> [TransactionModifier] -> [Transaction] -> Either String [Transaction]
- fromEFDay :: EFDay -> Day
- isAccountSubtypeOf :: AccountType -> AccountType -> Bool
- isBalanceSheetAccountType :: AccountType -> Bool
- isDecimalMark :: Char -> Bool
- isIncomeStatementAccountType :: AccountType -> Bool
- maCompare :: MixedAmount -> MixedAmount -> Ordering
- modifyEFDay :: (Day -> Day) -> EFDay -> EFDay
- nullaccountdeclarationinfo :: AccountDeclarationInfo
- nullpayeedeclarationinfo :: PayeeDeclarationInfo
- nullperiodictransaction :: PeriodicTransaction
- nulltagdeclarationinfo :: TagDeclarationInfo
- nulltransactionmodifier :: TransactionModifier
- amountPriceDirectiveFromCost :: Day -> Amount -> Maybe PriceDirective
- journalPriceOracle :: Bool -> Journal -> PriceOracle
- marketPriceReverse :: MarketPrice -> MarketPrice
- mixedAmountApplyGain :: PriceOracle -> Map CommoditySymbol AmountStyle -> Day -> Day -> Day -> ValuationType -> MixedAmount -> MixedAmount
- mixedAmountApplyValuation :: PriceOracle -> Map CommoditySymbol AmountStyle -> Day -> Day -> Day -> ValuationType -> MixedAmount -> MixedAmount
- mixedAmountGainAtDate :: PriceOracle -> Map CommoditySymbol AmountStyle -> Maybe CommoditySymbol -> Day -> MixedAmount -> MixedAmount
- mixedAmountToCost :: Map CommoditySymbol AmountStyle -> ConversionOp -> MixedAmount -> MixedAmount
- mixedAmountValueAtDate :: PriceOracle -> Map CommoditySymbol AmountStyle -> Maybe CommoditySymbol -> Day -> MixedAmount -> MixedAmount
- priceDirectiveToMarketPrice :: PriceDirective -> MarketPrice
- tests_Valuation :: TestTree
- valuationTypeValuationCommodity :: ValuationType -> Maybe CommoditySymbol
- wbToText :: WideBuilder -> Text
- wbUnpack :: WideBuilder -> String
- tests_Data :: TestTree
- delete :: Eq a => a -> [a] -> [a]
- insert :: Ord a => a -> [a] -> [a]
- union :: Eq a => [a] -> [a] -> [a]
- char8 :: TextEncoding
- showLitChar :: Char -> ShowS
- stdout :: Handle
- numDigitsInt :: Integral a => Int -> a
- numDigitsInteger :: Integer -> Int
- colorB :: ColorIntensity -> Color -> WideBuilder -> WideBuilder
- textQuoteIfNeeded :: Text -> Text
- wbFromText :: Text -> WideBuilder
- ap :: Monad m => m (a -> b) -> m a -> m b
- applyN :: Int -> (a -> a) -> a -> a
- error' :: String -> a
- choice' :: forall (m :: Type -> Type) a. [TextParser m a] -> TextParser m a
- parsewith :: Parsec e Text a -> Text -> Either (ParseErrorBundle Text e) a
- skipNonNewlineSpaces :: forall s (m :: Type -> Type). (Stream s, Token s ~ Char) => ParsecT HledgerParseErrorData s m ()
- readDecimal :: Text -> Integer
- customErrorBundlePretty :: HledgerParseErrors -> String
- isNonNewlineSpace :: Char -> Bool
- showGregorian :: Day -> String
- isLeapYear :: Year -> Bool
- parseTimeMultipleM :: (MonadFail m, ParseTime t) => Bool -> TimeLocale -> [(String, String)] -> m t
- matchesAmount :: Query -> Amount -> Bool
- matchesPosting :: Query -> Posting -> Bool
- matchesPostingExtra :: (AccountName -> Maybe AccountType) -> Query -> Posting -> Bool
- matchesTransaction :: Query -> Transaction -> Bool
- matchesTransactionExtra :: (AccountName -> Maybe AccountType) -> Query -> Transaction -> Bool
- first4 :: (a, b, c, d) -> a
- treeLeaves :: Tree a -> [a]
- dbg1With :: Show a => (a -> String) -> a -> a
- dbg4 :: Show a => String -> a -> a
- dbg7 :: Show a => String -> a -> a
- debugLevel :: Int
- traceOrLogAtWith :: Int -> (a -> String) -> a -> a
- uppercase :: String -> String
- mkPos :: Int -> Pos
- filterQuery :: (Query -> Bool) -> Query -> Query
- queryIsDepth :: Query -> Bool
- queryIsSym :: Query -> Bool
- pshow :: Show a => a -> String
- fitText :: Maybe Int -> Maybe Int -> Bool -> Bool -> Text -> Text
- wrap :: Text -> Text -> Text -> Text
- dbg7With :: Show a => (a -> String) -> a -> a
- sourcePosPairPretty :: (SourcePos, SourcePos) -> String
- escapeBackslash :: Text -> Text
- escapeDoubleQuotes :: Text -> Text
- genericTake :: Integral i => i -> [a] -> [a]
- addGregorianDurationClip :: CalendarDiffDays -> Day -> Day
- addGregorianDurationRollOver :: CalendarDiffDays -> Day -> Day
- addGregorianMonthsClip :: Integer -> Day -> Day
- addGregorianMonthsRollOver :: Integer -> Day -> Day
- addGregorianYearsClip :: Integer -> Day -> Day
- addGregorianYearsRollOver :: Integer -> Day -> Day
- diffGregorianDurationClip :: Day -> Day -> CalendarDiffDays
- diffGregorianDurationRollOver :: Day -> Day -> CalendarDiffDays
- fromGregorianValid :: Year -> MonthOfYear -> DayOfMonth -> Maybe Day
- gregorianMonthLength :: Year -> MonthOfYear -> DayOfMonth
- toGregorian :: Day -> (Year, MonthOfYear, DayOfMonth)
- utcToLocalTime :: TimeZone -> UTCTime -> LocalTime
- utc :: TimeZone
- ut1ToLocalTime :: Rational -> UniversalTime -> LocalTime
- utcToZonedTime :: TimeZone -> UTCTime -> ZonedTime
- zonedTimeToUTC :: ZonedTime -> UTCTime
- iso8601DateFormat :: Maybe String -> String
- rfc822DateFormat :: String
- localTimeToUT1 :: Rational -> LocalTime -> UniversalTime
- localTimeToUTC :: TimeZone -> LocalTime -> UTCTime
- parseTimeM :: (MonadFail m, ParseTime t) => Bool -> TimeLocale -> String -> String -> m t
- parseTimeOrError :: ParseTime t => Bool -> TimeLocale -> String -> String -> t
- readPTime :: ParseTime t => Bool -> TimeLocale -> String -> ReadP t
- readSTime :: ParseTime t => Bool -> TimeLocale -> String -> ReadS t
- midnight :: TimeOfDay
- minutesToTimeZone :: Int -> TimeZone
- addUTCTime :: NominalDiffTime -> UTCTime -> UTCTime
- diffUTCTime :: UTCTime -> UTCTime -> NominalDiffTime
- dayFractionToTimeOfDay :: Rational -> TimeOfDay
- localToUTCTimeOfDay :: TimeZone -> TimeOfDay -> (Integer, TimeOfDay)
- timeOfDayToDayFraction :: TimeOfDay -> Rational
- timeOfDayToTime :: TimeOfDay -> DiffTime
- timeToTimeOfDay :: DiffTime -> TimeOfDay
- utcToLocalTimeOfDay :: TimeZone -> TimeOfDay -> (Integer, TimeOfDay)
- addLocalTime :: NominalDiffTime -> LocalTime -> LocalTime
- diffLocalTime :: LocalTime -> LocalTime -> NominalDiffTime
- getCurrentTime :: IO UTCTime
- getTimeZone :: UTCTime -> IO TimeZone
- getZonedTime :: IO ZonedTime
- utcToLocalZonedTime :: UTCTime -> IO ZonedTime
- filterM :: Applicative m => (a -> m Bool) -> [a] -> m [a]
- foldM :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m b
- scanl' :: (b -> a -> b) -> b -> [a] -> [b]
- zip4 :: [a] -> [b] -> [c] -> [d] -> [(a, b, c, d)]
- zip5 :: [a] -> [b] -> [c] -> [d] -> [e] -> [(a, b, c, d, e)]
- zip6 :: [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [(a, b, c, d, e, f)]
- zipWith4 :: (a -> b -> c -> d -> e) -> [a] -> [b] -> [c] -> [d] -> [e]
- zipWith5 :: (a -> b -> c -> d -> e -> f) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f]
- zipWith6 :: (a -> b -> c -> d -> e -> f -> g) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g]
- zipWithM :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m [c]
- zipWithM_ :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m ()
- elemIndex :: Eq a => a -> [a] -> Maybe Int
- elemIndices :: Eq a => a -> [a] -> [Int]
- findIndices :: (a -> Bool) -> [a] -> [Int]
- foldM_ :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m ()
- forM :: (Traversable t, Monad m) => t a -> (a -> m b) -> m (t b)
- maximumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a
- minimumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a
- replicateM :: Applicative m => Int -> m a -> m [a]
- unzip4 :: [(a, b, c, d)] -> ([a], [b], [c], [d])
- unzip5 :: [(a, b, c, d, e)] -> ([a], [b], [c], [d], [e])
- unzip6 :: [(a, b, c, d, e, f)] -> ([a], [b], [c], [d], [e], [f])
- (<**>) :: Applicative f => f a -> f (a -> b) -> f b
- liftA :: Applicative f => (a -> b) -> f a -> f b
- liftA3 :: Applicative f => (a -> b -> c -> d) -> f a -> f b -> f c -> f d
- liftM3 :: Monad m => (a1 -> a2 -> a3 -> r) -> m a1 -> m a2 -> m a3 -> m r
- liftM4 :: Monad m => (a1 -> a2 -> a3 -> a4 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m r
- liftM5 :: Monad m => (a1 -> a2 -> a3 -> a4 -> a5 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m a5 -> m r
- clamp :: Ord a => (a, a) -> a -> a
- initialPos :: FilePath -> SourcePos
- sourcePosPretty :: SourcePos -> String
- unPos :: Pos -> Int
- periodAllDays :: DayPeriod p => p -> [Day]
- periodFromDay :: DayPeriod p => Day -> (p, Int)
- periodLength :: DayPeriod p => p -> Int
- periodToDay :: DayPeriod p => p -> Int -> Day
- periodToDayValid :: DayPeriod p => p -> Int -> Maybe Day
- after :: DependencyType -> String -> TestTree -> TestTree
- nominalDay :: NominalDiffTime
- nominalDiffTimeToSeconds :: NominalDiffTime -> Pico
- secondsToNominalDiffTime :: Pico -> NominalDiffTime
- chr :: Int -> Char
- callCommand :: String -> IO ()
- dbg1 :: Show a => String -> a -> a
- hGetContents :: Handle -> IO String
- hGetLine :: Handle -> IO String
- stdin :: Handle
- listToMaybe :: [a] -> Maybe a
- maybeToList :: Maybe a -> [a]
- latin1 :: TextEncoding
- mkTextEncoding :: String -> IO TextEncoding
- utf16 :: TextEncoding
- utf16be :: TextEncoding
- utf16le :: TextEncoding
- utf32 :: TextEncoding
- utf32be :: TextEncoding
- utf32le :: TextEncoding
- utf8 :: TextEncoding
- utf8_bom :: TextEncoding
- hFileSize :: Handle -> IO Integer
- hFlush :: Handle -> IO ()
- hGetBuffering :: Handle -> IO BufferMode
- hGetEcho :: Handle -> IO Bool
- hGetEncoding :: Handle -> IO (Maybe TextEncoding)
- hGetPosn :: Handle -> IO HandlePosn
- hIsClosed :: Handle -> IO Bool
- hIsEOF :: Handle -> IO Bool
- hIsOpen :: Handle -> IO Bool
- hIsReadable :: Handle -> IO Bool
- hIsSeekable :: Handle -> IO Bool
- hIsTerminalDevice :: Handle -> IO Bool
- hIsWritable :: Handle -> IO Bool
- hLookAhead :: Handle -> IO Char
- hSeek :: Handle -> SeekMode -> Integer -> IO ()
- hSetBinaryMode :: Handle -> Bool -> IO ()
- hSetBuffering :: Handle -> BufferMode -> IO ()
- hSetEcho :: Handle -> Bool -> IO ()
- hSetEncoding :: Handle -> TextEncoding -> IO ()
- hSetFileSize :: Handle -> Integer -> IO ()
- hSetNewlineMode :: Handle -> NewlineMode -> IO ()
- hSetPosn :: HandlePosn -> IO ()
- hShow :: Handle -> IO String
- hTell :: Handle -> IO Integer
- isEOF :: IO Bool
- hGetBuf :: Handle -> Ptr a -> Int -> IO Int
- hGetBufNonBlocking :: Handle -> Ptr a -> Int -> IO Int
- hGetBufSome :: Handle -> Ptr a -> Int -> IO Int
- hGetChar :: Handle -> IO Char
- hGetContents' :: Handle -> IO String
- hPutBuf :: Handle -> Ptr a -> Int -> IO ()
- hPutBufNonBlocking :: Handle -> Ptr a -> Int -> IO Int
- hPutChar :: Handle -> Char -> IO ()
- hWaitForInput :: Handle -> Int -> IO Bool
- nativeNewline :: Newline
- nativeNewlineMode :: NewlineMode
- noNewlineTranslation :: NewlineMode
- universalNewlineMode :: NewlineMode
- openBinaryFile :: FilePath -> IOMode -> IO Handle
- openFile :: FilePath -> IOMode -> IO Handle
- withBinaryFile :: FilePath -> IOMode -> (Handle -> IO r) -> IO r
- withFile :: FilePath -> IOMode -> (Handle -> IO r) -> IO r
- newEmptyMVar :: IO (MVar a)
- putMVar :: MVar a -> a -> IO ()
- readMVar :: MVar a -> IO a
- mode :: Name -> a -> Help -> Arg a -> [Flag a] -> Mode a
- fixIO :: (a -> IO a) -> IO a
- getContents' :: IO String
- hPrint :: Show a => Handle -> a -> IO ()
- hReady :: Handle -> IO Bool
- localeEncoding :: TextEncoding
- openBinaryTempFile :: FilePath -> String -> IO (FilePath, Handle)
- openBinaryTempFileWithDefaultPermissions :: FilePath -> String -> IO (FilePath, Handle)
- openTempFile :: FilePath -> String -> IO (FilePath, Handle)
- openTempFileWithDefaultPermissions :: FilePath -> String -> IO (FilePath, Handle)
- readFile' :: FilePath -> IO String
- combine :: FilePath -> FilePath -> FilePath
- createPipe :: IO (Handle, Handle)
- createPipeFd :: IO (FD, FD)
- createProcess_ :: String -> CreateProcess -> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
- interruptProcessGroupOf :: ProcessHandle -> IO ()
- terminateProcess :: ProcessHandle -> IO ()
- getProcessExitCode :: ProcessHandle -> IO (Maybe ExitCode)
- cleanupProcess :: (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> IO ()
- createProcess :: CreateProcess -> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle)
- getCurrentPid :: IO Pid
- getPid :: ProcessHandle -> IO (Maybe Pid)
- rawSystem :: String -> [String] -> IO ExitCode
- readCreateProcess :: CreateProcess -> String -> IO String
- readCreateProcessWithExitCode :: CreateProcess -> String -> IO (ExitCode, String, String)
- readProcess :: FilePath -> [String] -> String -> IO String
- runCommand :: String -> IO ProcessHandle
- runInteractiveCommand :: String -> IO (Handle, Handle, Handle, ProcessHandle)
- runInteractiveProcess :: FilePath -> [String] -> Maybe FilePath -> Maybe [(String, String)] -> IO (Handle, Handle, Handle, ProcessHandle)
- runProcess :: FilePath -> [String] -> Maybe FilePath -> Maybe [(String, String)] -> Maybe Handle -> Maybe Handle -> Maybe Handle -> IO ProcessHandle
- shell :: String -> CreateProcess
- showCommandForUser :: FilePath -> [String] -> String
- spawnCommand :: String -> IO ProcessHandle
- spawnProcess :: FilePath -> [String] -> IO ProcessHandle
- system :: String -> IO ExitCode
- waitForProcess :: ProcessHandle -> IO ExitCode
- withCreateProcess :: CreateProcess -> (Maybe Handle -> Maybe Handle -> Maybe Handle -> ProcessHandle -> IO a) -> IO a
- dbg0 :: Show a => String -> a -> a
- dbg0IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg0With :: (a -> String) -> a -> a
- dbg1IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg2 :: Show a => String -> a -> a
- dbg2IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg2With :: Show a => (a -> String) -> a -> a
- dbg3 :: Show a => String -> a -> a
- dbg3IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg3With :: Show a => (a -> String) -> a -> a
- dbg4IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg4With :: Show a => (a -> String) -> a -> a
- dbg5 :: Show a => String -> a -> a
- dbg5IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg5With :: Show a => (a -> String) -> a -> a
- dbg6 :: Show a => String -> a -> a
- dbg6IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg6With :: Show a => (a -> String) -> a -> a
- dbg7IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg8 :: Show a => String -> a -> a
- dbg8IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg8With :: Show a => (a -> String) -> a -> a
- dbg9 :: Show a => String -> a -> a
- dbg9IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg9With :: Show a => (a -> String) -> a -> a
- dbgExit :: Show a => String -> a -> a
- lbl_ :: String -> String -> String -> String
- ptrace :: Show a => a -> a
- ptraceAt :: Show a => Int -> String -> a -> a
- ptraceAtIO :: (MonadIO m, Show a) => Int -> String -> a -> m ()
- ptraceLogAt :: Show a => Int -> String -> a -> a
- ptraceLogAtIO :: (MonadIO m, Show a) => Int -> String -> a -> m ()
- ptraceOrLogAt :: Show a => Int -> String -> a -> a
- ptraceOrLogAtIO :: (MonadIO m, Show a) => Int -> String -> a -> m ()
- traceAt :: Int -> String -> a -> a
- traceAtWith :: Int -> (a -> String) -> a -> a
- traceLog :: String -> a -> a
- traceLogAt :: Int -> String -> a -> a
- traceLogAtIO :: MonadIO m => Int -> String -> m ()
- traceLogAtWith :: Int -> (a -> String) -> a -> a
- traceLogIO :: MonadIO m => String -> m ()
- traceLogWith :: (a -> String) -> a -> a
- traceOrLog :: String -> a -> a
- traceOrLogAt :: Int -> String -> a -> a
- traceWith :: (a -> String) -> a -> a
- bgColor :: ColorIntensity -> Color -> String -> String
- bgColorB :: ColorIntensity -> Color -> WideBuilder -> WideBuilder
- black' :: String -> String
- blue' :: String -> String
- bold' :: String -> String
- brightBlack' :: String -> String
- brightBlue' :: String -> String
- brightCyan' :: String -> String
- brightGreen' :: String -> String
- brightMagenta' :: String -> String
- brightRed' :: String -> String
- brightWhite' :: String -> String
- brightYellow' :: String -> String
- color :: ColorIntensity -> Color -> String -> String
- colorOption :: String
- cyan' :: String -> String
- expandGlob :: FilePath -> FilePath -> IO [FilePath]
- expandHomePath :: FilePath -> IO FilePath
- expandPath :: FilePath -> FilePath -> IO FilePath
- faint' :: String -> String
- getCurrentLocalTime :: IO LocalTime
- getCurrentZonedTime :: IO ZonedTime
- getTerminalHeight :: IO (Maybe Int)
- getTerminalHeightWidth :: IO (Maybe (Int, Int))
- getTerminalWidth :: IO (Maybe Int)
- green' :: String -> String
- hasOutputFile :: Bool
- magenta' :: String -> String
- outputFileOption :: Maybe String
- pprint :: Show a => a -> IO ()
- pprint' :: Show a => a -> IO ()
- progArgs :: [String]
- pshow' :: Show a => a -> String
- readFileOrStdinPortably :: String -> IO Text
- readFilePortably :: FilePath -> IO Text
- readFileStrictly :: FilePath -> IO Text
- readHandlePortably :: Handle -> IO Text
- red' :: String -> String
- rgb' :: Word8 -> Word8 -> Word8 -> String -> String
- setupPager :: IO ()
- sortByModTime :: [FilePath] -> IO [FilePath]
- terminalBgColor :: Maybe (RGB Float)
- terminalFgColor :: Maybe (RGB Float)
- terminalIsLight :: Maybe Bool
- terminalLightness :: Maybe Float
- usageError :: String -> a
- useColorOnStderr :: Bool
- useColorOnStdout :: Bool
- white' :: String -> String
- yellow' :: String -> String
- choiceInState :: forall s (m :: Type -> Type) a. [StateT s (ParsecT HledgerParseErrorData Text m) a] -> StateT s (ParsecT HledgerParseErrorData Text m) a
- dbgparse :: forall (m :: Type -> Type). Int -> String -> TextParser m ()
- eolof :: forall (m :: Type -> Type). TextParser m ()
- fromparse :: (Show t, Show (Token t), Show e) => Either (ParseErrorBundle t e) a -> a
- isNewline :: Char -> Bool
- nonspace :: forall (m :: Type -> Type). TextParser m Char
- parseWithState :: Monad m => st -> StateT st (ParsecT HledgerParseErrorData Text m) a -> Text -> m (Either HledgerParseErrors a)
- parseWithState' :: Stream s => st -> StateT st (ParsecT e s Identity) a -> s -> Either (ParseErrorBundle s e) a
- parseerror :: (Show t, Show (Token t), Show e) => ParseErrorBundle t e -> a
- parsewithString :: Parsec e String a -> String -> Either (ParseErrorBundle String e) a
- restofline :: forall (m :: Type -> Type). TextParser m String
- rtp :: TextParser Identity a -> Text -> Either HledgerParseErrors a
- runTextParser :: TextParser Identity a -> Text -> Either HledgerParseErrors a
- showDateParseError :: (Show t, Show (Token t), Show e) => ParseErrorBundle t e -> String
- skipNonNewlineSpaces' :: forall s (m :: Type -> Type). (Stream s, Token s ~ Char) => ParsecT HledgerParseErrorData s m Bool
- skipNonNewlineSpaces1 :: forall s (m :: Type -> Type). (Stream s, Token s ~ Char) => ParsecT HledgerParseErrorData s m ()
- spacenonewline :: forall s (m :: Type -> Type). (Stream s, Char ~ Token s) => ParsecT HledgerParseErrorData s m Char
- surroundedBy :: Applicative m => m openclose -> m a -> m a
- traceOrLogParse :: forall (m :: Type -> Type). String -> TextParser m ()
- regexMatch :: Regexp -> String -> Bool
- regexMatchText :: Regexp -> Text -> Bool
- regexMatchTextGroups :: Regexp -> Text -> [Text]
- regexReplace :: Regexp -> Replacement -> String -> Either RegexError String
- regexReplaceAllBy :: Regexp -> (String -> String) -> String -> String
- regexReplaceUnmemo :: Regexp -> Replacement -> String -> Either RegexError String
- toRegex :: Text -> Either RegexError Regexp
- toRegex' :: Text -> Regexp
- toRegexCI :: Text -> Either RegexError Regexp
- toRegexCI' :: Text -> Regexp
- capitalise :: String -> String
- chomp :: String -> String
- chomp1 :: String -> String
- elideLeft :: Int -> String -> String
- elideRight :: Int -> String -> String
- lowercase :: String -> String
- lstrip :: String -> String
- quoteForCommandLine :: String -> String
- quoteIfNeeded :: String -> String
- rstrip :: String -> String
- singleQuoteIfNeeded :: String -> String
- singleline :: String -> String
- strWidth :: String -> Int
- strWidthAnsi :: String -> Int
- strip1By :: (Char -> Bool) -> String -> String
- strip1Char :: Char -> Char -> String -> String
- stripAnsi :: String -> String
- stripBy :: (Char -> Bool) -> String -> String
- stripbrackets :: String -> String
- takeWidth :: Int -> String -> String
- underline :: String -> String
- unwords' :: [String] -> String
- words' :: String -> [String]
- assertLeft :: (HasCallStack, Eq b, Show b) => Either a b -> Assertion
- assertParse :: (HasCallStack, Default st) => StateT st (ParsecT HledgerParseErrorData Text IO) a -> Text -> Assertion
- assertParseE :: (HasCallStack, Eq a, Show a, Default st) => StateT st (ParsecT HledgerParseErrorData Text (ExceptT FinalParseError IO)) a -> Text -> Assertion
- assertParseEq :: (HasCallStack, Eq a, Show a, Default st) => StateT st (ParsecT HledgerParseErrorData Text IO) a -> Text -> a -> Assertion
- assertParseEqE :: (Default st, Eq a, Show a, HasCallStack) => StateT st (ParsecT HledgerParseErrorData Text (ExceptT FinalParseError IO)) a -> Text -> a -> Assertion
- assertParseEqOn :: (HasCallStack, Eq b, Show b, Default st) => StateT st (ParsecT HledgerParseErrorData Text IO) a -> Text -> (a -> b) -> b -> Assertion
- assertParseError :: (HasCallStack, Eq a, Show a, Default st) => StateT st (ParsecT HledgerParseErrorData Text IO) a -> Text -> String -> Assertion
- assertParseErrorE :: (Default st, Eq a, Show a, HasCallStack) => StateT st (ParsecT HledgerParseErrorData Text (ExceptT FinalParseError IO)) a -> Text -> String -> Assertion
- assertParseStateOn :: (HasCallStack, Eq b, Show b, Default st) => StateT st (ParsecT HledgerParseErrorData Text IO) a -> Text -> (st -> b) -> b -> Assertion
- assertRight :: (HasCallStack, Eq a, Show a) => Either a b -> Assertion
- formatText :: Bool -> Maybe Int -> Maybe Int -> Text -> Text
- linesPrepend :: Text -> Text -> Text
- linesPrepend2 :: Text -> Text -> Text -> Text
- quoteIfSpaced :: Text -> Text
- stripquotes :: Text -> Text
- tests_Text :: TestTree
- textCapitalise :: Text -> Text
- textChomp :: Text -> Text
- textConcatBottomPadded :: [Text] -> Text
- textConcatTopPadded :: [Text] -> Text
- textElideRight :: Int -> Text -> Text
- textTakeWidth :: Int -> Text -> Text
- textUnbracket :: Text -> Text
- unlinesB :: [Builder] -> Builder
- traceIO :: String -> IO ()
- traceShowId :: Show a => a -> a
- charWidth :: Char -> Int
- curry2 :: ((a, b) -> c) -> a -> b -> c
- curry4 :: ((a, b, c, d) -> e) -> a -> b -> c -> d -> e
- fifth5 :: (a, b, c, d, e) -> e
- fifth6 :: (a, b, c, d, e, f) -> e
- first5 :: (a, b, c, d, e) -> a
- first6 :: (a, b, c, d, e, f) -> a
- fourth4 :: (a, b, c, d) -> d
- fourth5 :: (a, b, c, d, e) -> d
- fourth6 :: (a, b, c, d, e, f) -> d
- makeHledgerClassyLenses :: Name -> DecsQ
- mapM' :: Monad f => (a -> f b) -> [a] -> f [b]
- maximum' :: Integral a => [a] -> a
- maximumStrict :: Ord a => [a] -> a
- minimumStrict :: Ord a => [a] -> a
- multicol :: Int -> [String] -> String
- second4 :: (a, b, c, d) -> b
- second5 :: (a, b, c, d, e) -> b
- second6 :: (a, b, c, d, e, f) -> b
- sequence' :: Monad f => [f a] -> f [a]
- sixth6 :: (a, b, c, d, e, f) -> f
- sumStrict :: Num a => [a] -> a
- tests_Utils :: TestTree
- third4 :: (a, b, c, d) -> c
- third5 :: (a, b, c, d, e) -> c
- third6 :: (a, b, c, d, e, f) -> c
- uncurry2 :: (a -> b -> c) -> (a, b) -> c
- uncurry4 :: (a -> b -> c -> d -> e) -> (a, b, c, d) -> e
- adjustOption :: IsOption v => (v -> v) -> TestTree -> TestTree
- askOption :: IsOption v => (v -> TestTree) -> TestTree
- defaultIngredients :: [Ingredient]
- localOption :: IsOption v => v -> TestTree -> TestTree
- withResource :: IO a -> (a -> IO ()) -> (IO a -> TestTree) -> TestTree
- defaultMainWithIngredients :: [Ingredient] -> TestTree -> IO ()
- after_ :: DependencyType -> Expr -> TestTree -> TestTree
- testGroup :: TestName -> [TestTree] -> TestTree
- includingOptions :: [OptionDescription] -> Ingredient
- mkTimeout :: Integer -> Timeout
- testCase :: TestName -> Assertion -> TestTree
- testCaseInfo :: TestName -> IO String -> TestTree
- (@=?) :: (Eq a, Show a, HasCallStack) => a -> a -> Assertion
- (@?) :: (AssertionPredicable t, HasCallStack) => t -> String -> Assertion
- (@?=) :: (Eq a, Show a, HasCallStack) => a -> a -> Assertion
- assertBool :: HasCallStack => String -> Bool -> Assertion
- assertEqual :: (Eq a, Show a, HasCallStack) => String -> a -> a -> Assertion
- assertFailure :: HasCallStack => String -> IO a
- assertString :: HasCallStack => String -> Assertion
- testCaseSteps :: TestName -> ((String -> IO ()) -> Assertion) -> TestTree
- trace :: String -> a -> a
- isUpper :: Char -> Bool
- formatInt :: (Integral a, Bounded a) => a -> FieldFormatter
- errorBadArgument :: a
- errorBadFormat :: Char -> a
- errorMissingArgument :: a
- formatChar :: Char -> FieldFormatter
- formatInteger :: Integer -> FieldFormatter
- hPrintf :: HPrintfType r => Handle -> String -> r
- perror :: String -> a
- vFmt :: Char -> FieldFormat -> FieldFormat
- executablePath :: Maybe (IO (Maybe FilePath))
- getExecutablePath :: IO FilePath
- mkIOError :: IOErrorType -> String -> Maybe Handle -> Maybe FilePath -> IOError
- getArgs :: IO [String]
- getEnvironment :: IO [(String, String)]
- getProgName :: IO String
- setEnv :: String -> String -> IO ()
- unsetEnv :: String -> IO ()
- withProgName :: String -> IO a -> IO a
- readEitherSafe :: Read a => String -> Either String a
- isPathSeparator :: Char -> Bool
- isRelative :: FilePath -> Bool
- iterate' :: (a -> a) -> a -> [a]
- takeMVar :: MVar a -> IO a
- normalise :: FilePath -> FilePath
- deleteBy :: (a -> a -> Bool) -> a -> [a] -> [a]
- deleteFirstsBy :: (a -> a -> Bool) -> [a] -> [a] -> [a]
- genericDrop :: Integral i => i -> [a] -> [a]
- genericIndex :: Integral i => [a] -> i -> a
- genericLength :: Num i => [a] -> i
- genericReplicate :: Integral i => i -> a -> [a]
- genericSplitAt :: Integral i => i -> [a] -> ([a], [a])
- insertBy :: (a -> a -> Ordering) -> a -> [a] -> [a]
- intersectBy :: (a -> a -> Bool) -> [a] -> [a] -> [a]
- permutations :: [a] -> [[a]]
- subsequences :: [a] -> [[a]]
- unionBy :: (a -> a -> Bool) -> [a] -> [a] -> [a]
- unzip7 :: [(a, b, c, d, e, f, g)] -> ([a], [b], [c], [d], [e], [f], [g])
- zip7 :: [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -> [(a, b, c, d, e, f, g)]
- zipWith7 :: (a -> b -> c -> d -> e -> f -> g -> h) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -> [h]
- isSubsequenceOf :: Eq a => [a] -> [a] -> Bool
- lefts :: [Either a b] -> [a]
- rights :: [Either a b] -> [b]
- asum :: (Foldable t, Alternative f) => t (f a) -> f a
- msum :: (Foldable t, MonadPlus m) => t (m a) -> m a
- flagOpt :: String -> [Name] -> Update a -> FlagHelp -> Help -> Flag a
- flagArg :: Update a -> FlagHelp -> Arg a
- toGroup :: [a] -> Group a
- helpText :: [String] -> HelpFormat -> Mode a -> [Text]
- definputopts :: InputOpts
- rawOptsToInputOpts :: Day -> RawOpts -> InputOpts
- rawOptsToReportSpec :: Day -> RawOpts -> Either String ReportSpec
- expandArgsAt :: [String] -> IO [String]
- defaultJournalPath :: IO String
- getCurrentDirectory :: IO FilePath
- splitReaderPrefix :: PrefixedFilePath -> (Maybe String, FilePath)
- splitExtension :: FilePath -> (String, String)
- optional :: Alternative f => f a -> f (Maybe a)
- takeBaseName :: FilePath -> String
- takeExtension :: FilePath -> String
- throwTo :: Exception e => ThreadId -> e -> IO ()
- (<$!>) :: Monad m => (a -> b) -> m a -> m b
- (>=>) :: Monad m => (a -> m b) -> (b -> m c) -> a -> m c
- replicateM_ :: Applicative m => Int -> m a -> m ()
- unless :: Applicative f => Bool -> f () -> f ()
- forever :: Applicative f => f a -> f b
- mapAndUnzipM :: Applicative m => (a -> m (b, c)) -> [a] -> m ([b], [c])
- mfilter :: MonadPlus m => (a -> Bool) -> m a -> m a
- guard :: Alternative f => Bool -> f ()
- lexLitChar :: ReadS String
- readLitChar :: ReadS Char
- generalCategory :: Char -> GeneralCategory
- isAlpha :: Char -> Bool
- isAsciiLower :: Char -> Bool
- isAsciiUpper :: Char -> Bool
- isControl :: Char -> Bool
- isHexDigit :: Char -> Bool
- isLatin1 :: Char -> Bool
- isLower :: Char -> Bool
- isLowerCase :: Char -> Bool
- isOctDigit :: Char -> Bool
- isPrint :: Char -> Bool
- isPunctuation :: Char -> Bool
- isSymbol :: Char -> Bool
- isUpperCase :: Char -> Bool
- digitToInt :: Char -> Int
- isLetter :: Char -> Bool
- isMark :: Char -> Bool
- isNumber :: Char -> Bool
- isSeparator :: Char -> Bool
- lastDef :: a -> [a] -> a
- foldl1Def' :: a -> (a -> a -> a) -> [a] -> a
- foldl1Def :: a -> (a -> a -> a) -> [a] -> a
- foldr1Def :: a -> (a -> a -> a) -> [a] -> a
- abort :: Partial => String -> a
- assertNote :: Partial => String -> Bool -> a -> a
- atDef :: a -> [a] -> Int -> a
- atNote :: Partial => String -> [a] -> Int -> a
- cycleDef :: [a] -> [a] -> [a]
- cycleMay :: [a] -> Maybe [a]
- cycleNote :: Partial => String -> [a] -> [a]
- elemIndexJust :: (Partial, Eq a) => a -> [a] -> Int
- elemIndexJustDef :: Eq a => Int -> a -> [a] -> Int
- elemIndexJustNote :: (Partial, Eq a) => String -> a -> [a] -> Int
- findIndexJust :: (a -> Bool) -> [a] -> Int
- findIndexJustDef :: Int -> (a -> Bool) -> [a] -> Int
- findIndexJustNote :: Partial => String -> (a -> Bool) -> [a] -> Int
- findJust :: (a -> Bool) -> [a] -> a
- findJustDef :: a -> (a -> Bool) -> [a] -> a
- findJustNote :: Partial => String -> (a -> Bool) -> [a] -> a
- foldl1May :: (a -> a -> a) -> [a] -> Maybe a
- foldl1May' :: (a -> a -> a) -> [a] -> Maybe a
- foldl1Note :: Partial => String -> (a -> a -> a) -> [a] -> a
- foldl1Note' :: Partial => String -> (a -> a -> a) -> [a] -> a
- foldr1May :: (a -> a -> a) -> [a] -> Maybe a
- foldr1Note :: Partial => String -> (a -> a -> a) -> [a] -> a
- fromJustDef :: a -> Maybe a -> a
- fromJustNote :: Partial => String -> Maybe a -> a
- headErr :: Partial => [a] -> a
- headNote :: Partial => String -> [a] -> a
- indexDef :: Ix a => Int -> (a, a) -> a -> Int
- indexMay :: Ix a => (a, a) -> a -> Maybe Int
- indexNote :: (Partial, Ix a) => String -> (a, a) -> a -> Int
- initDef :: [a] -> [a] -> [a]
- initMay :: [a] -> Maybe [a]
- initNote :: Partial => String -> [a] -> [a]
- initSafe :: [a] -> [a]
- lastNote :: Partial => String -> [a] -> a
- lookupJust :: (Eq a, Partial) => a -> [(a, b)] -> b
- lookupJustDef :: Eq a => b -> a -> [(a, b)] -> b
- lookupJustNote :: (Partial, Eq a) => String -> a -> [(a, b)] -> b
- maximumBound :: Ord a => a -> [a] -> a
- maximumBoundBy :: a -> (a -> a -> Ordering) -> [a] -> a
- maximumBounded :: (Ord a, Bounded a) => [a] -> a
- maximumByDef :: a -> (a -> a -> Ordering) -> [a] -> a
- maximumByMay :: (a -> a -> Ordering) -> [a] -> Maybe a
- maximumByNote :: Partial => String -> (a -> a -> Ordering) -> [a] -> a
- maximumDef :: Ord a => a -> [a] -> a
- maximumNote :: (Partial, Ord a) => String -> [a] -> a
- minimumBound :: Ord a => a -> [a] -> a
- minimumBoundBy :: a -> (a -> a -> Ordering) -> [a] -> a
- minimumBounded :: (Ord a, Bounded a) => [a] -> a
- minimumByDef :: a -> (a -> a -> Ordering) -> [a] -> a
- minimumByMay :: (a -> a -> Ordering) -> [a] -> Maybe a
- minimumByNote :: Partial => String -> (a -> a -> Ordering) -> [a] -> a
- minimumMay :: Ord a => [a] -> Maybe a
- minimumNote :: (Partial, Ord a) => String -> [a] -> a
- predDef :: (Enum a, Eq a, Bounded a) => a -> a -> a
- predMay :: (Enum a, Eq a, Bounded a) => a -> Maybe a
- predNote :: (Partial, Enum a, Eq a, Bounded a) => String -> a -> a
- predSafe :: (Enum a, Eq a, Bounded a) => a -> a
- readDef :: Read a => a -> String -> a
- readNote :: (Partial, Read a) => String -> String -> a
- scanl1Def :: [a] -> (a -> a -> a) -> [a] -> [a]
- scanl1May :: (a -> a -> a) -> [a] -> Maybe [a]
- scanl1Note :: Partial => String -> (a -> a -> a) -> [a] -> [a]
- scanr1Def :: [a] -> (a -> a -> a) -> [a] -> [a]
- scanr1May :: (a -> a -> a) -> [a] -> Maybe [a]
- scanr1Note :: Partial => String -> (a -> a -> a) -> [a] -> [a]
- succDef :: (Enum a, Eq a, Bounded a) => a -> a -> a
- succMay :: (Enum a, Eq a, Bounded a) => a -> Maybe a
- succNote :: (Partial, Enum a, Eq a, Bounded a) => String -> a -> a
- succSafe :: (Enum a, Eq a, Bounded a) => a -> a
- tailDef :: [a] -> [a] -> [a]
- tailErr :: Partial => [a] -> [a]
- tailMay :: [a] -> Maybe [a]
- tailNote :: Partial => String -> [a] -> [a]
- tailSafe :: [a] -> [a]
- toEnumDef :: (Enum a, Bounded a) => a -> Int -> a
- toEnumMay :: (Enum a, Bounded a) => Int -> Maybe a
- toEnumNote :: (Partial, Enum a, Bounded a) => String -> Int -> a
- toEnumSafe :: (Enum a, Bounded a) => Int -> a
- modes :: String -> a -> Help -> [Mode a] -> Mode a
- complete :: Mode a -> [String] -> (Int, Int) -> [Complete]
- joinArgs :: [String] -> String
- splitArgs :: String -> [String]
- checkMode :: Mode a -> Maybe String
- flagBool :: [Name] -> (Bool -> a -> a) -> Help -> Flag a
- fromFlagOpt :: FlagInfo -> String
- fromGroup :: Group a -> [a]
- modeEmpty :: a -> Mode a
- modeFlags :: Mode a -> [Flag a]
- modeModes :: Mode a -> [Mode a]
- parseBool :: String -> Maybe Bool
- remap2 :: Remap m => (a -> b) -> (b -> a) -> m a -> m b
- remapUpdate :: (a -> b) -> (b -> (a, a -> b)) -> Update a -> Update b
- flagHelpFormat :: (HelpFormat -> TextFormat -> a -> a) -> Flag a
- flagHelpSimple :: (a -> a) -> Flag a
- flagNumericVersion :: (a -> a) -> Flag a
- flagVersion :: (a -> a) -> Flag a
- flagsVerbosity :: (Verbosity -> a -> a) -> [Flag a]
- processArgs :: Mode a -> IO a
- processValue :: Mode a -> [String] -> a
- processValueIO :: Mode a -> [String] -> IO a
- canonicalizePath :: FilePath -> IO FilePath
- copyFileWithMetadata :: FilePath -> FilePath -> IO ()
- copyPermissions :: FilePath -> FilePath -> IO ()
- createDirectory :: FilePath -> IO ()
- createDirectoryIfMissing :: Bool -> FilePath -> IO ()
- createDirectoryLink :: FilePath -> FilePath -> IO ()
- createFileLink :: FilePath -> FilePath -> IO ()
- doesDirectoryExist :: FilePath -> IO Bool
- doesPathExist :: FilePath -> IO Bool
- exeExtension :: String
- findExecutable :: String -> IO (Maybe FilePath)
- findExecutables :: String -> IO [FilePath]
- findExecutablesInDirectories :: [FilePath] -> String -> IO [FilePath]
- findFileWith :: (FilePath -> IO Bool) -> [FilePath] -> String -> IO (Maybe FilePath)
- findFilesWith :: (FilePath -> IO Bool) -> [FilePath] -> String -> IO [FilePath]
- getAccessTime :: FilePath -> IO UTCTime
- getAppUserDataDirectory :: FilePath -> IO FilePath
- getFileSize :: FilePath -> IO Integer
- getHomeDirectory :: IO FilePath
- getPermissions :: FilePath -> IO Permissions
- getSymbolicLinkTarget :: FilePath -> IO FilePath
- getTemporaryDirectory :: IO FilePath
- getUserDocumentsDirectory :: IO FilePath
- getXdgDirectory :: XdgDirectory -> FilePath -> IO FilePath
- getXdgDirectoryList :: XdgDirectoryList -> IO [FilePath]
- listDirectory :: FilePath -> IO [FilePath]
- makeAbsolute :: FilePath -> IO FilePath
- makeRelativeToCurrentDirectory :: FilePath -> IO FilePath
- pathIsSymbolicLink :: FilePath -> IO Bool
- removeDirectory :: FilePath -> IO ()
- removeDirectoryLink :: FilePath -> IO ()
- removeDirectoryRecursive :: FilePath -> IO ()
- removeFile :: FilePath -> IO ()
- removePathForcibly :: FilePath -> IO ()
- renameDirectory :: FilePath -> FilePath -> IO ()
- renameFile :: FilePath -> FilePath -> IO ()
- renamePath :: FilePath -> FilePath -> IO ()
- setAccessTime :: FilePath -> UTCTime -> IO ()
- setCurrentDirectory :: FilePath -> IO ()
- setModificationTime :: FilePath -> UTCTime -> IO ()
- setPermissions :: FilePath -> Permissions -> IO ()
- withCurrentDirectory :: FilePath -> IO a -> IO a
- isSymbolicLink :: FilePath -> IO Bool
- emptyPermissions :: Permissions
- findFile :: [FilePath] -> String -> IO (Maybe FilePath)
- findFiles :: [FilePath] -> String -> IO [FilePath]
- setOwnerExecutable :: Bool -> Permissions -> Permissions
- setOwnerReadable :: Bool -> Permissions -> Permissions
- setOwnerSearchable :: Bool -> Permissions -> Permissions
- setOwnerWritable :: Bool -> Permissions -> Permissions
- addExtension :: FilePath -> String -> FilePath
- makeRelative :: FilePath -> FilePath -> FilePath
- die :: String -> IO a
- exitWith :: ExitCode -> IO a
- (-<.>) :: FilePath -> String -> FilePath
- (<.>) :: FilePath -> String -> FilePath
- addTrailingPathSeparator :: FilePath -> FilePath
- dropDrive :: FilePath -> FilePath
- dropExtension :: FilePath -> FilePath
- dropExtensions :: FilePath -> FilePath
- dropFileName :: FilePath -> FilePath
- dropTrailingPathSeparator :: FilePath -> FilePath
- equalFilePath :: FilePath -> FilePath -> Bool
- extSeparator :: Char
- getSearchPath :: IO [FilePath]
- hasDrive :: FilePath -> Bool
- hasExtension :: FilePath -> Bool
- hasTrailingPathSeparator :: FilePath -> Bool
- isAbsolute :: FilePath -> Bool
- isDrive :: FilePath -> Bool
- isExtSeparator :: Char -> Bool
- isExtensionOf :: String -> FilePath -> Bool
- isSearchPathSeparator :: Char -> Bool
- isValid :: FilePath -> Bool
- joinDrive :: FilePath -> FilePath -> FilePath
- joinPath :: [FilePath] -> FilePath
- makeValid :: FilePath -> FilePath
- pathSeparator :: Char
- pathSeparators :: [Char]
- replaceBaseName :: FilePath -> String -> FilePath
- replaceDirectory :: FilePath -> String -> FilePath
- replaceExtension :: FilePath -> String -> FilePath
- replaceExtensions :: FilePath -> String -> FilePath
- replaceFileName :: FilePath -> String -> FilePath
- searchPathSeparator :: Char
- splitDirectories :: FilePath -> [FilePath]
- splitDrive :: FilePath -> (FilePath, FilePath)
- splitExtensions :: FilePath -> (FilePath, String)
- splitPath :: FilePath -> [FilePath]
- splitSearchPath :: String -> [FilePath]
- stripExtension :: String -> FilePath -> Maybe FilePath
- takeDrive :: FilePath -> FilePath
- takeExtensions :: FilePath -> String
- takeFileName :: FilePath -> FilePath
- filterQueryOrNotQuery :: (Query -> Bool) -> Query -> Query
- generatedTransactionTag :: Query
- inAccount :: [QueryOpt] -> Maybe (AccountName, Bool)
- inAccountQuery :: [QueryOpt] -> Maybe Query
- matchesAccount :: Query -> AccountName -> Bool
- matchesAccountExtra :: (AccountName -> Maybe AccountType) -> (AccountName -> [Tag]) -> Query -> AccountName -> Bool
- matchesCommodity :: Query -> CommoditySymbol -> Bool
- matchesDescription :: Query -> Text -> Bool
- matchesMixedAmount :: Query -> MixedAmount -> Bool
- matchesPayeeWIP :: Query -> Payee -> Bool
- matchesPriceDirective :: Query -> PriceDirective -> Bool
- matchesQuery :: (Query -> Bool) -> Query -> Bool
- matchesTags :: Regexp -> Maybe Regexp -> [Tag] -> Bool
- noteTag :: Maybe Text -> Either RegexError Query
- parseAccountType :: Bool -> Text -> Either String AccountType
- parseQuery :: Day -> Text -> Either String (Query, [QueryOpt])
- parseQueryList :: Day -> [Text] -> Either String (Query, [QueryOpt])
- parseQueryTerm :: Day -> Text -> Either String (Query, [QueryOpt])
- payeeTag :: Maybe Text -> Either RegexError Query
- queryDateSpan :: Bool -> Query -> DateSpan
- queryDateSpan' :: Query -> DateSpan
- queryDepth :: Query -> Maybe Int
- queryEndDate :: Bool -> Query -> Maybe Day
- queryIsAcct :: Query -> Bool
- queryIsAmt :: Query -> Bool
- queryIsCode :: Query -> Bool
- queryIsDate :: Query -> Bool
- queryIsDate2 :: Query -> Bool
- queryIsDateOrDate2 :: Query -> Bool
- queryIsDesc :: Query -> Bool
- queryIsNull :: Query -> Bool
- queryIsReal :: Query -> Bool
- queryIsStartDateOnly :: Bool -> Query -> Bool
- queryIsStatus :: Query -> Bool
- queryIsTag :: Query -> Bool
- queryIsTransactionRelated :: Query -> Bool
- queryIsType :: Query -> Bool
- queryStartDate :: Bool -> Query -> Maybe Day
- queryprefixes :: [Text]
- simplifyQuery :: Query -> Query
- tests_Query :: TestTree
- words'' :: [Text] -> Text -> [Text]
- defaultJournal :: IO Journal
- ensureJournalFileExists :: FilePath -> IO ()
- journalStrictChecks :: Journal -> Either String ()
- orDieTrying :: MonadIO m => ExceptT String m a -> m a
- readJournal :: InputOpts -> Maybe FilePath -> Text -> ExceptT String IO Journal
- readJournal' :: Text -> IO Journal
- readJournalFile :: InputOpts -> PrefixedFilePath -> ExceptT String IO Journal
- readJournalFile' :: PrefixedFilePath -> IO Journal
- readJournalFiles :: InputOpts -> [PrefixedFilePath] -> ExceptT String IO Journal
- readJournalFiles' :: [PrefixedFilePath] -> IO Journal
- readJournalFilesAndLatestDates :: InputOpts -> [PrefixedFilePath] -> ExceptT String IO (Journal, [LatestDatesForFile])
- requireJournalFileExists :: FilePath -> IO ()
- saveLatestDates :: LatestDates -> FilePath -> IO ()
- saveLatestDatesForFiles :: [LatestDatesForFile] -> IO ()
- tests_Read :: TestTree
- accountaliasp :: forall (m :: Type -> Type). TextParser m AccountAlias
- accountnamep :: forall (m :: Type -> Type). TextParser m AccountName
- addAccountAlias :: MonadState Journal m => AccountAlias -> m ()
- addDeclaredAccountTags :: forall (m :: Type -> Type). AccountName -> [Tag] -> JournalParser m ()
- addDeclaredAccountType :: forall (m :: Type -> Type). AccountName -> AccountType -> JournalParser m ()
- aliasesFromOpts :: InputOpts -> [AccountAlias]
- amountp :: forall (m :: Type -> Type). JournalParser m Amount
- amountp' :: forall (m :: Type -> Type). Bool -> JournalParser m Amount
- balanceassertionp :: forall (m :: Type -> Type). JournalParser m BalanceAssertion
- bracketeddatetagsp :: forall (m :: Type -> Type). Maybe Year -> TextParser m [(TagName, Day)]
- clearAccountAliases :: MonadState Journal m => m ()
- codep :: forall (m :: Type -> Type). TextParser m Text
- commenttagsp :: forall (m :: Type -> Type). TextParser m [Tag]
- commoditysymbolp :: forall (m :: Type -> Type). TextParser m CommoditySymbol
- costp :: forall (m :: Type -> Type). Amount -> JournalParser m AmountPrice
- datep :: forall (m :: Type -> Type). JournalParser m Day
- datetimep :: forall (m :: Type -> Type). JournalParser m LocalTime
- descriptionp :: forall (m :: Type -> Type). TextParser m Text
- doublequotedtextp :: forall (m :: Type -> Type). TextParser m Text
- emptyorcommentlinep :: forall (m :: Type -> Type). TextParser m ()
- followingcommentp :: forall (m :: Type -> Type). TextParser m Text
- fromRawNumber :: RawNumber -> Maybe Integer -> Either String (Quantity, Word8, Maybe Char, Maybe DigitGroupStyle)
- getAccountAliases :: MonadState Journal m => m [AccountAlias]
- getAmountStyle :: forall (m :: Type -> Type). CommoditySymbol -> JournalParser m (Maybe AmountStyle)
- getDefaultAmountStyle :: forall (m :: Type -> Type). JournalParser m (Maybe AmountStyle)
- getDefaultCommodityAndStyle :: forall (m :: Type -> Type). JournalParser m (Maybe (CommoditySymbol, AmountStyle))
- getParentAccount :: forall (m :: Type -> Type). JournalParser m AccountName
- getYear :: forall (m :: Type -> Type). JournalParser m (Maybe Year)
- initialiseAndParseJournal :: ErroringJournalParser IO ParsedJournal -> InputOpts -> FilePath -> Text -> ExceptT String IO Journal
- isLineCommentStart :: Char -> Bool
- isSameLineCommentStart :: Char -> Bool
- journalAddAutoPostings :: Bool -> Day -> BalancingOpts -> Journal -> Either String Journal
- journalAddFile :: (FilePath, Text) -> Journal -> Journal
- journalAddForecast :: Bool -> Maybe DateSpan -> Journal -> Journal
- journalFinalise :: InputOpts -> FilePath -> Text -> ParsedJournal -> ExceptT String IO Journal
- lotcostp :: forall (m :: Type -> Type). JournalParser m ()
- modifiedaccountnamep :: forall (m :: Type -> Type). JournalParser m AccountName
- multilinecommentp :: forall (m :: Type -> Type). TextParser m ()
- noncommenttext1p :: forall (m :: Type -> Type). TextParser m Text
- noncommenttextp :: forall (m :: Type -> Type). TextParser m Text
- numberp :: forall (m :: Type -> Type). Maybe AmountStyle -> TextParser m (Quantity, Word8, Maybe Char, Maybe DigitGroupStyle)
- parseAndFinaliseJournal :: ErroringJournalParser IO ParsedJournal -> InputOpts -> FilePath -> Text -> ExceptT String IO Journal
- parseamount :: String -> Either HledgerParseErrors Amount
- parseamount' :: String -> Amount
- parsemixedamount :: String -> Either HledgerParseErrors MixedAmount
- parsemixedamount' :: String -> MixedAmount
- popParentAccount :: forall (m :: Type -> Type). JournalParser m ()
- postingcommentp :: forall (m :: Type -> Type). Maybe Year -> TextParser m (Text, [Tag], Maybe Day, Maybe Day)
- pushParentAccount :: forall (m :: Type -> Type). AccountName -> JournalParser m ()
- rawnumberp :: forall (m :: Type -> Type). TextParser m (Either AmbiguousNumber RawNumber)
- secondarydatep :: forall (m :: Type -> Type). Day -> TextParser m Day
- setDefaultCommodityAndStyle :: forall (m :: Type -> Type). (CommoditySymbol, AmountStyle) -> JournalParser m ()
- setYear :: forall (m :: Type -> Type). Year -> JournalParser m ()
- singlespacednoncommenttext1p :: forall (m :: Type -> Type). TextParser m Text
- singlespacedtext1p :: forall (m :: Type -> Type). TextParser m Text
- singlespacedtextsatisfying1p :: forall (m :: Type -> Type). (Char -> Bool) -> TextParser m Text
- singlespacep :: forall (m :: Type -> Type). TextParser m ()
- spaceandamountormissingp :: forall (m :: Type -> Type). JournalParser m MixedAmount
- statusp :: forall (m :: Type -> Type). TextParser m Status
- tests_Common :: TestTree
- transactioncommentp :: forall (m :: Type -> Type). TextParser m (Text, [Tag])
- forecastPeriod :: InputOpts -> Journal -> Maybe DateSpan
- findReader :: forall (m :: Type -> Type). MonadIO m => Maybe StorageFormat -> Maybe FilePath -> Maybe (Reader m)
- runJournalParser :: Monad m => JournalParser m a -> Text -> m (Either HledgerParseErrors a)
- tmpostingrulep :: forall (m :: Type -> Type). Maybe Year -> JournalParser m TMPostingRule
- tests_Reports :: TestTree
- accountTransactionsReport :: ReportSpec -> Journal -> Query -> AccountTransactionsReport
- accountTransactionsReportByCommodity :: AccountTransactionsReport -> [(CommoditySymbol, AccountTransactionsReport)]
- accountTransactionsReportItems :: Query -> Query -> MixedAmount -> (MixedAmount -> MixedAmount) -> (AccountName -> Maybe AccountType) -> [(Day, Transaction)] -> [AccountTransactionsReportItem]
- tests_AccountTransactionsReport :: TestTree
- transactionRegisterDate :: WhichDate -> Query -> Query -> Transaction -> Day
- triAmount :: (a, b, c, d, e, f) -> e
- triBalance :: (a, b, c, d, e, f) -> f
- triCommodityAmount :: CommoditySymbol -> (a, b, c, d, MixedAmount, f) -> MixedAmount
- triCommodityBalance :: CommoditySymbol -> (a, b, c, d, e, MixedAmount) -> MixedAmount
- triDate :: (a, Transaction, c, d, e, f) -> Day
- triOrigTransaction :: (a, b, c, d, e, f) -> a
- balanceReport :: ReportSpec -> Journal -> BalanceReport
- flatShowsExclusiveBalance :: Bool
- tests_BalanceReport :: TestTree
- budgetReport :: ReportSpec -> BalancingOpts -> DateSpan -> Journal -> BudgetReport
- budgetReportAsCsv :: ReportOpts -> BudgetReport -> [[Text]]
- budgetReportAsTable :: ReportOpts -> BudgetReport -> Table Text Text WideBuilder
- budgetReportAsText :: ReportOpts -> BudgetReport -> Text
- combineBudgetAndActual :: ReportOpts -> Journal -> MultiBalanceReport -> MultiBalanceReport -> BudgetReport
- tests_BudgetReport :: TestTree
- entriesReport :: ReportSpec -> Journal -> EntriesReport
- tests_EntriesReport :: TestTree
- compoundBalanceReport :: ReportSpec -> Journal -> [CBCSubreportSpec a] -> CompoundPeriodicReport a MixedAmount
- compoundBalanceReportWith :: ReportSpec -> Journal -> PriceOracle -> [CBCSubreportSpec a] -> CompoundPeriodicReport a MixedAmount
- generateMultiBalanceReport :: ReportSpec -> Journal -> PriceOracle -> Set AccountName -> [(DateSpan, [Posting])] -> HashMap AccountName Account -> MultiBalanceReport
- getPostings :: ReportSpec -> Journal -> PriceOracle -> [Posting]
- getPostingsByColumn :: ReportSpec -> Journal -> PriceOracle -> [DateSpan] -> [(DateSpan, [Posting])]
- makeReportQuery :: ReportSpec -> DateSpan -> ReportSpec
- multiBalanceReport :: ReportSpec -> Journal -> MultiBalanceReport
- multiBalanceReportWith :: ReportSpec -> Journal -> PriceOracle -> Set AccountName -> MultiBalanceReport
- sortRows :: ReportOpts -> Journal -> [MultiBalanceReportRow] -> [MultiBalanceReportRow]
- sortRowsLike :: [AccountName] -> [PeriodicReportRow DisplayName b] -> [PeriodicReportRow DisplayName b]
- startingPostings :: ReportSpec -> Journal -> PriceOracle -> DateSpan -> [Posting]
- tests_MultiBalanceReport :: TestTree
- mkpostingsReportItem :: Bool -> Bool -> WhichDate -> Maybe Period -> Posting -> MixedAmount -> PostingsReportItem
- postingsReport :: ReportSpec -> Journal -> PostingsReport
- tests_PostingsReport :: TestTree
- balanceAccumulationOverride :: RawOpts -> Maybe BalanceAccumulation
- defreportopts :: ReportOpts
- defreportspec :: ReportSpec
- flat_ :: ReportOpts -> Bool
- intervalFromRawOpts :: RawOpts -> Interval
- journalApplyValuationFromOpts :: ReportSpec -> Journal -> Journal
- journalApplyValuationFromOptsWith :: ReportSpec -> Journal -> PriceOracle -> Journal
- journalValueAndFilterPostings :: ReportSpec -> Journal -> Journal
- journalValueAndFilterPostingsWith :: ReportSpec -> Journal -> PriceOracle -> Journal
- mixedAmountApplyValuationAfterSumFromOptsWith :: ReportOpts -> Journal -> PriceOracle -> DateSpan -> MixedAmount -> MixedAmount
- overEither :: ((a -> Either e b) -> s -> Either e t) -> (a -> b) -> s -> Either e t
- postingDateFn :: ReportOpts -> Posting -> Day
- queryFromFlags :: ReportOpts -> Query
- rawOptsToReportOpts :: Day -> RawOpts -> ReportOpts
- reportEndDate :: Journal -> ReportSpec -> Maybe Day
- reportOptsToSpec :: Day -> ReportOpts -> Either String ReportSpec
- reportOptsToggleStatus :: Status -> ReportOpts -> ReportOpts
- reportPeriodLastDay :: ReportSpec -> Maybe Day
- reportPeriodName :: BalanceAccumulation -> [DateSpan] -> DateSpan -> Text
- reportPeriodOrJournalLastDay :: ReportSpec -> Journal -> Maybe Day
- reportPeriodOrJournalStart :: ReportSpec -> Journal -> Maybe Day
- reportPeriodStart :: ReportSpec -> Maybe Day
- reportSpan :: Journal -> ReportSpec -> (DateSpan, [DateSpan])
- reportSpanBothDates :: Journal -> ReportSpec -> (DateSpan, [DateSpan])
- reportStartDate :: Journal -> ReportSpec -> Maybe Day
- setDefaultConversionOp :: ConversionOp -> ReportSpec -> ReportSpec
- setEither :: ((a -> Either e b) -> s -> Either e t) -> b -> s -> Either e t
- simplifyStatuses :: Ord a => [a] -> [a]
- transactionDateFn :: ReportOpts -> Transaction -> Day
- tree_ :: ReportOpts -> Bool
- updateReportSpec :: ReportOpts -> ReportSpec -> Either String ReportSpec
- updateReportSpecWith :: (ReportOpts -> ReportOpts) -> ReportSpec -> Either String ReportSpec
- valuationAfterSum :: ReportOpts -> Maybe (Maybe CommoditySymbol)
- whichDate :: ReportOpts -> WhichDate
- flatDisplayName :: AccountName -> DisplayName
- periodicReportSpan :: PeriodicReport a b -> DateSpan
- prMapMaybeName :: (a -> Maybe b) -> PeriodicReport a c -> PeriodicReport b c
- prMapName :: (a -> b) -> PeriodicReport a c -> PeriodicReport b c
- prrAdd :: Semigroup b => PeriodicReportRow a b -> PeriodicReportRow a b -> PeriodicReportRow a b
- prrDepth :: PeriodicReportRow DisplayName a -> Int
- prrDisplayName :: PeriodicReportRow DisplayName a -> AccountName
- prrFullName :: PeriodicReportRow DisplayName a -> AccountName
- treeDisplayName :: AccountName -> DisplayName
- tests_Hledger :: TestTree
- runExceptT :: ExceptT e m a -> m (Either e a)
- calendarDay :: CalendarDiffDays
- calendarMonth :: CalendarDiffDays
- calendarWeek :: CalendarDiffDays
- calendarYear :: CalendarDiffDays
- scaleCalendarDiffDays :: Integer -> CalendarDiffDays -> CalendarDiffDays
- dayOfWeek :: Day -> DayOfWeek
- dayOfWeekDiff :: DayOfWeek -> DayOfWeek -> Int
- firstDayOfWeekOnAfter :: DayOfWeek -> Day -> Day
- weekAllDays :: DayOfWeek -> Day -> [Day]
- weekFirstDay :: DayOfWeek -> Day -> Day
- weekLastDay :: DayOfWeek -> Day -> Day
- diffTimeToPicoseconds :: DiffTime -> Integer
- picosecondsToDiffTime :: Integer -> DiffTime
- secondsToDiffTime :: Integer -> DiffTime
- getTime_resolution :: DiffTime
- calendarTimeDays :: CalendarDiffDays -> CalendarDiffTime
- calendarTimeTime :: NominalDiffTime -> CalendarDiffTime
- scaleCalendarDiffTime :: Integer -> CalendarDiffTime -> CalendarDiffTime
- daysAndTimeOfDayToTime :: Integer -> TimeOfDay -> NominalDiffTime
- makeTimeOfDayValid :: Int -> Int -> Pico -> Maybe TimeOfDay
- midday :: TimeOfDay
- pastMidnight :: DiffTime -> TimeOfDay
- sinceMidnight :: TimeOfDay -> DiffTime
- timeToDaysAndTimeOfDay :: NominalDiffTime -> (Integer, TimeOfDay)
- getCurrentTimeZone :: IO TimeZone
- hoursToTimeZone :: Int -> TimeZone
- timeZoneOffsetString :: TimeZone -> String
- timeZoneOffsetString' :: Maybe Char -> TimeZone -> String
- yield :: IO ()
- dupChan :: Chan a -> IO (Chan a)
- getChanContents :: Chan a -> IO [a]
- newChan :: IO (Chan a)
- readChan :: Chan a -> IO a
- writeChan :: Chan a -> a -> IO ()
- writeList2Chan :: Chan a -> [a] -> IO ()
- addMVarFinalizer :: MVar a -> IO () -> IO ()
- mkWeakMVar :: MVar a -> IO () -> IO (Weak (MVar a))
- modifyMVar :: MVar a -> (a -> IO (a, b)) -> IO b
- modifyMVarMasked :: MVar a -> (a -> IO (a, b)) -> IO b
- modifyMVarMasked_ :: MVar a -> (a -> IO a) -> IO ()
- modifyMVar_ :: MVar a -> (a -> IO a) -> IO ()
- swapMVar :: MVar a -> a -> IO a
- withMVar :: MVar a -> (a -> IO b) -> IO b
- withMVarMasked :: MVar a -> (a -> IO b) -> IO b
- newQSem :: Int -> IO QSem
- signalQSem :: QSem -> IO ()
- waitQSem :: QSem -> IO ()
- newQSemN :: Int -> IO QSemN
- signalQSemN :: QSemN -> Int -> IO ()
- waitQSemN :: QSemN -> Int -> IO ()
- threadWaitRead :: Fd -> IO ()
- threadWaitReadSTM :: Fd -> IO (STM (), IO ())
- threadWaitWrite :: Fd -> IO ()
- threadWaitWriteSTM :: Fd -> IO (STM (), IO ())
- forkIO :: IO () -> IO ThreadId
- forkIOWithUnmask :: ((forall a. IO a -> IO a) -> IO ()) -> IO ThreadId
- forkOn :: Int -> IO () -> IO ThreadId
- forkOnWithUnmask :: Int -> ((forall a. IO a -> IO a) -> IO ()) -> IO ThreadId
- getNumCapabilities :: IO Int
- killThread :: ThreadId -> IO ()
- mkWeakThreadId :: ThreadId -> IO (Weak ThreadId)
- myThreadId :: IO ThreadId
- setNumCapabilities :: Int -> IO ()
- threadCapability :: ThreadId -> IO (Int, Bool)
- isEmptyMVar :: MVar a -> IO Bool
- newMVar :: a -> IO (MVar a)
- tryPutMVar :: MVar a -> a -> IO Bool
- tryReadMVar :: MVar a -> IO (Maybe a)
- tryTakeMVar :: MVar a -> IO (Maybe a)
- rtsSupportsBoundThreads :: Bool
- forkFinally :: IO a -> (Either SomeException a -> IO ()) -> IO ThreadId
- forkOS :: IO () -> IO ThreadId
- forkOSWithUnmask :: ((forall a. IO a -> IO a) -> IO ()) -> IO ThreadId
- isCurrentThreadBound :: IO Bool
- runInBoundThread :: IO a -> IO a
- runInUnboundThread :: IO a -> IO a
- alreadyExistsErrorType :: IOErrorType
- alreadyInUseErrorType :: IOErrorType
- annotateIOError :: IOError -> String -> Maybe Handle -> Maybe FilePath -> IOError
- doesNotExistErrorType :: IOErrorType
- eofErrorType :: IOErrorType
- fullErrorType :: IOErrorType
- illegalOperationErrorType :: IOErrorType
- ioeGetErrorString :: IOError -> String
- ioeGetErrorType :: IOError -> IOErrorType
- ioeGetFileName :: IOError -> Maybe FilePath
- ioeGetHandle :: IOError -> Maybe Handle
- ioeGetLocation :: IOError -> String
- ioeSetErrorString :: IOError -> String -> IOError
- ioeSetErrorType :: IOError -> IOErrorType -> IOError
- ioeSetFileName :: IOError -> FilePath -> IOError
- ioeSetHandle :: IOError -> Handle -> IOError
- ioeSetLocation :: IOError -> String -> IOError
- isAlreadyExistsError :: IOError -> Bool
- isAlreadyExistsErrorType :: IOErrorType -> Bool
- isAlreadyInUseError :: IOError -> Bool
- isAlreadyInUseErrorType :: IOErrorType -> Bool
- isDoesNotExistError :: IOError -> Bool
- isDoesNotExistErrorType :: IOErrorType -> Bool
- isEOFError :: IOError -> Bool
- isEOFErrorType :: IOErrorType -> Bool
- isFullError :: IOError -> Bool
- isFullErrorType :: IOErrorType -> Bool
- isIllegalOperation :: IOError -> Bool
- isIllegalOperationErrorType :: IOErrorType -> Bool
- isPermissionError :: IOError -> Bool
- isPermissionErrorType :: IOErrorType -> Bool
- isResourceVanishedError :: IOError -> Bool
- isResourceVanishedErrorType :: IOErrorType -> Bool
- isUserError :: IOError -> Bool
- isUserErrorType :: IOErrorType -> Bool
- modifyIOError :: (IOError -> IOError) -> IO a -> IO a
- permissionErrorType :: IOErrorType
- resourceVanishedErrorType :: IOErrorType
- tryIOError :: IO a -> IO (Either IOError a)
- userErrorType :: IOErrorType
- barchar :: Char
- activity :: CliOpts -> Journal -> IO ()
- showHistogram :: ReportSpec -> Journal -> String
- printDayWith :: (PrintfArg t1, PrintfType t2) => (t3 -> t1) -> (DateSpan, t3) -> t2
- countBar :: Foldable t => t a -> [Char]
Documentation
Instances
FromJSON Text | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSONKey Text | |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON Text | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding :: Text -> Encoding toJSONList :: [Text] -> Value toEncodingList :: [Text] -> Encoding | |
ToJSONKey Text | |
Defined in Data.Aeson.Types.ToJSON | |
Chunk Text | |
Defined in Data.Attoparsec.Internal.Types Associated Types type ChunkElem Text Methods pappendChunk :: State Text -> Text -> State Text atBufferEnd :: Text -> State Text -> Pos bufferElemAt :: Text -> Pos -> State Text -> Maybe (ChunkElem Text, Int) chunkElemToChar :: Text -> ChunkElem Text -> Char | |
Show CsvRules | |
Defined in Hledger.Read.RulesReader | |
HasChars Text | |
Defined in Text.DocLayout | |
Eq CsvRules | |
Defined in Hledger.Read.RulesReader | |
Hashable Text | |
Defined in Data.Hashable.Class | |
Anon Text Source # | |
ToHtml Text | |
Stream Text | |
Defined in Text.Megaparsec.Stream Methods tokenToChunk :: Proxy Text -> Token Text -> Tokens Text tokensToChunk :: Proxy Text -> [Token Text] -> Tokens Text chunkToTokens :: Proxy Text -> Tokens Text -> [Token Text] chunkLength :: Proxy Text -> Tokens Text -> Int chunkEmpty :: Proxy Text -> Tokens Text -> Bool take1_ :: Text -> Maybe (Token Text, Text) takeN_ :: Int -> Text -> Maybe (Tokens Text, Text) takeWhile_ :: (Token Text -> Bool) -> Text -> (Tokens Text, Text) | |
TraversableStream Text | |
Defined in Text.Megaparsec.Stream Methods reachOffset :: Int -> PosState Text -> (Maybe String, PosState Text) reachOffsetNoLine :: Int -> PosState Text -> PosState Text | |
VisualStream Text | |
Defined in Text.Megaparsec.Stream Methods showTokens :: Proxy Text -> NonEmpty (Token Text) -> String tokensLength :: Proxy Text -> NonEmpty (Token Text) -> Int | |
GrowingAppend Text | |
Defined in Data.MonoTraversable | |
MonoFoldable Text | |
Defined in Data.MonoTraversable Methods ofoldMap :: Monoid m => (Element Text -> m) -> Text -> m ofoldr :: (Element Text -> b -> b) -> b -> Text -> b ofoldl' :: (a -> Element Text -> a) -> a -> Text -> a otoList :: Text -> [Element Text] oall :: (Element Text -> Bool) -> Text -> Bool oany :: (Element Text -> Bool) -> Text -> Bool ocompareLength :: Integral i => Text -> i -> Ordering otraverse_ :: Applicative f => (Element Text -> f b) -> Text -> f () ofor_ :: Applicative f => Text -> (Element Text -> f b) -> f () omapM_ :: Applicative m => (Element Text -> m ()) -> Text -> m () oforM_ :: Applicative m => Text -> (Element Text -> m ()) -> m () ofoldlM :: Monad m => (a -> Element Text -> m a) -> a -> Text -> m a ofoldMap1Ex :: Semigroup m => (Element Text -> m) -> Text -> m ofoldr1Ex :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text ofoldl1Ex' :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text headEx :: Text -> Element Text lastEx :: Text -> Element Text unsafeHead :: Text -> Element Text unsafeLast :: Text -> Element Text maximumByEx :: (Element Text -> Element Text -> Ordering) -> Text -> Element Text minimumByEx :: (Element Text -> Element Text -> Ordering) -> Text -> Element Text | |
MonoFunctor Text | |
MonoPointed Text | |
Defined in Data.MonoTraversable | |
MonoTraversable Text | |
Defined in Data.MonoTraversable | |
IsSequence Text | |
Defined in Data.Sequences Methods fromList :: [Element Text] -> Text lengthIndex :: Text -> Index Text break :: (Element Text -> Bool) -> Text -> (Text, Text) span :: (Element Text -> Bool) -> Text -> (Text, Text) dropWhile :: (Element Text -> Bool) -> Text -> Text takeWhile :: (Element Text -> Bool) -> Text -> Text splitAt :: Index Text -> Text -> (Text, Text) unsafeSplitAt :: Index Text -> Text -> (Text, Text) take :: Index Text -> Text -> Text unsafeTake :: Index Text -> Text -> Text drop :: Index Text -> Text -> Text unsafeDrop :: Index Text -> Text -> Text dropEnd :: Index Text -> Text -> Text partition :: (Element Text -> Bool) -> Text -> (Text, Text) uncons :: Text -> Maybe (Element Text, Text) unsnoc :: Text -> Maybe (Text, Element Text) filter :: (Element Text -> Bool) -> Text -> Text filterM :: Monad m => (Element Text -> m Bool) -> Text -> m Text replicate :: Index Text -> Element Text -> Text replicateM :: Monad m => Index Text -> m (Element Text) -> m Text groupBy :: (Element Text -> Element Text -> Bool) -> Text -> [Text] groupAllOn :: Eq b => (Element Text -> b) -> Text -> [Text] subsequences :: Text -> [Text] permutations :: Text -> [Text] unsafeTail :: Text -> Text unsafeInit :: Text -> Text index :: Text -> Index Text -> Maybe (Element Text) indexEx :: Text -> Index Text -> Element Text unsafeIndex :: Text -> Index Text -> Element Text | |
SemiSequence Text | |
Defined in Data.Sequences Associated Types type Index Text | |
Textual Text | |
Pretty Text | |
Defined in Prettyprinter.Internal | |
Extract Text | |
Term Text Attribute | Some terms (like |
TermRaw Text Attribute | Some termRaws (like |
LazySequence Text Text | |
Defined in Data.Sequences | |
Utf8 Text ByteString | |
Defined in Data.Sequences | |
(Monad m, a ~ ()) => TermRaw Text (HtmlT m a) | Given children immediately, just use that and expect no attributes. |
Stream (NoShareInput Text) | |
Defined in Text.Megaparsec.Stream Methods tokenToChunk :: Proxy (NoShareInput Text) -> Token (NoShareInput Text) -> Tokens (NoShareInput Text) tokensToChunk :: Proxy (NoShareInput Text) -> [Token (NoShareInput Text)] -> Tokens (NoShareInput Text) chunkToTokens :: Proxy (NoShareInput Text) -> Tokens (NoShareInput Text) -> [Token (NoShareInput Text)] chunkLength :: Proxy (NoShareInput Text) -> Tokens (NoShareInput Text) -> Int chunkEmpty :: Proxy (NoShareInput Text) -> Tokens (NoShareInput Text) -> Bool take1_ :: NoShareInput Text -> Maybe (Token (NoShareInput Text), NoShareInput Text) takeN_ :: Int -> NoShareInput Text -> Maybe (Tokens (NoShareInput Text), NoShareInput Text) takeWhile_ :: (Token (NoShareInput Text) -> Bool) -> NoShareInput Text -> (Tokens (NoShareInput Text), NoShareInput Text) | |
Stream (ShareInput Text) | |
Defined in Text.Megaparsec.Stream Methods tokenToChunk :: Proxy (ShareInput Text) -> Token (ShareInput Text) -> Tokens (ShareInput Text) tokensToChunk :: Proxy (ShareInput Text) -> [Token (ShareInput Text)] -> Tokens (ShareInput Text) chunkToTokens :: Proxy (ShareInput Text) -> Tokens (ShareInput Text) -> [Token (ShareInput Text)] chunkLength :: Proxy (ShareInput Text) -> Tokens (ShareInput Text) -> Int chunkEmpty :: Proxy (ShareInput Text) -> Tokens (ShareInput Text) -> Bool take1_ :: ShareInput Text -> Maybe (Token (ShareInput Text), ShareInput Text) takeN_ :: Int -> ShareInput Text -> Maybe (Tokens (ShareInput Text), ShareInput Text) takeWhile_ :: (Token (ShareInput Text) -> Bool) -> ShareInput Text -> (Tokens (ShareInput Text), ShareInput Text) | |
Ord (ParseError Text HledgerParseErrorData) | |
Defined in Text.Megaparsec.Custom Methods compare :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Ordering # (<) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool # (<=) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool # (>) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool # (>=) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool # max :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData # min :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData # | |
HasAmounts b => HasAmounts (Text, PeriodicReport a b, Bool) | |
Defined in Hledger.Reports.ReportTypes Methods styleAmounts :: Map CommoditySymbol AmountStyle -> (Text, PeriodicReport a b, Bool) -> (Text, PeriodicReport a b, Bool) # | |
type ChunkElem Text | |
Defined in Data.Attoparsec.Internal.Types | |
type State Text | |
Defined in Data.Attoparsec.Internal.Types type State Text = Buffer | |
type Item Text | |
type Token Text | |
Defined in Text.Megaparsec.Stream | |
type Tokens Text | |
Defined in Text.Megaparsec.Stream | |
type Element Text | |
Defined in Data.MonoTraversable | |
type Index Text | |
Defined in Data.Sequences type Index Text = Int | |
type Token (NoShareInput Text) | |
Defined in Text.Megaparsec.Stream | |
type Token (ShareInput Text) | |
Defined in Text.Megaparsec.Stream | |
type Tokens (NoShareInput Text) | |
Defined in Text.Megaparsec.Stream | |
type Tokens (ShareInput Text) | |
Defined in Text.Megaparsec.Stream |
Instances
FromJSON Char | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSONKey Char | |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON Char | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding :: Char -> Encoding toJSONList :: [Char] -> Value toEncodingList :: [Char] -> Encoding | |
ToJSONKey Char | |
Defined in Data.Aeson.Types.ToJSON | |
Data Char | |
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Char -> c Char gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Char dataTypeOf :: Char -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Char) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Char) gmapT :: (forall b. Data b => b -> b) -> Char -> Char gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r gmapQ :: (forall d. Data d => d -> u) -> Char -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> Char -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> Char -> m Char gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char | |
Bounded Char | |
Enum Char | |
Ix Char | |
Read Char | |
Show Char | |
IsChar Char | |
PrintfArg Char | |
Defined in Text.Printf | |
NFData Char | |
Defined in Control.DeepSeq | |
HasChars String | |
Defined in Text.DocLayout Methods foldrChar :: (Char -> b -> b) -> b -> String -> b foldlChar :: (b -> Char -> b) -> b -> String -> b replicateChar :: Int -> Char -> String isNull :: String -> Bool splitLines :: String -> [String] | |
Eq Char | |
Ord Char | |
Hashable Char | |
Defined in Data.Hashable.Class | |
ToHtml String | |
TraversableStream String | |
Defined in Text.Megaparsec.Stream Methods reachOffset :: Int -> PosState String -> (Maybe String, PosState String) reachOffsetNoLine :: Int -> PosState String -> PosState String | |
VisualStream String | |
Defined in Text.Megaparsec.Stream Methods showTokens :: Proxy String -> NonEmpty (Token String) -> String tokensLength :: Proxy String -> NonEmpty (Token String) -> Int | |
Pretty Char | |
Defined in Prettyprinter.Internal | |
Uniform Char | |
Defined in System.Random.Internal | |
UniformRange Char | |
Defined in System.Random.Internal | |
Extract String | |
Defined in Text.Regex.Base.RegexLike | |
Assertable String | |
Defined in Test.Tasty.HUnit.Orig | |
Unbox Char | |
Defined in Data.Vector.Unboxed.Base | |
TestCoercion SChar | |
Defined in GHC.TypeLits Methods testCoercion :: forall (a :: k) (b :: k). SChar a -> SChar b -> Maybe (Coercion a b) | |
TestEquality SChar | |
Defined in GHC.TypeLits Methods testEquality :: forall (a :: k) (b :: k). SChar a -> SChar b -> Maybe (a :~: b) | |
RegexLike Regexp String | |
Defined in Hledger.Utils.Regex Methods matchOnce :: Regexp -> String -> Maybe MatchArray matchAll :: Regexp -> String -> [MatchArray] matchCount :: Regexp -> String -> Int matchTest :: Regexp -> String -> Bool matchAllText :: Regexp -> String -> [MatchText String] matchOnceText :: Regexp -> String -> Maybe (String, MatchText String, String) | |
Lift Char | |
Vector Vector Char | |
Defined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: Mutable Vector s Char -> ST s (Vector Char) basicUnsafeThaw :: Vector Char -> ST s (Mutable Vector s Char) basicLength :: Vector Char -> Int basicUnsafeSlice :: Int -> Int -> Vector Char -> Vector Char basicUnsafeIndexM :: Vector Char -> Int -> Box Char basicUnsafeCopy :: Mutable Vector s Char -> Vector Char -> ST s () | |
MVector MVector Char | |
Defined in Data.Vector.Unboxed.Base Methods basicLength :: MVector s Char -> Int basicUnsafeSlice :: Int -> Int -> MVector s Char -> MVector s Char basicOverlaps :: MVector s Char -> MVector s Char -> Bool basicUnsafeNew :: Int -> ST s (MVector s Char) basicInitialize :: MVector s Char -> ST s () basicUnsafeReplicate :: Int -> Char -> ST s (MVector s Char) basicUnsafeRead :: MVector s Char -> Int -> ST s Char basicUnsafeWrite :: MVector s Char -> Int -> Char -> ST s () basicClear :: MVector s Char -> ST s () basicSet :: MVector s Char -> Char -> ST s () basicUnsafeCopy :: MVector s Char -> MVector s Char -> ST s () basicUnsafeMove :: MVector s Char -> MVector s Char -> ST s () basicUnsafeGrow :: MVector s Char -> Int -> ST s (MVector s Char) | |
RegexContext Regexp String String | |
Generic1 (URec Char :: k -> Type) | |
Foldable (UChar :: Type -> Type) | |
Defined in Data.Foldable Methods fold :: Monoid m => UChar m -> m foldMap :: Monoid m => (a -> m) -> UChar a -> m foldMap' :: Monoid m => (a -> m) -> UChar a -> m foldr :: (a -> b -> b) -> b -> UChar a -> b # foldr' :: (a -> b -> b) -> b -> UChar a -> b foldl :: (b -> a -> b) -> b -> UChar a -> b # foldl' :: (b -> a -> b) -> b -> UChar a -> b # foldr1 :: (a -> a -> a) -> UChar a -> a # foldl1 :: (a -> a -> a) -> UChar a -> a # toList :: UChar a -> [a] elem :: Eq a => a -> UChar a -> Bool # maximum :: Ord a => UChar a -> a # minimum :: Ord a => UChar a -> a # | |
Traversable (UChar :: Type -> Type) | |
Defined in Data.Traversable Methods traverse :: Applicative f => (a -> f b) -> UChar a -> f (UChar b) sequenceA :: Applicative f => UChar (f a) -> f (UChar a) | |
OutputCap [Char] | |
Defined in System.Console.Terminfo.Base | |
TermStr [Char] | |
Defined in System.Console.Terminfo.Base | |
Functor (URec Char :: Type -> Type) | |
Generic (URec Char p) | |
Show (URec Char p) | |
Eq (URec Char p) | |
Ord (URec Char p) | |
Defined in GHC.Generics | |
newtype Vector Char | |
Defined in Data.Vector.Unboxed.Base | |
data URec Char (p :: k) | |
Defined in GHC.Generics | |
newtype MVector s Char | |
Defined in Data.Vector.Unboxed.Base | |
type Rep1 (URec Char :: k -> Type) | |
Defined in GHC.Generics | |
type Rep (URec Char p) | |
Defined in GHC.Generics |
Instances
FromJSON Ordering | |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON Ordering | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding :: Ordering -> Encoding toJSONList :: [Ordering] -> Value toEncodingList :: [Ordering] -> Encoding | |
Data Ordering | |
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ordering -> c Ordering gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Ordering toConstr :: Ordering -> Constr dataTypeOf :: Ordering -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Ordering) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Ordering) gmapT :: (forall b. Data b => b -> b) -> Ordering -> Ordering gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r gmapQ :: (forall d. Data d => d -> u) -> Ordering -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> Ordering -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering | |
Monoid Ordering | |
Semigroup Ordering | |
Bounded Ordering | |
Enum Ordering | |
Generic Ordering | |
Ix Ordering | |
Defined in GHC.Ix | |
Read Ordering | |
Show Ordering | |
Default Ordering | |
Defined in Data.Default.Class | |
NFData Ordering | |
Defined in Control.DeepSeq | |
Eq Ordering | |
Ord Ordering | |
Defined in GHC.Classes | |
Hashable Ordering | |
Defined in Data.Hashable.Class | |
type Rep Ordering | |
Defined in GHC.Generics type Rep Ordering = D1 ('MetaData "Ordering" "GHC.Types" "ghc-prim" 'False) (C1 ('MetaCons "LT" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "EQ" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GT" 'PrefixI 'False) (U1 :: Type -> Type))) |
Instances
FromJSON1 Maybe | |
Defined in Data.Aeson.Types.FromJSON Methods liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Maybe a) liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Maybe a] | |
ToJSON1 Maybe | |
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON :: (a -> Value) -> ([a] -> Value) -> Maybe a -> Value liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Maybe a] -> Value liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Maybe a -> Encoding liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Maybe a] -> Encoding | |
MonadFail Maybe | |
Defined in Control.Monad.Fail | |
Foldable Maybe | |
Defined in Data.Foldable Methods fold :: Monoid m => Maybe m -> m foldMap :: Monoid m => (a -> m) -> Maybe a -> m foldMap' :: Monoid m => (a -> m) -> Maybe a -> m foldr :: (a -> b -> b) -> b -> Maybe a -> b # foldr' :: (a -> b -> b) -> b -> Maybe a -> b foldl :: (b -> a -> b) -> b -> Maybe a -> b # foldl' :: (b -> a -> b) -> b -> Maybe a -> b # foldr1 :: (a -> a -> a) -> Maybe a -> a # foldl1 :: (a -> a -> a) -> Maybe a -> a # elem :: Eq a => a -> Maybe a -> Bool # maximum :: Ord a => Maybe a -> a # minimum :: Ord a => Maybe a -> a # | |
Traversable Maybe | |
Alternative Maybe | |
Applicative Maybe | |
Functor Maybe | |
Monad Maybe | |
MonadPlus Maybe | |
NFData1 Maybe | |
Defined in Control.DeepSeq | |
MonadThrow Maybe | |
Defined in Control.Monad.Catch Methods throwM :: (HasCallStack, Exception e) => e -> Maybe a | |
Hashable1 Maybe | |
Defined in Data.Hashable.Class Methods liftHashWithSalt :: (Int -> a -> Int) -> Int -> Maybe a -> Int | |
Generic1 Maybe | |
Reportable Maybe e | |
Defined in Hledger.Reports.ReportOptions | |
(Selector s, GToJSON' enc arity (K1 i (Maybe a) :: Type -> Type), KeyValuePair enc pairs, Monoid pairs) => RecordToPairs enc pairs arity (S1 s (K1 i (Maybe a) :: Type -> Type)) | |
Defined in Data.Aeson.Types.ToJSON Methods recordToPairs :: Options -> ToArgs enc arity a0 -> S1 s (K1 i (Maybe a)) a0 -> pairs | |
Lift a => Lift (Maybe a :: Type) | |
(Selector s, FromJSON a) => RecordFromJSON' arity (S1 s (K1 i (Maybe a) :: Type -> Type)) | |
Defined in Data.Aeson.Types.FromJSON Methods recordParseJSON' :: (ConName :* (TypeName :* (Options :* FromArgs arity a0))) -> Object -> Parser (S1 s (K1 i (Maybe a)) a0) | |
FromJSON a => FromJSON (Maybe a) | |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON a => ToJSON (Maybe a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding :: Maybe a -> Encoding toJSONList :: [Maybe a] -> Value toEncodingList :: [Maybe a] -> Encoding | |
Data a => Data (Maybe a) | |
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Maybe a -> c (Maybe a) gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Maybe a) dataTypeOf :: Maybe a -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Maybe a)) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Maybe a)) gmapT :: (forall b. Data b => b -> b) -> Maybe a -> Maybe a gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r gmapQ :: (forall d. Data d => d -> u) -> Maybe a -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> Maybe a -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) | |
Semigroup a => Monoid (Maybe a) | |
Semigroup a => Semigroup (Maybe a) | |
Generic (Maybe a) | |
SingKind a => SingKind (Maybe a) | |
Defined in GHC.Generics Associated Types type DemoteRep (Maybe a) | |
Read a => Read (Maybe a) | |
Show a => Show (Maybe a) | |
Default (Maybe a) | |
Defined in System.Console.CmdArgs.Default | |
Default (Maybe a) | |
Defined in Data.Default.Class | |
NFData a => NFData (Maybe a) | |
Defined in Control.DeepSeq | |
Eq a => Eq (Maybe a) | |
Ord a => Ord (Maybe a) | |
Hashable a => Hashable (Maybe a) | |
Defined in Data.Hashable.Class | |
HasAmounts a => HasAmounts (Maybe a) | |
Defined in Hledger.Data.Types Methods styleAmounts :: Map CommoditySymbol AmountStyle -> Maybe a -> Maybe a # | |
MonoFoldable (Maybe a) | |
Defined in Data.MonoTraversable Methods ofoldMap :: Monoid m => (Element (Maybe a) -> m) -> Maybe a -> m ofoldr :: (Element (Maybe a) -> b -> b) -> b -> Maybe a -> b ofoldl' :: (a0 -> Element (Maybe a) -> a0) -> a0 -> Maybe a -> a0 otoList :: Maybe a -> [Element (Maybe a)] oall :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool oany :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool ocompareLength :: Integral i => Maybe a -> i -> Ordering otraverse_ :: Applicative f => (Element (Maybe a) -> f b) -> Maybe a -> f () ofor_ :: Applicative f => Maybe a -> (Element (Maybe a) -> f b) -> f () omapM_ :: Applicative m => (Element (Maybe a) -> m ()) -> Maybe a -> m () oforM_ :: Applicative m => Maybe a -> (Element (Maybe a) -> m ()) -> m () ofoldlM :: Monad m => (a0 -> Element (Maybe a) -> m a0) -> a0 -> Maybe a -> m a0 ofoldMap1Ex :: Semigroup m => (Element (Maybe a) -> m) -> Maybe a -> m ofoldr1Ex :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) ofoldl1Ex' :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) headEx :: Maybe a -> Element (Maybe a) lastEx :: Maybe a -> Element (Maybe a) unsafeHead :: Maybe a -> Element (Maybe a) unsafeLast :: Maybe a -> Element (Maybe a) maximumByEx :: (Element (Maybe a) -> Element (Maybe a) -> Ordering) -> Maybe a -> Element (Maybe a) minimumByEx :: (Element (Maybe a) -> Element (Maybe a) -> Ordering) -> Maybe a -> Element (Maybe a) | |
MonoFunctor (Maybe a) | |
MonoPointed (Maybe a) | |
Defined in Data.MonoTraversable | |
MonoTraversable (Maybe a) | |
Defined in Data.MonoTraversable | |
Pretty a => Pretty (Maybe a) | |
Defined in Prettyprinter.Internal | |
SingI ('Nothing :: Maybe a) | |
Defined in GHC.Generics | |
Each (Maybe a) (Maybe b) a b | |
Defined in Lens.Micro.Internal | |
SingI a2 => SingI ('Just a2 :: Maybe a1) | |
Defined in GHC.Generics | |
type Rep1 Maybe | |
Defined in GHC.Generics | |
type DemoteRep (Maybe a) | |
Defined in GHC.Generics | |
type Rep (Maybe a) | |
Defined in GHC.Generics | |
data Sing (b :: Maybe a) | |
type Element (Maybe a) | |
Defined in Data.MonoTraversable type Element (Maybe a) = a |
class Functor f => Applicative (f :: Type -> Type) where #
Instances
Applicative IResult | |
Applicative Parser | |
Applicative Result | |
Applicative ZipList | |
Applicative Identity | |
Applicative Down | |
Applicative Dual | |
Applicative Product | |
Applicative Sum | |
Applicative NonEmpty | |
Applicative STM | |
Applicative Par1 | |
Applicative P | |
Applicative ReadP | |
Applicative ReadPrec | |
Applicative Put | |
Applicative RGB | |
Applicative Seq | |
Applicative Tree | |
Applicative DNonEmpty | |
Defined in Data.DList.DNonEmpty.Internal | |
Applicative DList | |
Applicative IO | |
Applicative Root | |
Applicative Array | |
Applicative SmallArray | |
Defined in Data.Primitive.SmallArray | |
Applicative Q | |
Applicative Capability | |
Defined in System.Console.Terminfo.Base | |
Applicative Vector | |
Applicative Maybe | |
Applicative Solo | |
Applicative List | |
Applicative (Parser i) | |
Monad m => Applicative (WrappedMonad m) | |
Defined in Control.Applicative Methods pure :: a -> WrappedMonad m a # (<*>) :: WrappedMonad m (a -> b) -> WrappedMonad m a -> WrappedMonad m b # liftA2 :: (a -> b -> c) -> WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m c # (*>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b # (<*) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m a # | |
Arrow a => Applicative (ArrowMonad a) | |
Defined in Control.Arrow Methods pure :: a0 -> ArrowMonad a a0 # (<*>) :: ArrowMonad a (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b # liftA2 :: (a0 -> b -> c) -> ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a c # (*>) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a b # (<*) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a a0 # | |
Applicative (Either e) | |
Applicative (StateL s) | |
Applicative (StateR s) | |
Applicative (U1 :: Type -> Type) | |
Applicative (ST s) | |
Monad m => Applicative (ZipSource m) | |
Defined in Data.Conduit.Internal.Conduit | |
Applicative (SetM s) | |
Functor f => Applicative (Free f) | |
Applicative m => Applicative (InputT m) | |
Applicative m => Applicative (HtmlT m) | Based on the monad instance. |
Applicative f => Applicative (WrappedPoly f) | |
Defined in Data.MonoTraversable Methods pure :: a -> WrappedPoly f a # (<*>) :: WrappedPoly f (a -> b) -> WrappedPoly f a -> WrappedPoly f b # liftA2 :: (a -> b -> c) -> WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f c # (*>) :: WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f b # (<*) :: WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f a # | |
Applicative m => Applicative (ResourceT m) | |
Defined in Control.Monad.Trans.Resource.Internal | |
Semigroup a => Applicative (These a) | |
Applicative m => Applicative (QuoteToQuasi m) | |
Defined in Language.Haskell.TH.Syntax.Compat Methods pure :: a -> QuoteToQuasi m a # (<*>) :: QuoteToQuasi m (a -> b) -> QuoteToQuasi m a -> QuoteToQuasi m b # liftA2 :: (a -> b -> c) -> QuoteToQuasi m a -> QuoteToQuasi m b -> QuoteToQuasi m c # (*>) :: QuoteToQuasi m a -> QuoteToQuasi m b -> QuoteToQuasi m b # (<*) :: QuoteToQuasi m a -> QuoteToQuasi m b -> QuoteToQuasi m a # | |
Semigroup a => Applicative (These a) | |
Applicative f => Applicative (Lift f) | |
(Functor m, Monad m) => Applicative (MaybeT m) | |
Functor backend => Applicative (Wizard backend) | |
Defined in System.Console.Wizard.Internal Methods pure :: a -> Wizard backend a # (<*>) :: Wizard backend (a -> b) -> Wizard backend a -> Wizard backend b # liftA2 :: (a -> b -> c) -> Wizard backend a -> Wizard backend b -> Wizard backend c # (*>) :: Wizard backend a -> Wizard backend b -> Wizard backend b # (<*) :: Wizard backend a -> Wizard backend b -> Wizard backend a # | |
Monoid a => Applicative ((,) a) | |
Arrow a => Applicative (WrappedArrow a b) | |
Defined in Control.Applicative Methods pure :: a0 -> WrappedArrow a b a0 # (<*>) :: WrappedArrow a b (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 # liftA2 :: (a0 -> b0 -> c) -> WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b c # (*>) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b b0 # (<*) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 # | |
Applicative m => Applicative (Kleisli m a) | |
Defined in Control.Arrow | |
Monoid m => Applicative (Const m :: Type -> Type) | |
Monad m => Applicative (StateT s m) | |
Defined in Data.Functor.Utils | |
Applicative f => Applicative (Alt f) | |
(Generic1 f, Applicative (Rep1 f)) => Applicative (Generically1 f) | |
Defined in GHC.Generics Methods pure :: a -> Generically1 f a # (<*>) :: Generically1 f (a -> b) -> Generically1 f a -> Generically1 f b # liftA2 :: (a -> b -> c) -> Generically1 f a -> Generically1 f b -> Generically1 f c # (*>) :: Generically1 f a -> Generically1 f b -> Generically1 f b # (<*) :: Generically1 f a -> Generically1 f b -> Generically1 f a # | |
Applicative f => Applicative (Rec1 f) | |
Monad m => Applicative (ZipSink i m) | |
Defined in Data.Conduit.Internal.Conduit | |
(Applicative f, Monad f) => Applicative (WhenMissing f x) | |
Defined in Data.IntMap.Internal Methods pure :: a -> WhenMissing f x a # (<*>) :: WhenMissing f x (a -> b) -> WhenMissing f x a -> WhenMissing f x b # liftA2 :: (a -> b -> c) -> WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x c # (*>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b # (<*) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x a # | |
(Functor f, Functor a, Monad a) => Applicative (FreeT f a) | |
Defined in Control.Monad.Free | |
Applicative (Bazaar a b) | |
Defined in Lens.Micro | |
(Functor m, Monad m) => Applicative (StateT s m) | |
Applicative (Tagged s) | |
Applicative f => Applicative (Backwards f) | |
Defined in Control.Applicative.Backwards | |
(Functor m, Monad m) => Applicative (ExceptT e m) | |
Defined in Control.Monad.Trans.Except | |
Applicative m => Applicative (IdentityT m) | |
Defined in Control.Monad.Trans.Identity | |
Applicative m => Applicative (ReaderT r m) | |
Defined in Control.Monad.Trans.Reader | |
(Functor m, Monad m) => Applicative (StateT s m) | |
Defined in Control.Monad.Trans.State.Lazy | |
(Functor m, Monad m) => Applicative (StateT s m) | |
Defined in Control.Monad.Trans.State.Strict | |
(Monoid w, Applicative m) => Applicative (WriterT w m) | |
Defined in Control.Monad.Trans.Writer.Lazy | |
(Monoid w, Applicative m) => Applicative (WriterT w m) | |
Defined in Control.Monad.Trans.Writer.Strict | |
Monoid a => Applicative (Constant a :: Type -> Type) | |
Defined in Data.Functor.Constant | |
Applicative f => Applicative (Reverse f) | |
(Monoid a, Monoid b) => Applicative ((,,) a b) | |
(Applicative f, Applicative g) => Applicative (f :*: g) | |
Monoid c => Applicative (K1 i c :: Type -> Type) | |
Applicative (ConduitT i o m) | |
Defined in Data.Conduit.Internal.Conduit Methods pure :: a -> ConduitT i o m a # (<*>) :: ConduitT i o m (a -> b) -> ConduitT i o m a -> ConduitT i o m b # liftA2 :: (a -> b -> c) -> ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m c # (*>) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m b # (<*) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m a # | |
Monad m => Applicative (ZipConduit i o m) | |
Defined in Data.Conduit.Internal.Conduit Methods pure :: a -> ZipConduit i o m a # (<*>) :: ZipConduit i o m (a -> b) -> ZipConduit i o m a -> ZipConduit i o m b # liftA2 :: (a -> b -> c) -> ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m c # (*>) :: ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m b # (<*) :: ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m a # | |
(Monad f, Applicative f) => Applicative (WhenMatched f x y) | |
Defined in Data.IntMap.Internal Methods pure :: a -> WhenMatched f x y a # (<*>) :: WhenMatched f x y (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b # liftA2 :: (a -> b -> c) -> WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y c # (*>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b # (<*) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y a # | |
(Applicative f, Monad f) => Applicative (WhenMissing f k x) | |
Defined in Data.Map.Internal Methods pure :: a -> WhenMissing f k x a # (<*>) :: WhenMissing f k x (a -> b) -> WhenMissing f k x a -> WhenMissing f k x b # liftA2 :: (a -> b -> c) -> WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x c # (*>) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x b # (<*) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x a # | |
Stream s => Applicative (ParsecT e s m) | |
Defined in Text.Megaparsec.Internal Methods pure :: a -> ParsecT e s m a # (<*>) :: ParsecT e s m (a -> b) -> ParsecT e s m a -> ParsecT e s m b # liftA2 :: (a -> b -> c) -> ParsecT e s m a -> ParsecT e s m b -> ParsecT e s m c # (*>) :: ParsecT e s m a -> ParsecT e s m b -> ParsecT e s m b # (<*) :: ParsecT e s m a -> ParsecT e s m b -> ParsecT e s m a # | |
Applicative (ContT r m) | |
Defined in Control.Monad.Trans.Cont | |
(Monoid a, Monoid b, Monoid c) => Applicative ((,,,) a b c) | |
Defined in GHC.Base | |
Applicative ((->) r) | |
(Applicative f, Applicative g) => Applicative (Compose f g) | |
Defined in Data.Functor.Compose | |
(Applicative f, Applicative g) => Applicative (f :.: g) | |
Applicative f => Applicative (M1 i c f) | |
(Monad f, Applicative f) => Applicative (WhenMatched f k x y) | |
Defined in Data.Map.Internal Methods pure :: a -> WhenMatched f k x y a # (<*>) :: WhenMatched f k x y (a -> b) -> WhenMatched f k x y a -> WhenMatched f k x y b # liftA2 :: (a -> b -> c) -> WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y c # (*>) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y b # (<*) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y a # | |
(Monoid w, Functor m, Monad m) => Applicative (RWST r w s m) | |
Defined in Control.Monad.Trans.RWS.Lazy | |
(Monoid w, Functor m, Monad m) => Applicative (RWST r w s m) | |
Defined in Control.Monad.Trans.RWS.Strict | |
Monad m => Applicative (Pipe l i o u m) | |
Defined in Data.Conduit.Internal.Pipe Methods pure :: a -> Pipe l i o u m a # (<*>) :: Pipe l i o u m (a -> b) -> Pipe l i o u m a -> Pipe l i o u m b # liftA2 :: (a -> b -> c) -> Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m c # (*>) :: Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m b # (<*) :: Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m a # |
class Functor (f :: Type -> Type) where #
Minimal complete definition
Instances
class Applicative m => Monad (m :: Type -> Type) where #
Minimal complete definition
Instances
Monad IResult | |
Monad Parser | |
Monad Result | |
Monad Identity | |
Monad Down | |
Monad Dual | |
Monad Product | |
Monad Sum | |
Monad NonEmpty | |
Monad STM | |
Monad Par1 | |
Monad P | |
Monad ReadP | |
Monad ReadPrec | |
Monad Put | |
Monad Seq | |
Monad Tree | |
Monad DNonEmpty | |
Monad DList | |
Monad IO | |
Monad Root | |
Monad Array | |
Monad SmallArray | |
Monad Q | |
Monad Capability | |
Monad Vector | |
Monad Maybe | |
Monad Solo | |
Monad List | |
Monad (Parser i) | |
Monad m => Monad (WrappedMonad m) | |
Defined in Control.Applicative Methods (>>=) :: WrappedMonad m a -> (a -> WrappedMonad m b) -> WrappedMonad m b # (>>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b # return :: a -> WrappedMonad m a # | |
ArrowApply a => Monad (ArrowMonad a) | |
Monad (Either e) | |
Monad (U1 :: Type -> Type) | |
Monad (ST s) | |
Monad (SetM s) | |
Functor f => Monad (Free f) | |
Monad m => Monad (InputT m) | |
Monad m => Monad (HtmlT m) | Basically acts like Writer. |
Monad f => Monad (WrappedPoly f) | |
Monad m => Monad (ResourceT m) | |
Semigroup a => Monad (These a) | |
Monad m => Monad (QuoteToQuasi m) | |
Semigroup a => Monad (These a) | |
Monad m => Monad (MaybeT m) | |
Functor backend => Monad (Wizard backend) | |
Monoid a => Monad ((,) a) | |
Monad m => Monad (Kleisli m a) | |
Monad m => Monad (StateT s m) | |
Monad f => Monad (Alt f) | |
Monad f => Monad (Rec1 f) | |
(Applicative f, Monad f) => Monad (WhenMissing f x) | |
(Functor f, Monad m) => Monad (FreeT f m) | |
Monad m => Monad (StateT s m) | |
Monad (Tagged s) | |
Monad m => Monad (ExceptT e m) | |
Monad m => Monad (IdentityT m) | |
Monad m => Monad (ReaderT r m) | |
Monad m => Monad (StateT s m) | |
Monad m => Monad (StateT s m) | |
(Monoid w, Monad m) => Monad (WriterT w m) | |
(Monoid w, Monad m) => Monad (WriterT w m) | |
Monad m => Monad (Reverse m) | |
(Monoid a, Monoid b) => Monad ((,,) a b) | |
(Monad f, Monad g) => Monad (f :*: g) | |
Monad (ConduitT i o m) | |
(Monad f, Applicative f) => Monad (WhenMatched f x y) | |
(Applicative f, Monad f) => Monad (WhenMissing f k x) | |
Stream s => Monad (ParsecT e s m) | |
Monad (ContT r m) | |
(Monoid a, Monoid b, Monoid c) => Monad ((,,,) a b c) | |
Monad ((->) r) | |
Monad f => Monad (M1 i c f) | |
(Monad f, Applicative f) => Monad (WhenMatched f k x y) | |
(Monoid w, Monad m) => Monad (RWST r w s m) | |
(Monoid w, Monad m) => Monad (RWST r w s m) | |
Monad m => Monad (Pipe l i o u m) | |
Instances
MonadFail IO | |
Defined in Control.Monad.Fail | |
MonadIO IO | |
Defined in Control.Monad.IO.Class | |
Alternative IO | |
Applicative IO | |
Functor IO | |
Monad IO | |
MonadPlus IO | |
MonadCatch IO | |
Defined in Control.Monad.Catch Methods catch :: (HasCallStack, Exception e) => IO a -> (e -> IO a) -> IO a | |
MonadMask IO | |
Defined in Control.Monad.Catch Methods mask :: HasCallStack => ((forall a. IO a -> IO a) -> IO b) -> IO b uninterruptibleMask :: HasCallStack => ((forall a. IO a -> IO a) -> IO b) -> IO b generalBracket :: HasCallStack => IO a -> (a -> ExitCase b -> IO c) -> (a -> IO b) -> IO (b, c) | |
MonadThrow IO | |
Defined in Control.Monad.Catch Methods throwM :: (HasCallStack, Exception e) => e -> IO a | |
PrimBase IO | |
Defined in Control.Monad.Primitive | |
PrimMonad IO | |
Quasi IO | |
Defined in Language.Haskell.TH.Syntax Methods qReport :: Bool -> String -> IO () qRecover :: IO a -> IO a -> IO a qLookupName :: Bool -> String -> IO (Maybe Name) qReifyFixity :: Name -> IO (Maybe Fixity) qReifyType :: Name -> IO Type qReifyInstances :: Name -> [Type] -> IO [Dec] qReifyRoles :: Name -> IO [Role] qReifyAnnotations :: Data a => AnnLookup -> IO [a] qReifyModule :: Module -> IO ModuleInfo qReifyConStrictness :: Name -> IO [DecidedStrictness] qGetPackageRoot :: IO FilePath qAddDependentFile :: FilePath -> IO () qAddTempFile :: String -> IO FilePath qAddTopDecls :: [Dec] -> IO () qAddForeignFilePath :: ForeignSrcLang -> String -> IO () qAddModFinalizer :: Q () -> IO () qAddCorePlugin :: String -> IO () qGetQ :: Typeable a => IO (Maybe a) qPutQ :: Typeable a => a -> IO () qIsExtEnabled :: Extension -> IO Bool qExtsEnabled :: IO [Extension] | |
Quote IO | |
Defined in Language.Haskell.TH.Syntax | |
Monoid a => Monoid (IO a) | |
Semigroup a => Semigroup (IO a) | |
a ~ () => HPrintfType (IO a) | |
Defined in Text.Printf | |
a ~ () => PrintfType (IO a) | |
Defined in Text.Printf | |
Default a => Default (IO a) | |
Defined in Data.Default.Class | |
MonoFunctor (IO a) | |
MonoPointed (IO a) | |
Defined in Data.MonoTraversable | |
Assertable t => Assertable (IO t) | |
Defined in Test.Tasty.HUnit.Orig | |
AssertionPredicable t => AssertionPredicable (IO t) | |
Defined in Test.Tasty.HUnit.Orig Methods assertionPredicate :: IO t -> IO Bool # | |
Run (InputT IO) Haskeline | |
Defined in System.Console.Wizard.Haskeline Methods runAlgebra :: Haskeline (InputT IO v) -> InputT IO v | |
Run (InputT IO) WithSettings | |
Defined in System.Console.Wizard.Haskeline Methods runAlgebra :: WithSettings (InputT IO v) -> InputT IO v | |
type PrimState IO | |
Defined in Control.Monad.Primitive type PrimState IO = RealWorld | |
type Element (IO a) | |
Defined in Data.MonoTraversable type Element (IO a) = a |
Instances
Ord DL | |
Ord DotNetTime | |
Defined in Data.Aeson.Types.Internal | |
Ord JSONPathElement | |
Defined in Data.Aeson.Types.Internal Methods compare :: JSONPathElement -> JSONPathElement -> Ordering # (<) :: JSONPathElement -> JSONPathElement -> Bool # (<=) :: JSONPathElement -> JSONPathElement -> Bool # (>) :: JSONPathElement -> JSONPathElement -> Bool # (>=) :: JSONPathElement -> JSONPathElement -> Bool # max :: JSONPathElement -> JSONPathElement -> JSONPathElement # min :: JSONPathElement -> JSONPathElement -> JSONPathElement # | |
Ord Value | |
Ord BlinkSpeed | |
Defined in System.Console.ANSI.Types | |
Ord Color | |
Ord ColorIntensity | |
Defined in System.Console.ANSI.Types Methods compare :: ColorIntensity -> ColorIntensity -> Ordering # (<) :: ColorIntensity -> ColorIntensity -> Bool # (<=) :: ColorIntensity -> ColorIntensity -> Bool # (>) :: ColorIntensity -> ColorIntensity -> Bool # (>=) :: ColorIntensity -> ColorIntensity -> Bool # | |
Ord ConsoleIntensity | |
Defined in System.Console.ANSI.Types Methods compare :: ConsoleIntensity -> ConsoleIntensity -> Ordering # (<) :: ConsoleIntensity -> ConsoleIntensity -> Bool # (<=) :: ConsoleIntensity -> ConsoleIntensity -> Bool # (>) :: ConsoleIntensity -> ConsoleIntensity -> Bool # (>=) :: ConsoleIntensity -> ConsoleIntensity -> Bool # max :: ConsoleIntensity -> ConsoleIntensity -> ConsoleIntensity # min :: ConsoleIntensity -> ConsoleIntensity -> ConsoleIntensity # | |
Ord ConsoleLayer | |
Defined in System.Console.ANSI.Types | |
Ord Underlining | |
Defined in System.Console.ANSI.Types | |
Ord Pos | |
Ord ByteArray | |
Ord All | |
Ord Any | |
Ord SomeTypeRep | |
Defined in Data.Typeable.Internal | |
Ord Version | |
Ord Void | |
Ord BlockReason | |
Defined in GHC.Conc.Sync | |
Ord ThreadId | |
Defined in GHC.Conc.Sync | |
Ord ThreadStatus | |
Defined in GHC.Conc.Sync | |
Ord ErrorCall | |
Ord ArithException | |
Defined in GHC.Exception.Type Methods compare :: ArithException -> ArithException -> Ordering # (<) :: ArithException -> ArithException -> Bool # (<=) :: ArithException -> ArithException -> Bool # (>) :: ArithException -> ArithException -> Bool # (>=) :: ArithException -> ArithException -> Bool # | |
Ord Associativity | |
Defined in GHC.Generics Methods compare :: Associativity -> Associativity -> Ordering # (<) :: Associativity -> Associativity -> Bool # (<=) :: Associativity -> Associativity -> Bool # (>) :: Associativity -> Associativity -> Bool # (>=) :: Associativity -> Associativity -> Bool # | |
Ord DecidedStrictness | |
Defined in GHC.Generics Methods compare :: DecidedStrictness -> DecidedStrictness -> Ordering # (<) :: DecidedStrictness -> DecidedStrictness -> Bool # (<=) :: DecidedStrictness -> DecidedStrictness -> Bool # (>) :: DecidedStrictness -> DecidedStrictness -> Bool # (>=) :: DecidedStrictness -> DecidedStrictness -> Bool # max :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness # min :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness # | |
Ord Fixity | |
Ord SourceStrictness | |
Defined in GHC.Generics Methods compare :: SourceStrictness -> SourceStrictness -> Ordering # (<) :: SourceStrictness -> SourceStrictness -> Bool # (<=) :: SourceStrictness -> SourceStrictness -> Bool # (>) :: SourceStrictness -> SourceStrictness -> Bool # (>=) :: SourceStrictness -> SourceStrictness -> Bool # max :: SourceStrictness -> SourceStrictness -> SourceStrictness # min :: SourceStrictness -> SourceStrictness -> SourceStrictness # | |
Ord SourceUnpackedness | |
Defined in GHC.Generics Methods compare :: SourceUnpackedness -> SourceUnpackedness -> Ordering # (<) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (<=) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (>) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (>=) :: SourceUnpackedness -> SourceUnpackedness -> Bool # max :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness # min :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness # | |
Ord SeekMode | |
Defined in GHC.IO.Device | |
Ord ArrayException | |
Defined in GHC.IO.Exception Methods compare :: ArrayException -> ArrayException -> Ordering # (<) :: ArrayException -> ArrayException -> Bool # (<=) :: ArrayException -> ArrayException -> Bool # (>) :: ArrayException -> ArrayException -> Bool # (>=) :: ArrayException -> ArrayException -> Bool # | |
Ord AsyncException | |
Defined in GHC.IO.Exception Methods compare :: AsyncException -> AsyncException -> Ordering # (<) :: AsyncException -> AsyncException -> Bool # (<=) :: AsyncException -> AsyncException -> Bool # (>) :: AsyncException -> AsyncException -> Bool # (>=) :: AsyncException -> AsyncException -> Bool # | |
Ord ExitCode | |
Defined in GHC.IO.Exception | |
Ord BufferMode | |
Defined in GHC.IO.Handle.Types Methods compare :: BufferMode -> BufferMode -> Ordering # (<) :: BufferMode -> BufferMode -> Bool # (<=) :: BufferMode -> BufferMode -> Bool # (>) :: BufferMode -> BufferMode -> Bool # (>=) :: BufferMode -> BufferMode -> Bool # max :: BufferMode -> BufferMode -> BufferMode # min :: BufferMode -> BufferMode -> BufferMode # | |
Ord Newline | |
Ord NewlineMode | |
Defined in GHC.IO.Handle.Types Methods compare :: NewlineMode -> NewlineMode -> Ordering # (<) :: NewlineMode -> NewlineMode -> Bool # (<=) :: NewlineMode -> NewlineMode -> Bool # (>) :: NewlineMode -> NewlineMode -> Bool # (>=) :: NewlineMode -> NewlineMode -> Bool # max :: NewlineMode -> NewlineMode -> NewlineMode # min :: NewlineMode -> NewlineMode -> NewlineMode # | |
Ord IOMode | |
Ord SomeChar | |
Defined in GHC.TypeLits | |
Ord SomeSymbol | |
Ord SomeNat | |
Ord GeneralCategory | |
Defined in GHC.Unicode Methods compare :: GeneralCategory -> GeneralCategory -> Ordering # (<) :: GeneralCategory -> GeneralCategory -> Bool # (<=) :: GeneralCategory -> GeneralCategory -> Bool # (>) :: GeneralCategory -> GeneralCategory -> Bool # (>=) :: GeneralCategory -> GeneralCategory -> Bool # max :: GeneralCategory -> GeneralCategory -> GeneralCategory # min :: GeneralCategory -> GeneralCategory -> GeneralCategory # | |
Ord Word16 | |
Ord Word32 | |
Ord Word64 | |
Ord Word8 | |
Ord CBlkCnt | |
Ord CBlkSize | |
Defined in System.Posix.Types | |
Ord CCc | |
Ord CClockId | |
Defined in System.Posix.Types | |
Ord CDev | |
Ord CFsBlkCnt | |
Ord CFsFilCnt | |
Ord CGid | |
Ord CId | |
Ord CIno | |
Ord CKey | |
Ord CMode | |
Ord CNfds | |
Ord CNlink | |
Ord COff | |
Ord CPid | |
Ord CRLim | |
Ord CSocklen | |
Defined in System.Posix.Types | |
Ord CSpeed | |
Ord CSsize | |
Ord CTcflag | |
Ord CTimer | |
Ord CUid | |
Ord Fd | |
Ord ByteString | |
Defined in Data.ByteString.Internal.Type | |
Ord ByteString | |
Defined in Data.ByteString.Lazy.Internal | |
Ord ShortByteString | |
Defined in Data.ByteString.Short.Internal Methods compare :: ShortByteString -> ShortByteString -> Ordering # (<) :: ShortByteString -> ShortByteString -> Bool # (<=) :: ShortByteString -> ShortByteString -> Bool # (>) :: ShortByteString -> ShortByteString -> Bool # (>=) :: ShortByteString -> ShortByteString -> Bool # max :: ShortByteString -> ShortByteString -> ShortByteString # min :: ShortByteString -> ShortByteString -> ShortByteString # | |
Ord Complete | |
Defined in System.Console.CmdArgs.Explicit.Complete | |
Ord HelpFormat | |
Defined in System.Console.CmdArgs.Explicit.Help Methods compare :: HelpFormat -> HelpFormat -> Ordering # (<) :: HelpFormat -> HelpFormat -> Bool # (<=) :: HelpFormat -> HelpFormat -> Bool # (>) :: HelpFormat -> HelpFormat -> Bool # (>=) :: HelpFormat -> HelpFormat -> Bool # max :: HelpFormat -> HelpFormat -> HelpFormat # min :: HelpFormat -> HelpFormat -> HelpFormat # | |
Ord FlagInfo | |
Defined in System.Console.CmdArgs.Explicit.Type | |
Ord Ann | |
Ord CmdArgsPrivate | |
Defined in System.Console.CmdArgs.Implicit.Type Methods compare :: CmdArgsPrivate -> CmdArgsPrivate -> Ordering # (<) :: CmdArgsPrivate -> CmdArgsPrivate -> Bool # (<=) :: CmdArgsPrivate -> CmdArgsPrivate -> Bool # (>) :: CmdArgsPrivate -> CmdArgsPrivate -> Bool # (>=) :: CmdArgsPrivate -> CmdArgsPrivate -> Bool # | |
Ord TextFormat | |
Defined in System.Console.CmdArgs.Text | |
Ord Verbosity | |
Defined in System.Console.CmdArgs.Verbosity | |
Ord IntSet | |
Ord FileType | |
Defined in System.Directory.Internal.Common | |
Ord Permissions | |
Defined in System.Directory.Internal.Common Methods compare :: Permissions -> Permissions -> Ordering # (<) :: Permissions -> Permissions -> Bool # (<=) :: Permissions -> Permissions -> Bool # (>) :: Permissions -> Permissions -> Bool # (>=) :: Permissions -> Permissions -> Bool # max :: Permissions -> Permissions -> Permissions # min :: Permissions -> Permissions -> Permissions # | |
Ord XdgDirectory | |
Defined in System.Directory.Internal.Common Methods compare :: XdgDirectory -> XdgDirectory -> Ordering # (<) :: XdgDirectory -> XdgDirectory -> Bool # (<=) :: XdgDirectory -> XdgDirectory -> Bool # (>) :: XdgDirectory -> XdgDirectory -> Bool # (>=) :: XdgDirectory -> XdgDirectory -> Bool # max :: XdgDirectory -> XdgDirectory -> XdgDirectory # min :: XdgDirectory -> XdgDirectory -> XdgDirectory # | |
Ord XdgDirectoryList | |
Defined in System.Directory.Internal.Common Methods compare :: XdgDirectoryList -> XdgDirectoryList -> Ordering # (<) :: XdgDirectoryList -> XdgDirectoryList -> Bool # (<=) :: XdgDirectoryList -> XdgDirectoryList -> Bool # (>) :: XdgDirectoryList -> XdgDirectoryList -> Bool # (>=) :: XdgDirectoryList -> XdgDirectoryList -> Bool # max :: XdgDirectoryList -> XdgDirectoryList -> XdgDirectoryList # min :: XdgDirectoryList -> XdgDirectoryList -> XdgDirectoryList # | |
Ord OsChar | |
Defined in System.OsString.Internal.Types.Hidden | |
Ord OsString | |
Defined in System.OsString.Internal.Types.Hidden | |
Ord PosixChar | |
Defined in System.OsString.Internal.Types.Hidden | |
Ord PosixString | |
Defined in System.OsString.Internal.Types.Hidden | |
Ord WindowsChar | |
Defined in System.OsString.Internal.Types.Hidden | |
Ord WindowsString | |
Defined in System.OsString.Internal.Types.Hidden Methods compare :: WindowsString -> WindowsString -> Ordering # (<) :: WindowsString -> WindowsString -> Bool # (<=) :: WindowsString -> WindowsString -> Bool # (>) :: WindowsString -> WindowsString -> Bool # (>=) :: WindowsString -> WindowsString -> Bool # | |
Ord BigNat | |
Ord Extension | |
Ord Ordering | |
Defined in GHC.Classes | |
Ord TyCon | |
Ord Completion | |
Defined in System.Console.Haskeline.Completion | |
Ord AccountAlias | |
Defined in Hledger.Data.Types Methods compare :: AccountAlias -> AccountAlias -> Ordering # (<) :: AccountAlias -> AccountAlias -> Bool # (<=) :: AccountAlias -> AccountAlias -> Bool # (>) :: AccountAlias -> AccountAlias -> Bool # (>=) :: AccountAlias -> AccountAlias -> Bool # max :: AccountAlias -> AccountAlias -> AccountAlias # min :: AccountAlias -> AccountAlias -> AccountAlias # | |
Ord AccountType | |
Defined in Hledger.Data.Types Methods compare :: AccountType -> AccountType -> Ordering # (<) :: AccountType -> AccountType -> Bool # (<=) :: AccountType -> AccountType -> Bool # (>) :: AccountType -> AccountType -> Bool # (>=) :: AccountType -> AccountType -> Bool # max :: AccountType -> AccountType -> AccountType # min :: AccountType -> AccountType -> AccountType # | |
Ord Amount | |
Ord AmountPrecision | |
Defined in Hledger.Data.Types Methods compare :: AmountPrecision -> AmountPrecision -> Ordering # (<) :: AmountPrecision -> AmountPrecision -> Bool # (<=) :: AmountPrecision -> AmountPrecision -> Bool # (>) :: AmountPrecision -> AmountPrecision -> Bool # (>=) :: AmountPrecision -> AmountPrecision -> Bool # max :: AmountPrecision -> AmountPrecision -> AmountPrecision # min :: AmountPrecision -> AmountPrecision -> AmountPrecision # | |
Ord AmountPrice | |
Defined in Hledger.Data.Types Methods compare :: AmountPrice -> AmountPrice -> Ordering # (<) :: AmountPrice -> AmountPrice -> Bool # (<=) :: AmountPrice -> AmountPrice -> Bool # (>) :: AmountPrice -> AmountPrice -> Bool # (>=) :: AmountPrice -> AmountPrice -> Bool # max :: AmountPrice -> AmountPrice -> AmountPrice # min :: AmountPrice -> AmountPrice -> AmountPrice # | |
Ord AmountStyle | |
Defined in Hledger.Data.Types Methods compare :: AmountStyle -> AmountStyle -> Ordering # (<) :: AmountStyle -> AmountStyle -> Bool # (<=) :: AmountStyle -> AmountStyle -> Bool # (>) :: AmountStyle -> AmountStyle -> Bool # (>=) :: AmountStyle -> AmountStyle -> Bool # max :: AmountStyle -> AmountStyle -> AmountStyle # min :: AmountStyle -> AmountStyle -> AmountStyle # | |
Ord DateSpan | |
Defined in Hledger.Data.Types | |
Ord DigitGroupStyle | |
Defined in Hledger.Data.Types Methods compare :: DigitGroupStyle -> DigitGroupStyle -> Ordering # (<) :: DigitGroupStyle -> DigitGroupStyle -> Bool # (<=) :: DigitGroupStyle -> DigitGroupStyle -> Bool # (>) :: DigitGroupStyle -> DigitGroupStyle -> Bool # (>=) :: DigitGroupStyle -> DigitGroupStyle -> Bool # max :: DigitGroupStyle -> DigitGroupStyle -> DigitGroupStyle # min :: DigitGroupStyle -> DigitGroupStyle -> DigitGroupStyle # | |
Ord EFDay | |
Ord Interval | |
Defined in Hledger.Data.Types | |
Ord MarketPrice | |
Defined in Hledger.Data.Types Methods compare :: MarketPrice -> MarketPrice -> Ordering # (<) :: MarketPrice -> MarketPrice -> Bool # (<=) :: MarketPrice -> MarketPrice -> Bool # (>) :: MarketPrice -> MarketPrice -> Bool # (>=) :: MarketPrice -> MarketPrice -> Bool # max :: MarketPrice -> MarketPrice -> MarketPrice # min :: MarketPrice -> MarketPrice -> MarketPrice # | |
Ord MixedAmount | |
Defined in Hledger.Data.Types Methods compare :: MixedAmount -> MixedAmount -> Ordering # (<) :: MixedAmount -> MixedAmount -> Bool # (<=) :: MixedAmount -> MixedAmount -> Bool # (>) :: MixedAmount -> MixedAmount -> Bool # (>=) :: MixedAmount -> MixedAmount -> Bool # max :: MixedAmount -> MixedAmount -> MixedAmount # min :: MixedAmount -> MixedAmount -> MixedAmount # | |
Ord MixedAmountKey | |
Defined in Hledger.Data.Types Methods compare :: MixedAmountKey -> MixedAmountKey -> Ordering # (<) :: MixedAmountKey -> MixedAmountKey -> Bool # (<=) :: MixedAmountKey -> MixedAmountKey -> Bool # (>) :: MixedAmountKey -> MixedAmountKey -> Bool # (>=) :: MixedAmountKey -> MixedAmountKey -> Bool # | |
Ord Period | |
Ord PriceDirective | |
Defined in Hledger.Data.Types Methods compare :: PriceDirective -> PriceDirective -> Ordering # (<) :: PriceDirective -> PriceDirective -> Bool # (<=) :: PriceDirective -> PriceDirective -> Bool # (>) :: PriceDirective -> PriceDirective -> Bool # (>=) :: PriceDirective -> PriceDirective -> Bool # max :: PriceDirective -> PriceDirective -> PriceDirective # min :: PriceDirective -> PriceDirective -> PriceDirective # | |
Ord Rounding | |
Defined in Hledger.Data.Types | |
Ord Side | |
Ord Status | |
Ord TimeclockCode | |
Defined in Hledger.Data.Types Methods compare :: TimeclockCode -> TimeclockCode -> Ordering # (<) :: TimeclockCode -> TimeclockCode -> Bool # (<=) :: TimeclockCode -> TimeclockCode -> Bool # (>) :: TimeclockCode -> TimeclockCode -> Bool # (>=) :: TimeclockCode -> TimeclockCode -> Bool # max :: TimeclockCode -> TimeclockCode -> TimeclockCode # min :: TimeclockCode -> TimeclockCode -> TimeclockCode # | |
Ord TimeclockEntry | |
Defined in Hledger.Data.Types Methods compare :: TimeclockEntry -> TimeclockEntry -> Ordering # (<) :: TimeclockEntry -> TimeclockEntry -> Bool # (<=) :: TimeclockEntry -> TimeclockEntry -> Bool # (>) :: TimeclockEntry -> TimeclockEntry -> Bool # (>=) :: TimeclockEntry -> TimeclockEntry -> Bool # max :: TimeclockEntry -> TimeclockEntry -> TimeclockEntry # min :: TimeclockEntry -> TimeclockEntry -> TimeclockEntry # | |
Ord DisplayName | |
Defined in Hledger.Reports.ReportTypes Methods compare :: DisplayName -> DisplayName -> Ordering # (<) :: DisplayName -> DisplayName -> Bool # (<=) :: DisplayName -> DisplayName -> Bool # (>) :: DisplayName -> DisplayName -> Bool # (>=) :: DisplayName -> DisplayName -> Bool # max :: DisplayName -> DisplayName -> DisplayName # min :: DisplayName -> DisplayName -> DisplayName # | |
Ord Regexp | |
Ord HledgerParseErrorData | |
Defined in Text.Megaparsec.Custom Methods compare :: HledgerParseErrorData -> HledgerParseErrorData -> Ordering # (<) :: HledgerParseErrorData -> HledgerParseErrorData -> Bool # (<=) :: HledgerParseErrorData -> HledgerParseErrorData -> Bool # (>) :: HledgerParseErrorData -> HledgerParseErrorData -> Bool # (>=) :: HledgerParseErrorData -> HledgerParseErrorData -> Bool # max :: HledgerParseErrorData -> HledgerParseErrorData -> HledgerParseErrorData # min :: HledgerParseErrorData -> HledgerParseErrorData -> HledgerParseErrorData # | |
Ord Pos | |
Ord SourcePos | |
Ord OsChar | |
Ord OsString | |
Defined in System.OsString.Internal.Types | |
Ord PosixChar | |
Ord PosixString | |
Defined in System.OsString.Internal.Types | |
Ord WindowsChar | |
Defined in System.OsString.Internal.Types | |
Ord WindowsString | |
Defined in System.OsString.Internal.Types Methods compare :: WindowsString -> WindowsString -> Ordering # (<) :: WindowsString -> WindowsString -> Bool # (<=) :: WindowsString -> WindowsString -> Bool # (>) :: WindowsString -> WindowsString -> Bool # (>=) :: WindowsString -> WindowsString -> Bool # | |
Ord FusionDepth | |
Defined in Prettyprinter.Internal | |
Ord LayoutOptions | |
Defined in Prettyprinter.Internal Methods compare :: LayoutOptions -> LayoutOptions -> Ordering # (<) :: LayoutOptions -> LayoutOptions -> Bool # (<=) :: LayoutOptions -> LayoutOptions -> Bool # (>) :: LayoutOptions -> LayoutOptions -> Bool # (>=) :: LayoutOptions -> LayoutOptions -> Bool # | |
Ord PageWidth | |
Ord AnsiStyle | |
Defined in Prettyprinter.Render.Terminal.Internal | |
Ord Bold | |
Ord Color | |
Ord Intensity | |
Defined in Prettyprinter.Render.Terminal.Internal | |
Ord Italicized | |
Defined in Prettyprinter.Render.Terminal.Internal | |
Ord Layer | |
Ord Underlined | |
Defined in Prettyprinter.Render.Terminal.Internal | |
Ord DoPa | |
Ord WhichTest | |
Ord Scientific | |
Ord NumThreads | |
Defined in Test.Tasty.Options.Core | |
Ord AnnLookup | |
Ord AnnTarget | |
Ord Bang | |
Ord Body | |
Ord Bytes | |
Ord Callconv | |
Defined in Language.Haskell.TH.Syntax | |
Ord Clause | |
Ord Con | |
Ord Dec | |
Ord DecidedStrictness | |
Defined in Language.Haskell.TH.Syntax Methods compare :: DecidedStrictness -> DecidedStrictness -> Ordering # (<) :: DecidedStrictness -> DecidedStrictness -> Bool # (<=) :: DecidedStrictness -> DecidedStrictness -> Bool # (>) :: DecidedStrictness -> DecidedStrictness -> Bool # (>=) :: DecidedStrictness -> DecidedStrictness -> Bool # max :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness # min :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness # | |
Ord DerivClause | |
Defined in Language.Haskell.TH.Syntax | |
Ord DerivStrategy | |
Defined in Language.Haskell.TH.Syntax Methods compare :: DerivStrategy -> DerivStrategy -> Ordering # (<) :: DerivStrategy -> DerivStrategy -> Bool # (<=) :: DerivStrategy -> DerivStrategy -> Bool # (>) :: DerivStrategy -> DerivStrategy -> Bool # (>=) :: DerivStrategy -> DerivStrategy -> Bool # | |
Ord DocLoc | |
Ord Exp | |
Ord FamilyResultSig | |
Defined in Language.Haskell.TH.Syntax Methods compare :: FamilyResultSig -> FamilyResultSig -> Ordering # (<) :: FamilyResultSig -> FamilyResultSig -> Bool # (<=) :: FamilyResultSig -> FamilyResultSig -> Bool # (>) :: FamilyResultSig -> FamilyResultSig -> Bool # (>=) :: FamilyResultSig -> FamilyResultSig -> Bool # max :: FamilyResultSig -> FamilyResultSig -> FamilyResultSig # min :: FamilyResultSig -> FamilyResultSig -> FamilyResultSig # | |
Ord Fixity | |
Ord FixityDirection | |
Defined in Language.Haskell.TH.Syntax Methods compare :: FixityDirection -> FixityDirection -> Ordering # (<) :: FixityDirection -> FixityDirection -> Bool # (<=) :: FixityDirection -> FixityDirection -> Bool # (>) :: FixityDirection -> FixityDirection -> Bool # (>=) :: FixityDirection -> FixityDirection -> Bool # max :: FixityDirection -> FixityDirection -> FixityDirection # min :: FixityDirection -> FixityDirection -> FixityDirection # | |
Ord Foreign | |
Defined in Language.Haskell.TH.Syntax | |
Ord FunDep | |
Ord Guard | |
Ord Info | |
Ord InjectivityAnn | |
Defined in Language.Haskell.TH.Syntax Methods compare :: InjectivityAnn -> InjectivityAnn -> Ordering # (<) :: InjectivityAnn -> InjectivityAnn -> Bool # (<=) :: InjectivityAnn -> InjectivityAnn -> Bool # (>) :: InjectivityAnn -> InjectivityAnn -> Bool # (>=) :: InjectivityAnn -> InjectivityAnn -> Bool # | |
Ord Inline | |
Ord Lit | |
Ord Loc | |
Ord Match | |
Ord ModName | |
Defined in Language.Haskell.TH.Syntax | |
Ord Module | |
Ord ModuleInfo | |
Defined in Language.Haskell.TH.Syntax | |
Ord Name | |
Ord NameFlavour | |
Defined in Language.Haskell.TH.Syntax | |
Ord NameSpace | |
Ord OccName | |
Defined in Language.Haskell.TH.Syntax | |
Ord Overlap | |
Defined in Language.Haskell.TH.Syntax | |
Ord Pat | |
Ord PatSynArgs | |
Defined in Language.Haskell.TH.Syntax | |
Ord PatSynDir | |
Ord Phases | |
Ord PkgName | |
Defined in Language.Haskell.TH.Syntax | |
Ord Pragma | |
Ord Range | |
Ord Role | |
Ord RuleBndr | |
Defined in Language.Haskell.TH.Syntax | |
Ord RuleMatch | |
Ord Safety | |
Ord SourceStrictness | |
Defined in Language.Haskell.TH.Syntax Methods compare :: SourceStrictness -> SourceStrictness -> Ordering # (<) :: SourceStrictness -> SourceStrictness -> Bool # (<=) :: SourceStrictness -> SourceStrictness -> Bool # (>) :: SourceStrictness -> SourceStrictness -> Bool # (>=) :: SourceStrictness -> SourceStrictness -> Bool # max :: SourceStrictness -> SourceStrictness -> SourceStrictness # min :: SourceStrictness -> SourceStrictness -> SourceStrictness # | |
Ord SourceUnpackedness | |
Defined in Language.Haskell.TH.Syntax Methods compare :: SourceUnpackedness -> SourceUnpackedness -> Ordering # (<) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (<=) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (>) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (>=) :: SourceUnpackedness -> SourceUnpackedness -> Bool # max :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness # min :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness # | |
Ord Specificity | |
Defined in Language.Haskell.TH.Syntax | |
Ord Stmt | |
Ord TyLit | |
Ord TySynEqn | |
Defined in Language.Haskell.TH.Syntax | |
Ord Type | |
Ord TypeFamilyHead | |
Defined in Language.Haskell.TH.Syntax Methods compare :: TypeFamilyHead -> TypeFamilyHead -> Ordering # (<) :: TypeFamilyHead -> TypeFamilyHead -> Bool # (<=) :: TypeFamilyHead -> TypeFamilyHead -> Bool # (>) :: TypeFamilyHead -> TypeFamilyHead -> Bool # (>=) :: TypeFamilyHead -> TypeFamilyHead -> Bool # | |
Ord Color | |
Ord Builder | |
Defined in Data.Text.Internal.Builder | |
Ord B | |
Ord ShortText | |
Ord ConstructorVariant | |
Defined in Language.Haskell.TH.Datatype Methods compare :: ConstructorVariant -> ConstructorVariant -> Ordering # (<) :: ConstructorVariant -> ConstructorVariant -> Bool # (<=) :: ConstructorVariant -> ConstructorVariant -> Bool # (>) :: ConstructorVariant -> ConstructorVariant -> Bool # (>=) :: ConstructorVariant -> ConstructorVariant -> Bool # max :: ConstructorVariant -> ConstructorVariant -> ConstructorVariant # min :: ConstructorVariant -> ConstructorVariant -> ConstructorVariant # | |
Ord DatatypeVariant | |
Defined in Language.Haskell.TH.Datatype Methods compare :: DatatypeVariant -> DatatypeVariant -> Ordering # (<) :: DatatypeVariant -> DatatypeVariant -> Bool # (<=) :: DatatypeVariant -> DatatypeVariant -> Bool # (>) :: DatatypeVariant -> DatatypeVariant -> Bool # (>=) :: DatatypeVariant -> DatatypeVariant -> Bool # max :: DatatypeVariant -> DatatypeVariant -> DatatypeVariant # min :: DatatypeVariant -> DatatypeVariant -> DatatypeVariant # | |
Ord FieldStrictness | |
Defined in Language.Haskell.TH.Datatype Methods compare :: FieldStrictness -> FieldStrictness -> Ordering # (<) :: FieldStrictness -> FieldStrictness -> Bool # (<=) :: FieldStrictness -> FieldStrictness -> Bool # (>) :: FieldStrictness -> FieldStrictness -> Bool # (>=) :: FieldStrictness -> FieldStrictness -> Bool # max :: FieldStrictness -> FieldStrictness -> FieldStrictness # min :: FieldStrictness -> FieldStrictness -> FieldStrictness # | |
Ord Strictness | |
Defined in Language.Haskell.TH.Datatype | |
Ord Unpackedness | |
Defined in Language.Haskell.TH.Datatype | |
Ord Day | |
Ord DayOfWeek | |
Ord DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime | |
Ord NominalDiffTime | |
Defined in Data.Time.Clock.Internal.NominalDiffTime Methods compare :: NominalDiffTime -> NominalDiffTime -> Ordering # (<) :: NominalDiffTime -> NominalDiffTime -> Bool # (<=) :: NominalDiffTime -> NominalDiffTime -> Bool # (>) :: NominalDiffTime -> NominalDiffTime -> Bool # (>=) :: NominalDiffTime -> NominalDiffTime -> Bool # max :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # min :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # | |
Ord SystemTime | |
Defined in Data.Time.Clock.Internal.SystemTime | |
Ord UTCTime | |
Defined in Data.Time.Clock.Internal.UTCTime | |
Ord UniversalTime | |
Defined in Data.Time.Clock.Internal.UniversalTime Methods compare :: UniversalTime -> UniversalTime -> Ordering # (<) :: UniversalTime -> UniversalTime -> Bool # (<=) :: UniversalTime -> UniversalTime -> Bool # (>) :: UniversalTime -> UniversalTime -> Bool # (>=) :: UniversalTime -> UniversalTime -> Bool # max :: UniversalTime -> UniversalTime -> UniversalTime # min :: UniversalTime -> UniversalTime -> UniversalTime # | |
Ord TimeLocale | |
Defined in Data.Time.Format.Locale Methods compare :: TimeLocale -> TimeLocale -> Ordering # (<) :: TimeLocale -> TimeLocale -> Bool # (<=) :: TimeLocale -> TimeLocale -> Bool # (>) :: TimeLocale -> TimeLocale -> Bool # (>=) :: TimeLocale -> TimeLocale -> Bool # max :: TimeLocale -> TimeLocale -> TimeLocale # min :: TimeLocale -> TimeLocale -> TimeLocale # | |
Ord LocalTime | |
Defined in Data.Time.LocalTime.Internal.LocalTime | |
Ord TimeOfDay | |
Defined in Data.Time.LocalTime.Internal.TimeOfDay | |
Ord TimeZone | |
Defined in Data.Time.LocalTime.Internal.TimeZone | |
Ord UUID | |
Ord UnpackedUUID | |
Defined in Data.UUID.Types.Internal | |
Ord Integer | |
Ord Natural | |
Ord () | |
Ord Bool | |
Ord Char | |
Ord Double | |
Ord Float | |
Ord Int | |
Ord Word | |
Integral i => Ord (DecimalRaw i) | |
Defined in Data.Decimal | |
Ord a => Ord (Only a) | |
Ord v => Ord (KeyMap v) | |
Defined in Data.Aeson.KeyMap | |
Ord a => Ord (ZipList a) | |
Ord a => Ord (Identity a) | |
Defined in Data.Functor.Identity | |
Ord a => Ord (Down a) | |
Ord a => Ord (Dual a) | |
Ord a => Ord (Product a) | |
Ord a => Ord (Sum a) | |
Ord a => Ord (NonEmpty a) | |
Ord (ForeignPtr a) | |
Defined in GHC.ForeignPtr | |
Ord p => Ord (Par1 p) | |
Ord (FunPtr a) | |
Defined in GHC.Ptr | |
Ord (Ptr a) | |
Integral a => Ord (Ratio a) | |
Ord a => Ord (CmdArgs a) | |
Defined in System.Console.CmdArgs.Implicit.Type | |
Ord a => Ord (Flush a) | |
Defined in Data.Conduit.Internal.Conduit | |
Ord a => Ord (IntMap a) | |
Defined in Data.IntMap.Internal | |
Ord a => Ord (Seq a) | |
Ord a => Ord (ViewL a) | |
Defined in Data.Sequence.Internal | |
Ord a => Ord (ViewR a) | |
Defined in Data.Sequence.Internal | |
Ord a => Ord (Intersection a) | |
Defined in Data.Set.Internal Methods compare :: Intersection a -> Intersection a -> Ordering # (<) :: Intersection a -> Intersection a -> Bool # (<=) :: Intersection a -> Intersection a -> Bool # (>) :: Intersection a -> Intersection a -> Bool # (>=) :: Intersection a -> Intersection a -> Bool # | |
Ord a => Ord (Set a) | |
Ord a => Ord (Tree a) | |
Ord1 f => Ord (Fix f) | |
(Functor f, Ord1 f) => Ord (Mu f) | |
(Functor f, Ord1 f) => Ord (Nu f) | |
Ord a => Ord (DNonEmpty a) | |
Defined in Data.DList.DNonEmpty.Internal | |
Ord a => Ord (DList a) | |
Ord a => Ord (Doc a) | |
Ord a => Ord (Hashed a) | |
Defined in Data.Hashable.Class | |
Ord a => Ord (FastTree a) | |
Defined in Hledger.Data.Account | |
Ord e => Ord (ErrorFancy e) | |
Defined in Text.Megaparsec.Error | |
Ord t => Ord (ErrorItem t) | |
Defined in Text.Megaparsec.Error | |
Ord mono => Ord (NonNull mono) | |
Defined in Data.NonNull | |
Ord ann => Ord (SimpleDocStream ann) | |
Defined in Prettyprinter.Internal Methods compare :: SimpleDocStream ann -> SimpleDocStream ann -> Ordering # (<) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool # (<=) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool # (>) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool # (>=) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool # max :: SimpleDocStream ann -> SimpleDocStream ann -> SimpleDocStream ann # min :: SimpleDocStream ann -> SimpleDocStream ann -> SimpleDocStream ann # | |
Ord a => Ord (Array a) | |
Defined in Data.Primitive.Array | |
(Ord a, Prim a) => Ord (PrimArray a) | |
Defined in Data.Primitive.PrimArray | |
Ord a => Ord (SmallArray a) | |
Defined in Data.Primitive.SmallArray | |
Ord g => Ord (StateGen g) | |
Defined in System.Random.Internal | |
Ord g => Ord (AtomicGen g) | |
Defined in System.Random.Stateful | |
Ord g => Ord (IOGen g) | |
Defined in System.Random.Stateful | |
Ord g => Ord (STGen g) | |
Defined in System.Random.Stateful | |
Ord g => Ord (TGen g) | |
Ord a => Ord (Maybe a) | |
Ord flag => Ord (TyVarBndr flag) | |
Defined in Language.Haskell.TH.Syntax Methods compare :: TyVarBndr flag -> TyVarBndr flag -> Ordering # (<) :: TyVarBndr flag -> TyVarBndr flag -> Bool # (<=) :: TyVarBndr flag -> TyVarBndr flag -> Bool # (>) :: TyVarBndr flag -> TyVarBndr flag -> Bool # (>=) :: TyVarBndr flag -> TyVarBndr flag -> Bool # | |
Ord a => Ord (HashSet a) | |
Ord a => Ord (Vector a) | |
Defined in Data.Vector | |
(Prim a, Ord a) => Ord (Vector a) | |
Defined in Data.Vector.Primitive | |
(Storable a, Ord a) => Ord (Vector a) | |
Defined in Data.Vector.Storable | |
Ord a => Ord (Maybe a) | |
Ord a => Ord (a) | |
Ord a => Ord [a] | |
(Ord a, Ord b) => Ord (Either a b) | |
Ord (Fixed a) | |
Ord (TypeRep a) | |
Ord (U1 p) | |
Ord (V1 p) | |
(Ord k, Ord v) => Ord (Map k v) | |
(Ord a, Ord1 f) => Ord (Free f a) | |
Defined in Control.Monad.Free | |
Ord (ParseError Text HledgerParseErrorData) | |
Defined in Text.Megaparsec.Custom Methods compare :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Ordering # (<) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool # (<=) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool # (>) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool # (>=) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool # max :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData # min :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData # | |
(Ord a, Ord b) => Ord (Either a b) | |
(Ord a, Ord b) => Ord (These a b) | |
(Ord a, Ord b) => Ord (Pair a b) | |
Defined in Data.Strict.Tuple | |
(Ord a, Ord b) => Ord (These a b) | |
(Ord1 f, Ord a) => Ord (Lift f a) | |
Defined in Control.Applicative.Lift | |
(Ord1 m, Ord a) => Ord (MaybeT m a) | |
Defined in Control.Monad.Trans.Maybe | |
(Ord k, Ord v) => Ord (HashMap k v) | |
Defined in Data.HashMap.Internal | |
(Ord a, Ord b) => Ord (a, b) | |
Ord a => Ord (Const a b) | |
Ord (f a) => Ord (Alt f a) | |
Defined in Data.Semigroup.Internal | |
Ord (a :~: b) | |
Defined in Data.Type.Equality | |
(Generic1 f, Ord (Rep1 f a)) => Ord (Generically1 f a) | |
Defined in GHC.Generics Methods compare :: Generically1 f a -> Generically1 f a -> Ordering # (<) :: Generically1 f a -> Generically1 f a -> Bool # (<=) :: Generically1 f a -> Generically1 f a -> Bool # (>) :: Generically1 f a -> Generically1 f a -> Bool # (>=) :: Generically1 f a -> Generically1 f a -> Bool # max :: Generically1 f a -> Generically1 f a -> Generically1 f a # min :: Generically1 f a -> Generically1 f a -> Generically1 f a # | |
Ord (f p) => Ord (Rec1 f p) | |
Defined in GHC.Generics | |
Ord (URec (Ptr ()) p) | |
Defined in GHC.Generics Methods compare :: URec (Ptr ()) p -> URec (Ptr ()) p -> Ordering # (<) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool # (<=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool # (>) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool # (>=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool # max :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p # min :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p # | |
Ord (URec Char p) | |
Defined in GHC.Generics | |
Ord (URec Double p) | |
Defined in GHC.Generics Methods compare :: URec Double p -> URec Double p -> Ordering # (<) :: URec Double p -> URec Double p -> Bool # (<=) :: URec Double p -> URec Double p -> Bool # (>) :: URec Double p -> URec Double p -> Bool # (>=) :: URec Double p -> URec Double p -> Bool # | |
Ord (URec Float p) | |
Defined in GHC.Generics | |
Ord (URec Int p) | |
Ord (URec Word p) | |
Defined in GHC.Generics | |
Ord b => Ord (Tagged s b) | |
(Ord (f a), Ord (g a), Ord a) => Ord (These1 f g a) | |
Defined in Data.Functor.These | |
(Ord1 f, Ord a) => Ord (Backwards f a) | |
Defined in Control.Applicative.Backwards Methods compare :: Backwards f a -> Backwards f a -> Ordering # (<) :: Backwards f a -> Backwards f a -> Bool # (<=) :: Backwards f a -> Backwards f a -> Bool # (>) :: Backwards f a -> Backwards f a -> Bool # (>=) :: Backwards f a -> Backwards f a -> Bool # | |
(Ord e, Ord1 m, Ord a) => Ord (ExceptT e m a) | |
Defined in Control.Monad.Trans.Except Methods compare :: ExceptT e m a -> ExceptT e m a -> Ordering # (<) :: ExceptT e m a -> ExceptT e m a -> Bool # (<=) :: ExceptT e m a -> ExceptT e m a -> Bool # (>) :: ExceptT e m a -> ExceptT e m a -> Bool # (>=) :: ExceptT e m a -> ExceptT e m a -> Bool # | |
(Ord1 f, Ord a) => Ord (IdentityT f a) | |
Defined in Control.Monad.Trans.Identity Methods compare :: IdentityT f a -> IdentityT f a -> Ordering # (<) :: IdentityT f a -> IdentityT f a -> Bool # (<=) :: IdentityT f a -> IdentityT f a -> Bool # (>) :: IdentityT f a -> IdentityT f a -> Bool # (>=) :: IdentityT f a -> IdentityT f a -> Bool # | |
(Ord w, Ord1 m, Ord a) => Ord (WriterT w m a) | |
Defined in Control.Monad.Trans.Writer.Lazy Methods compare :: WriterT w m a -> WriterT w m a -> Ordering # (<) :: WriterT w m a -> WriterT w m a -> Bool # (<=) :: WriterT w m a -> WriterT w m a -> Bool # (>) :: WriterT w m a -> WriterT w m a -> Bool # (>=) :: WriterT w m a -> WriterT w m a -> Bool # | |
(Ord w, Ord1 m, Ord a) => Ord (WriterT w m a) | |
Defined in Control.Monad.Trans.Writer.Strict Methods compare :: WriterT w m a -> WriterT w m a -> Ordering # (<) :: WriterT w m a -> WriterT w m a -> Bool # (<=) :: WriterT w m a -> WriterT w m a -> Bool # (>) :: WriterT w m a -> WriterT w m a -> Bool # (>=) :: WriterT w m a -> WriterT w m a -> Bool # | |
Ord a => Ord (Constant a b) | |
Defined in Data.Functor.Constant | |
(Ord1 f, Ord a) => Ord (Reverse f a) | |
Defined in Data.Functor.Reverse | |
(Ord a, Ord b, Ord c) => Ord (a, b, c) | |
Ord (a :~~: b) | |
(Ord (f p), Ord (g p)) => Ord ((f :*: g) p) | |
Defined in GHC.Generics | |
(Ord (f p), Ord (g p)) => Ord ((f :+: g) p) | |
Defined in GHC.Generics | |
Ord c => Ord (K1 i c p) | |
Defined in GHC.Generics | |
(Ord a, Ord b, Ord c, Ord d) => Ord (a, b, c, d) | |
Defined in GHC.Classes | |
Ord (f (g a)) => Ord (Compose f g a) | |
Defined in Data.Functor.Compose Methods compare :: Compose f g a -> Compose f g a -> Ordering # (<) :: Compose f g a -> Compose f g a -> Bool # (<=) :: Compose f g a -> Compose f g a -> Bool # (>) :: Compose f g a -> Compose f g a -> Bool # (>=) :: Compose f g a -> Compose f g a -> Bool # | |
Ord (f (g p)) => Ord ((f :.: g) p) | |
Defined in GHC.Generics | |
Ord (f p) => Ord (M1 i c f p) | |
(Ord a, Ord b, Ord c, Ord d, Ord e) => Ord (a, b, c, d, e) | |
Defined in GHC.Classes Methods compare :: (a, b, c, d, e) -> (a, b, c, d, e) -> Ordering # (<) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool # (<=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool # (>) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool # (>=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool # max :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) # min :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f) => Ord (a, b, c, d, e, f) | |
Defined in GHC.Classes Methods compare :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Ordering # (<) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool # (<=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool # (>) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool # (>=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool # max :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) # min :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g) => Ord (a, b, c, d, e, f, g) | |
Defined in GHC.Classes Methods compare :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Ordering # (<) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool # (<=) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool # (>) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool # (>=) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool # max :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) # min :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h) => Ord (a, b, c, d, e, f, g, h) | |
Defined in GHC.Classes Methods compare :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Ordering # (<) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool # (<=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool # (>) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool # (>=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool # max :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) # min :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i) => Ord (a, b, c, d, e, f, g, h, i) | |
Defined in GHC.Classes Methods compare :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Ordering # (<) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool # (<=) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool # (>) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool # (>=) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool # max :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) # min :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j) => Ord (a, b, c, d, e, f, g, h, i, j) | |
Defined in GHC.Classes Methods compare :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Ordering # (<) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool # (<=) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool # (>) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool # (>=) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool # max :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) # min :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k) => Ord (a, b, c, d, e, f, g, h, i, j, k) | |
Defined in GHC.Classes Methods compare :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Ordering # (<) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool # (<=) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool # (>) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool # (>=) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool # max :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) # min :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l) => Ord (a, b, c, d, e, f, g, h, i, j, k, l) | |
Defined in GHC.Classes Methods compare :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Ordering # (<) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool # (<=) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool # (>) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool # (>=) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool # max :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) # min :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m) | |
Defined in GHC.Classes Methods compare :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Ordering # (<) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool # (<=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool # (>) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool # (>=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool # max :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) # min :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m, n) | |
Defined in GHC.Classes Methods compare :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Ordering # (<) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool # (<=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool # (>) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool # (>=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool # max :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) # min :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n, Ord o) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) | |
Defined in GHC.Classes Methods compare :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Ordering # (<) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool # (<=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool # (>) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool # (>=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool # max :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) # min :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) # |
Command line options, used in the hledger
package and above.
This is the "opts" used throughout hledger CLI code.
representing the options and arguments that were provided at
startup on the command-line.
Constructors
CliOpts | |
Fields
|
Instances
class HasCliOpts c where Source #
Minimal complete definition
Methods
cliOpts :: Lens' c CliOpts Source #
available_width :: Lens' c Int Source #
command :: Lens' c String Source #
debug__ :: Lens' c Int Source #
file__ :: Lens' c [FilePath] Source #
inputopts :: Lens' c InputOpts Source #
no_new_accounts :: Lens' c Bool Source #
output_file :: Lens' c (Maybe FilePath) Source #
output_format :: Lens' c (Maybe String) Source #
progstarttime :: Lens' c POSIXTime Source #
rawopts__ :: Lens' c RawOpts Source #
reportspec :: Lens' c ReportSpec Source #
Instances
HasCliOpts CliOpts Source # | |
Defined in Hledger.Cli.CliOptions Methods cliOpts :: Lens' CliOpts CliOpts Source # available_width :: Lens' CliOpts Int Source # command :: Lens' CliOpts String Source # debug__ :: Lens' CliOpts Int Source # file__ :: Lens' CliOpts [FilePath] Source # inputopts :: Lens' CliOpts InputOpts Source # no_new_accounts :: Lens' CliOpts Bool Source # output_file :: Lens' CliOpts (Maybe FilePath) Source # output_format :: Lens' CliOpts (Maybe String) Source # progstarttime :: Lens' CliOpts POSIXTime Source # rawopts__ :: Lens' CliOpts RawOpts Source # reportspec :: Lens' CliOpts ReportSpec Source # |
type CommandDoc = String Source #
A command's documentation. Used both as part of CLI help, and as part of the hledger manual. See parseCommandDoc.
Instances
FromJSON2 Either | |
Defined in Data.Aeson.Types.FromJSON Methods liftParseJSON2 :: (Value -> Parser a) -> (Value -> Parser [a]) -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser (Either a b) liftParseJSONList2 :: (Value -> Parser a) -> (Value -> Parser [a]) -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser [Either a b] | |
ToJSON2 Either | |
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON2 :: (a -> Value) -> ([a] -> Value) -> (b -> Value) -> ([b] -> Value) -> Either a b -> Value liftToJSONList2 :: (a -> Value) -> ([a] -> Value) -> (b -> Value) -> ([b] -> Value) -> [Either a b] -> Value liftToEncoding2 :: (a -> Encoding) -> ([a] -> Encoding) -> (b -> Encoding) -> ([b] -> Encoding) -> Either a b -> Encoding liftToEncodingList2 :: (a -> Encoding) -> ([a] -> Encoding) -> (b -> Encoding) -> ([b] -> Encoding) -> [Either a b] -> Encoding | |
Bifunctor Either | |
NFData2 Either | |
Defined in Control.DeepSeq | |
Hashable2 Either | |
Defined in Data.Hashable.Class Methods liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> Either a b -> Int | |
Generic1 (Either a :: Type -> Type) | |
(Lift a, Lift b) => Lift (Either a b :: Type) | |
FromJSON a => FromJSON1 (Either a) | |
Defined in Data.Aeson.Types.FromJSON Methods liftParseJSON :: (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser (Either a a0) liftParseJSONList :: (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser [Either a a0] | |
ToJSON a => ToJSON1 (Either a) | |
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON :: (a0 -> Value) -> ([a0] -> Value) -> Either a a0 -> Value liftToJSONList :: (a0 -> Value) -> ([a0] -> Value) -> [Either a a0] -> Value liftToEncoding :: (a0 -> Encoding) -> ([a0] -> Encoding) -> Either a a0 -> Encoding liftToEncodingList :: (a0 -> Encoding) -> ([a0] -> Encoding) -> [Either a a0] -> Encoding | |
Foldable (Either a) | |
Defined in Data.Foldable Methods fold :: Monoid m => Either a m -> m foldMap :: Monoid m => (a0 -> m) -> Either a a0 -> m foldMap' :: Monoid m => (a0 -> m) -> Either a a0 -> m foldr :: (a0 -> b -> b) -> b -> Either a a0 -> b # foldr' :: (a0 -> b -> b) -> b -> Either a a0 -> b foldl :: (b -> a0 -> b) -> b -> Either a a0 -> b # foldl' :: (b -> a0 -> b) -> b -> Either a a0 -> b # foldr1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 # foldl1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 # length :: Either a a0 -> Int # elem :: Eq a0 => a0 -> Either a a0 -> Bool # maximum :: Ord a0 => Either a a0 -> a0 # minimum :: Ord a0 => Either a a0 -> a0 # | |
Traversable (Either a) | |
Applicative (Either e) | |
Functor (Either a) | |
Monad (Either e) | |
NFData a => NFData1 (Either a) | |
Defined in Control.DeepSeq | |
e ~ SomeException => MonadCatch (Either e) | |
Defined in Control.Monad.Catch Methods catch :: (HasCallStack, Exception e0) => Either e a -> (e0 -> Either e a) -> Either e a | |
e ~ SomeException => MonadMask (Either e) | |
Defined in Control.Monad.Catch Methods mask :: HasCallStack => ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b uninterruptibleMask :: HasCallStack => ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b generalBracket :: HasCallStack => Either e a -> (a -> ExitCase b -> Either e c) -> (a -> Either e b) -> Either e (b, c) | |
e ~ SomeException => MonadThrow (Either e) | |
Defined in Control.Monad.Catch Methods throwM :: (HasCallStack, Exception e0) => e0 -> Either e a | |
Hashable a => Hashable1 (Either a) | |
Defined in Data.Hashable.Class Methods liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> Either a a0 -> Int | |
e ~ a => Reportable (Either a) e | |
Defined in Hledger.Reports.ReportOptions | |
(FromJSON a, FromJSON b) => FromJSON (Either a b) | |
Defined in Data.Aeson.Types.FromJSON | |
(ToJSON a, ToJSON b) => ToJSON (Either a b) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding :: Either a b -> Encoding toJSONList :: [Either a b] -> Value toEncodingList :: [Either a b] -> Encoding | |
(Data a, Data b) => Data (Either a b) | |
Defined in Data.Data Methods gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Either a b -> c (Either a b) gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Either a b) toConstr :: Either a b -> Constr dataTypeOf :: Either a b -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Either a b)) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Either a b)) gmapT :: (forall b0. Data b0 => b0 -> b0) -> Either a b -> Either a b gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r gmapQ :: (forall d. Data d => d -> u) -> Either a b -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> Either a b -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) | |
Semigroup (Either a b) | |
Generic (Either a b) | |
(Read a, Read b) => Read (Either a b) | |
Defined in Data.Either | |
(Show a, Show b) => Show (Either a b) | |
(NFData a, NFData b) => NFData (Either a b) | |
Defined in Control.DeepSeq | |
(Eq a, Eq b) => Eq (Either a b) | |
(Ord a, Ord b) => Ord (Either a b) | |
(Hashable a, Hashable b) => Hashable (Either a b) | |
Defined in Data.Hashable.Class | |
MonoFoldable (Either a b) | |
Defined in Data.MonoTraversable Methods ofoldMap :: Monoid m => (Element (Either a b) -> m) -> Either a b -> m ofoldr :: (Element (Either a b) -> b0 -> b0) -> b0 -> Either a b -> b0 ofoldl' :: (a0 -> Element (Either a b) -> a0) -> a0 -> Either a b -> a0 otoList :: Either a b -> [Element (Either a b)] oall :: (Element (Either a b) -> Bool) -> Either a b -> Bool oany :: (Element (Either a b) -> Bool) -> Either a b -> Bool olength64 :: Either a b -> Int64 ocompareLength :: Integral i => Either a b -> i -> Ordering otraverse_ :: Applicative f => (Element (Either a b) -> f b0) -> Either a b -> f () ofor_ :: Applicative f => Either a b -> (Element (Either a b) -> f b0) -> f () omapM_ :: Applicative m => (Element (Either a b) -> m ()) -> Either a b -> m () oforM_ :: Applicative m => Either a b -> (Element (Either a b) -> m ()) -> m () ofoldlM :: Monad m => (a0 -> Element (Either a b) -> m a0) -> a0 -> Either a b -> m a0 ofoldMap1Ex :: Semigroup m => (Element (Either a b) -> m) -> Either a b -> m ofoldr1Ex :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b) ofoldl1Ex' :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b) headEx :: Either a b -> Element (Either a b) lastEx :: Either a b -> Element (Either a b) unsafeHead :: Either a b -> Element (Either a b) unsafeLast :: Either a b -> Element (Either a b) maximumByEx :: (Element (Either a b) -> Element (Either a b) -> Ordering) -> Either a b -> Element (Either a b) minimumByEx :: (Element (Either a b) -> Element (Either a b) -> Ordering) -> Either a b -> Element (Either a b) | |
MonoFunctor (Either a b) | |
MonoPointed (Either a b) | |
Defined in Data.MonoTraversable | |
MonoTraversable (Either a b) | |
Defined in Data.MonoTraversable | |
(a ~ a', b ~ b') => Each (Either a a') (Either b b') a b | |
Defined in Lens.Micro.Internal | |
type Rep1 (Either a :: Type -> Type) | |
Defined in GHC.Generics type Rep1 (Either a :: Type -> Type) = D1 ('MetaData "Either" "Data.Either" "base" 'False) (C1 ('MetaCons "Left" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Right" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1)) | |
type Rep (Either a b) | |
Defined in GHC.Generics type Rep (Either a b) = D1 ('MetaData "Either" "Data.Either" "base" 'False) (C1 ('MetaCons "Left" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Right" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b))) | |
type Element (Either a b) | |
Defined in Data.MonoTraversable type Element (Either a b) = b |
type Balance = MixedAmount #
Constructors
ModifiedJulianDay | |
Fields
|
Instances
FromJSON Day | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSONKey Day | |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON Day | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSONKey Day | |
Defined in Data.Aeson.Types.ToJSON | |
Data Day | |
Defined in Data.Time.Calendar.Days Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Day -> c Day gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Day dataTypeOf :: Day -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Day) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Day) gmapT :: (forall b. Data b => b -> b) -> Day -> Day gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Day -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Day -> r gmapQ :: (forall d. Data d => d -> u) -> Day -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> Day -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> Day -> m Day gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Day -> m Day gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Day -> m Day | |
Enum Day | |
Ix Day | |
NFData Day | |
Defined in Data.Time.Calendar.Days | |
Eq Day | |
Ord Day | |
DayPeriod Day | |
Defined in Data.Time.Calendar.Days |
Constructors
Group | |
Fields
|
data CompoundBalanceCommandSpec Source #
Description of a compound balance report command, from which we generate the command's cmdargs mode and IO action. A compound balance report command shows one or more sections/subreports, each with its own title and subtotals row, in a certain order, plus a grand totals row if there's more than one section. Examples are the balancesheet, cashflow and incomestatement commands.
Compound balance reports do sign normalisation: they show all account balances as normally positive, unlike the ordinary BalanceReport and most hledger commands which show incomeliabilityequity balances as normally negative. Each subreport specifies the normal sign of its amounts, and whether it should be added to or subtracted from the grand total.
Constructors
CompoundBalanceCommandSpec | |
Fields
|
type ProgramName = String Source #
type PackageVersion = String Source #
type VersionString = String Source #
Constructors
Instances
Generic Journal | |
Eq Journal | |
Anon Journal Source # | |
type Rep Journal | |
Defined in Hledger.Data.Types type Rep Journal = D1 ('MetaData "Journal" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "Journal" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "jparsedefaultyear") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Year)) :*: (S1 ('MetaSel ('Just "jparsedefaultcommodity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (CommoditySymbol, AmountStyle))) :*: S1 ('MetaSel ('Just "jparsedecimalmark") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe DecimalMark)))) :*: (S1 ('MetaSel ('Just "jparseparentaccounts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [AccountName]) :*: (S1 ('MetaSel ('Just "jparsealiases") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [AccountAlias]) :*: S1 ('MetaSel ('Just "jparsetimeclockentries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TimeclockEntry])))) :*: ((S1 ('MetaSel ('Just "jincludefilestack") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: (S1 ('MetaSel ('Just "jdeclaredpayees") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Payee, PayeeDeclarationInfo)]) :*: S1 ('MetaSel ('Just "jdeclaredtags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(TagName, TagDeclarationInfo)]))) :*: (S1 ('MetaSel ('Just "jdeclaredaccounts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(AccountName, AccountDeclarationInfo)]) :*: (S1 ('MetaSel ('Just "jdeclaredaccounttags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map AccountName [Tag])) :*: S1 ('MetaSel ('Just "jdeclaredaccounttypes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map AccountType [AccountName])))))) :*: (((S1 ('MetaSel ('Just "jaccounttypes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map AccountName AccountType)) :*: (S1 ('MetaSel ('Just "jglobalcommoditystyles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map CommoditySymbol AmountStyle)) :*: S1 ('MetaSel ('Just "jcommodities") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map CommoditySymbol Commodity)))) :*: (S1 ('MetaSel ('Just "jinferredcommodities") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map CommoditySymbol AmountStyle)) :*: (S1 ('MetaSel ('Just "jpricedirectives") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [PriceDirective]) :*: S1 ('MetaSel ('Just "jinferredmarketprices") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [MarketPrice])))) :*: ((S1 ('MetaSel ('Just "jtxnmodifiers") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TransactionModifier]) :*: (S1 ('MetaSel ('Just "jperiodictxns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [PeriodicTransaction]) :*: S1 ('MetaSel ('Just "jtxns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Transaction]))) :*: (S1 ('MetaSel ('Just "jfinalcommentlines") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "jfiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(FilePath, Text)]) :*: S1 ('MetaSel ('Just "jlastreadtime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 POSIXTime))))))) |
Constructors
Posting | |
Fields
|
Instances
Generic Posting | |
Show Posting | |
Eq Posting | |
Anon Posting Source # | |
type Rep Posting | |
Defined in Hledger.Data.Types type Rep Posting = D1 ('MetaData "Posting" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "Posting" 'PrefixI 'True) (((S1 ('MetaSel ('Just "pdate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Day)) :*: S1 ('MetaSel ('Just "pdate2") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Day))) :*: (S1 ('MetaSel ('Just "pstatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Status) :*: (S1 ('MetaSel ('Just "paccount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AccountName) :*: S1 ('MetaSel ('Just "pamount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MixedAmount)))) :*: ((S1 ('MetaSel ('Just "pcomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "ptype") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PostingType) :*: S1 ('MetaSel ('Just "ptags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Tag]))) :*: (S1 ('MetaSel ('Just "pbalanceassertion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe BalanceAssertion)) :*: (S1 ('MetaSel ('Just "ptransaction") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Transaction)) :*: S1 ('MetaSel ('Just "poriginal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Posting))))))) |
data Transaction #
Constructors
Transaction | |
Instances
Generic Transaction | |
Defined in Hledger.Data.Types Associated Types type Rep Transaction :: Type -> Type | |
Show Transaction | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> Transaction -> ShowS show :: Transaction -> String showList :: [Transaction] -> ShowS | |
Eq Transaction | |
Defined in Hledger.Data.Types | |
Anon Transaction Source # | |
Defined in Hledger.Cli.Anon Methods anon :: Transaction -> Transaction Source # | |
type Rep Transaction | |
Defined in Hledger.Data.Types type Rep Transaction = D1 ('MetaData "Transaction" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "Transaction" 'PrefixI 'True) (((S1 ('MetaSel ('Just "tindex") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer) :*: S1 ('MetaSel ('Just "tprecedingcomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "tsourcepos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SourcePos, SourcePos)) :*: (S1 ('MetaSel ('Just "tdate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day) :*: S1 ('MetaSel ('Just "tdate2") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Day))))) :*: ((S1 ('MetaSel ('Just "tstatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Status) :*: (S1 ('MetaSel ('Just "tcode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "tdescription") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))) :*: (S1 ('MetaSel ('Just "tcomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "ttags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Tag]) :*: S1 ('MetaSel ('Just "tpostings") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Posting])))))) |
type AccountName = Text #
class Monad m => MonadFail (m :: Type -> Type) where #
Instances
class Applicative f => Alternative (f :: Type -> Type) where #
Instances
class (Alternative m, Monad m) => MonadPlus (m :: Type -> Type) where #
Minimal complete definition
Nothing
Instances
Minimal complete definition
Instances
PrintfArg Int16 | |
Defined in Text.Printf | |
PrintfArg Int32 | |
Defined in Text.Printf | |
PrintfArg Int64 | |
Defined in Text.Printf | |
PrintfArg Int8 | |
Defined in Text.Printf | |
PrintfArg Word16 | |
Defined in Text.Printf | |
PrintfArg Word32 | |
Defined in Text.Printf | |
PrintfArg Word64 | |
Defined in Text.Printf | |
PrintfArg Word8 | |
Defined in Text.Printf | |
PrintfArg ShortText | |
Defined in Data.Text.Short.Internal | |
PrintfArg Integer | |
Defined in Text.Printf | |
PrintfArg Natural | |
Defined in Text.Printf | |
PrintfArg Char | |
Defined in Text.Printf | |
PrintfArg Double | |
Defined in Text.Printf | |
PrintfArg Float | |
Defined in Text.Printf | |
PrintfArg Int | |
Defined in Text.Printf | |
PrintfArg Word | |
Defined in Text.Printf | |
IsChar c => PrintfArg [c] | |
Defined in Text.Printf |
type FieldFormatter = FieldFormat -> ShowS #
data FieldFormat #
Constructors
FieldFormat | |
Fields
|
type ModifierParser = String -> FormatParse #
data FormatParse #
Constructors
FormatParse | |
Fields
|
type HasCallStack = ?callStack :: CallStack #
data AmountDisplayOpts #
Constructors
AmountDisplayOpts | |
Fields
|
Instances
Show AmountDisplayOpts | |
Defined in Hledger.Data.Amount Methods showsPrec :: Int -> AmountDisplayOpts -> ShowS show :: AmountDisplayOpts -> String showList :: [AmountDisplayOpts] -> ShowS | |
Default AmountDisplayOpts | |
Defined in Hledger.Data.Amount Methods |
data BalancingOpts #
Constructors
BalancingOpts | |
Fields
|
Instances
Show BalancingOpts | |
Defined in Hledger.Data.Balancing Methods showsPrec :: Int -> BalancingOpts -> ShowS show :: BalancingOpts -> String showList :: [BalancingOpts] -> ShowS | |
HasBalancingOpts BalancingOpts | |
Defined in Hledger.Data.Balancing Methods balancingOpts :: Lens' BalancingOpts BalancingOpts # commodity_styles :: Lens' BalancingOpts (Maybe (Map CommoditySymbol AmountStyle)) # ignore_assertions :: Lens' BalancingOpts Bool # infer_balancing_costs :: Lens' BalancingOpts Bool # |
class HasBalancingOpts c where #
Minimal complete definition
Methods
balancingOpts :: Lens' c BalancingOpts #
commodity_styles :: Lens' c (Maybe (Map CommoditySymbol AmountStyle)) #
ignore_assertions :: Lens' c Bool #
infer_balancing_costs :: Lens' c Bool #
Instances
HasBalancingOpts CliOpts Source # | |
Defined in Hledger.Cli.CliOptions Methods balancingOpts :: Lens' CliOpts BalancingOpts # commodity_styles :: Lens' CliOpts (Maybe (Map CommoditySymbol AmountStyle)) # ignore_assertions :: Lens' CliOpts Bool # infer_balancing_costs :: Lens' CliOpts Bool # | |
HasBalancingOpts BalancingOpts | |
Defined in Hledger.Data.Balancing Methods balancingOpts :: Lens' BalancingOpts BalancingOpts # commodity_styles :: Lens' BalancingOpts (Maybe (Map CommoditySymbol AmountStyle)) # ignore_assertions :: Lens' BalancingOpts Bool # infer_balancing_costs :: Lens' BalancingOpts Bool # | |
HasBalancingOpts InputOpts | |
Defined in Hledger.Read.InputOptions Methods balancingOpts :: Lens' InputOpts BalancingOpts # commodity_styles :: Lens' InputOpts (Maybe (Map CommoditySymbol AmountStyle)) # ignore_assertions :: Lens' InputOpts Bool # infer_balancing_costs :: Lens' InputOpts Bool # |
type ErroringJournalParser (m :: Type -> Type) a = StateT Journal (ParsecT HledgerParseErrorData Text (ExceptT FinalParseError m)) a #
type JournalParser (m :: Type -> Type) a = StateT Journal (ParsecT HledgerParseErrorData Text m) a #
data ReportItemField #
Constructors
AccountField | |
DefaultDateField | |
DescriptionField | |
TotalField | |
DepthSpacerField | |
FieldNo Int |
Instances
Show ReportItemField | |
Defined in Hledger.Data.StringFormat Methods showsPrec :: Int -> ReportItemField -> ShowS show :: ReportItemField -> String showList :: [ReportItemField] -> ShowS | |
Eq ReportItemField | |
Defined in Hledger.Data.StringFormat Methods (==) :: ReportItemField -> ReportItemField -> Bool (/=) :: ReportItemField -> ReportItemField -> Bool |
data StringFormat #
Constructors
OneLine [StringFormatComponent] | |
TopAligned [StringFormatComponent] | |
BottomAligned [StringFormatComponent] |
Instances
Show StringFormat | |
Defined in Hledger.Data.StringFormat Methods showsPrec :: Int -> StringFormat -> ShowS show :: StringFormat -> String showList :: [StringFormat] -> ShowS | |
Default StringFormat | |
Defined in Hledger.Data.StringFormat Methods def :: StringFormat | |
Eq StringFormat | |
Defined in Hledger.Data.StringFormat |
data StringFormatComponent #
Constructors
FormatLiteral Text | |
FormatField Bool (Maybe Int) (Maybe Int) ReportItemField |
Instances
Show StringFormatComponent | |
Defined in Hledger.Data.StringFormat Methods showsPrec :: Int -> StringFormatComponent -> ShowS show :: StringFormatComponent -> String showList :: [StringFormatComponent] -> ShowS | |
Eq StringFormatComponent | |
Defined in Hledger.Data.StringFormat Methods (==) :: StringFormatComponent -> StringFormatComponent -> Bool (/=) :: StringFormatComponent -> StringFormatComponent -> Bool |
Constructors
Account | |
Fields
|
Instances
Generic Account | |
type Rep Account | |
Defined in Hledger.Data.Types type Rep Account = D1 ('MetaData "Account" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "Account" 'PrefixI 'True) (((S1 ('MetaSel ('Just "aname") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AccountName) :*: S1 ('MetaSel ('Just "adeclarationinfo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe AccountDeclarationInfo))) :*: (S1 ('MetaSel ('Just "asubs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Account]) :*: S1 ('MetaSel ('Just "aparent") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Account)))) :*: ((S1 ('MetaSel ('Just "aboring") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "anumpostings") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :*: (S1 ('MetaSel ('Just "aebalance") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MixedAmount) :*: S1 ('MetaSel ('Just "aibalance") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MixedAmount))))) |
data AccountAlias #
Constructors
BasicAlias AccountName AccountName | |
RegexAlias Regexp Replacement |
Instances
Generic AccountAlias | |
Defined in Hledger.Data.Types Associated Types type Rep AccountAlias :: Type -> Type | |
Read AccountAlias | |
Defined in Hledger.Data.Types Methods readsPrec :: Int -> ReadS AccountAlias readList :: ReadS [AccountAlias] readPrec :: ReadPrec AccountAlias readListPrec :: ReadPrec [AccountAlias] | |
Show AccountAlias | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> AccountAlias -> ShowS show :: AccountAlias -> String showList :: [AccountAlias] -> ShowS | |
Eq AccountAlias | |
Defined in Hledger.Data.Types | |
Ord AccountAlias | |
Defined in Hledger.Data.Types Methods compare :: AccountAlias -> AccountAlias -> Ordering # (<) :: AccountAlias -> AccountAlias -> Bool # (<=) :: AccountAlias -> AccountAlias -> Bool # (>) :: AccountAlias -> AccountAlias -> Bool # (>=) :: AccountAlias -> AccountAlias -> Bool # max :: AccountAlias -> AccountAlias -> AccountAlias # min :: AccountAlias -> AccountAlias -> AccountAlias # | |
type Rep AccountAlias | |
Defined in Hledger.Data.Types type Rep AccountAlias = D1 ('MetaData "AccountAlias" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "BasicAlias" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AccountName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AccountName)) :+: C1 ('MetaCons "RegexAlias" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Regexp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Replacement))) |
data AccountDeclarationInfo #
Constructors
AccountDeclarationInfo | |
Fields
|
Instances
Generic AccountDeclarationInfo | |
Defined in Hledger.Data.Types Associated Types type Rep AccountDeclarationInfo :: Type -> Type Methods from :: AccountDeclarationInfo -> Rep AccountDeclarationInfo x to :: Rep AccountDeclarationInfo x -> AccountDeclarationInfo | |
Show AccountDeclarationInfo | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> AccountDeclarationInfo -> ShowS show :: AccountDeclarationInfo -> String showList :: [AccountDeclarationInfo] -> ShowS | |
Eq AccountDeclarationInfo | |
Defined in Hledger.Data.Types Methods (==) :: AccountDeclarationInfo -> AccountDeclarationInfo -> Bool (/=) :: AccountDeclarationInfo -> AccountDeclarationInfo -> Bool | |
type Rep AccountDeclarationInfo | |
Defined in Hledger.Data.Types type Rep AccountDeclarationInfo = D1 ('MetaData "AccountDeclarationInfo" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "AccountDeclarationInfo" 'PrefixI 'True) ((S1 ('MetaSel ('Just "adicomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "aditags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Tag])) :*: (S1 ('MetaSel ('Just "adideclarationorder") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "adisourcepos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourcePos)))) |
data AccountType #
Instances
Generic AccountType | |
Defined in Hledger.Data.Types Associated Types type Rep AccountType :: Type -> Type | |
Show AccountType | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> AccountType -> ShowS show :: AccountType -> String showList :: [AccountType] -> ShowS | |
Eq AccountType | |
Defined in Hledger.Data.Types | |
Ord AccountType | |
Defined in Hledger.Data.Types Methods compare :: AccountType -> AccountType -> Ordering # (<) :: AccountType -> AccountType -> Bool # (<=) :: AccountType -> AccountType -> Bool # (>) :: AccountType -> AccountType -> Bool # (>=) :: AccountType -> AccountType -> Bool # max :: AccountType -> AccountType -> AccountType # min :: AccountType -> AccountType -> AccountType # | |
type Rep AccountType | |
Defined in Hledger.Data.Types type Rep AccountType = D1 ('MetaData "AccountType" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) ((C1 ('MetaCons "Asset" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Liability" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Equity" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Revenue" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Expense" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Cash" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Conversion" 'PrefixI 'False) (U1 :: Type -> Type)))) |
Constructors
Amount | |
Fields
|
Instances
Generic Amount | |
Show Amount | |
Eq Amount | |
Ord Amount | |
type Rep Amount | |
Defined in Hledger.Data.Types type Rep Amount = D1 ('MetaData "Amount" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "Amount" 'PrefixI 'True) ((S1 ('MetaSel ('Just "acommodity") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 CommoditySymbol) :*: S1 ('MetaSel ('Just "aquantity") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Quantity)) :*: (S1 ('MetaSel ('Just "astyle") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 AmountStyle) :*: S1 ('MetaSel ('Just "aprice") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe AmountPrice))))) |
data AmountPrecision #
Constructors
Precision !Word8 | |
NaturalPrecision |
Instances
data AmountPrice #
Constructors
UnitPrice !Amount | |
TotalPrice !Amount |
Instances
Generic AmountPrice | |
Defined in Hledger.Data.Types Associated Types type Rep AmountPrice :: Type -> Type | |
Show AmountPrice | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> AmountPrice -> ShowS show :: AmountPrice -> String showList :: [AmountPrice] -> ShowS | |
Eq AmountPrice | |
Defined in Hledger.Data.Types | |
Ord AmountPrice | |
Defined in Hledger.Data.Types Methods compare :: AmountPrice -> AmountPrice -> Ordering # (<) :: AmountPrice -> AmountPrice -> Bool # (<=) :: AmountPrice -> AmountPrice -> Bool # (>) :: AmountPrice -> AmountPrice -> Bool # (>=) :: AmountPrice -> AmountPrice -> Bool # max :: AmountPrice -> AmountPrice -> AmountPrice # min :: AmountPrice -> AmountPrice -> AmountPrice # | |
type Rep AmountPrice | |
Defined in Hledger.Data.Types type Rep AmountPrice = D1 ('MetaData "AmountPrice" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "UnitPrice" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Amount)) :+: C1 ('MetaCons "TotalPrice" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Amount))) |
data AmountStyle #
Constructors
AmountStyle | |
Fields
|
Instances
Generic AmountStyle | |
Defined in Hledger.Data.Types Associated Types type Rep AmountStyle :: Type -> Type | |
Read AmountStyle | |
Defined in Hledger.Data.Types Methods readsPrec :: Int -> ReadS AmountStyle readList :: ReadS [AmountStyle] readPrec :: ReadPrec AmountStyle readListPrec :: ReadPrec [AmountStyle] | |
Show AmountStyle | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> AmountStyle -> ShowS show :: AmountStyle -> String showList :: [AmountStyle] -> ShowS | |
Eq AmountStyle | |
Defined in Hledger.Data.Types | |
Ord AmountStyle | |
Defined in Hledger.Data.Types Methods compare :: AmountStyle -> AmountStyle -> Ordering # (<) :: AmountStyle -> AmountStyle -> Bool # (<=) :: AmountStyle -> AmountStyle -> Bool # (>) :: AmountStyle -> AmountStyle -> Bool # (>=) :: AmountStyle -> AmountStyle -> Bool # max :: AmountStyle -> AmountStyle -> AmountStyle # min :: AmountStyle -> AmountStyle -> AmountStyle # | |
type Rep AmountStyle | |
Defined in Hledger.Data.Types type Rep AmountStyle = D1 ('MetaData "AmountStyle" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "AmountStyle" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ascommodityside") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Side) :*: (S1 ('MetaSel ('Just "ascommodityspaced") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bool) :*: S1 ('MetaSel ('Just "asdigitgroups") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe DigitGroupStyle)))) :*: (S1 ('MetaSel ('Just "asdecimalmark") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Char)) :*: (S1 ('MetaSel ('Just "asprecision") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 AmountPrecision) :*: S1 ('MetaSel ('Just "asrounding") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Rounding))))) |
data BalanceAssertion #
Constructors
BalanceAssertion | |
Fields
|
Instances
Generic BalanceAssertion | |
Defined in Hledger.Data.Types Associated Types type Rep BalanceAssertion :: Type -> Type Methods from :: BalanceAssertion -> Rep BalanceAssertion x to :: Rep BalanceAssertion x -> BalanceAssertion | |
Show BalanceAssertion | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> BalanceAssertion -> ShowS show :: BalanceAssertion -> String showList :: [BalanceAssertion] -> ShowS | |
Eq BalanceAssertion | |
Defined in Hledger.Data.Types Methods (==) :: BalanceAssertion -> BalanceAssertion -> Bool (/=) :: BalanceAssertion -> BalanceAssertion -> Bool | |
type Rep BalanceAssertion | |
Defined in Hledger.Data.Types type Rep BalanceAssertion = D1 ('MetaData "BalanceAssertion" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "BalanceAssertion" 'PrefixI 'True) ((S1 ('MetaSel ('Just "baamount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Amount) :*: S1 ('MetaSel ('Just "batotal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "bainclusive") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "baposition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourcePos)))) |
Constructors
Commodity | |
Fields |
Instances
Generic Commodity | |
Show Commodity | |
Eq Commodity | |
type Rep Commodity | |
Defined in Hledger.Data.Types type Rep Commodity = D1 ('MetaData "Commodity" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "Commodity" 'PrefixI 'True) (S1 ('MetaSel ('Just "csymbol") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CommoditySymbol) :*: S1 ('MetaSel ('Just "cformat") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe AmountStyle)))) |
type CommoditySymbol = Text #
Instances
Generic DateSpan | |
Default DateSpan | |
Defined in Hledger.Data.Types | |
Eq DateSpan | |
Ord DateSpan | |
Defined in Hledger.Data.Types | |
type Rep DateSpan | |
Defined in Hledger.Data.Types type Rep DateSpan = D1 ('MetaData "DateSpan" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "DateSpan" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe EFDay)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe EFDay)))) |
type DayOfMonth = Int #
type DecimalMark = Char #
data DigitGroupStyle #
Constructors
DigitGroups !Char ![Word8] |
Instances
Instances
Generic EFDay | |
Show EFDay | |
Eq EFDay | |
Ord EFDay | |
type Rep EFDay | |
Defined in Hledger.Data.Types type Rep EFDay = D1 ('MetaData "EFDay" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "Exact" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day)) :+: C1 ('MetaCons "Flex" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day))) |
class HasAmounts a where #
Methods
styleAmounts :: Map CommoditySymbol AmountStyle -> a -> a #
Instances
Constructors
NoInterval | |
Days Int | |
Weeks Int | |
Months Int | |
Quarters Int | |
Years Int | |
DayOfMonth Int | |
WeekdayOfMonth Int Int | |
DaysOfWeek [Int] | |
DayOfYear Int Int |
Instances
Generic Interval | |
Show Interval | |
Default Interval | |
Defined in Hledger.Data.Types | |
Eq Interval | |
Ord Interval | |
Defined in Hledger.Data.Types | |
type Rep Interval | |
Defined in Hledger.Data.Types type Rep Interval = D1 ('MetaData "Interval" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (((C1 ('MetaCons "NoInterval" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Days" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :+: (C1 ('MetaCons "Weeks" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :+: (C1 ('MetaCons "Months" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :+: C1 ('MetaCons "Quarters" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))))) :+: ((C1 ('MetaCons "Years" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :+: C1 ('MetaCons "DayOfMonth" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :+: (C1 ('MetaCons "WeekdayOfMonth" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :+: (C1 ('MetaCons "DaysOfWeek" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Int])) :+: C1 ('MetaCons "DayOfYear" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))))) |
Instances
Generic Ledger | |
type Rep Ledger | |
Defined in Hledger.Data.Types type Rep Ledger = D1 ('MetaData "Ledger" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "Ledger" 'PrefixI 'True) (S1 ('MetaSel ('Just "ljournal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Journal) :*: S1 ('MetaSel ('Just "laccounts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Account]))) |
data MarketPrice #
Constructors
MarketPrice | |
Fields
|
Instances
Generic MarketPrice | |
Defined in Hledger.Data.Types Associated Types type Rep MarketPrice :: Type -> Type | |
Show MarketPrice | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> MarketPrice -> ShowS show :: MarketPrice -> String showList :: [MarketPrice] -> ShowS | |
Eq MarketPrice | |
Defined in Hledger.Data.Types | |
Ord MarketPrice | |
Defined in Hledger.Data.Types Methods compare :: MarketPrice -> MarketPrice -> Ordering # (<) :: MarketPrice -> MarketPrice -> Bool # (<=) :: MarketPrice -> MarketPrice -> Bool # (>) :: MarketPrice -> MarketPrice -> Bool # (>=) :: MarketPrice -> MarketPrice -> Bool # max :: MarketPrice -> MarketPrice -> MarketPrice # min :: MarketPrice -> MarketPrice -> MarketPrice # | |
type Rep MarketPrice | |
Defined in Hledger.Data.Types type Rep MarketPrice = D1 ('MetaData "MarketPrice" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "MarketPrice" 'PrefixI 'True) ((S1 ('MetaSel ('Just "mpdate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day) :*: S1 ('MetaSel ('Just "mpfrom") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CommoditySymbol)) :*: (S1 ('MetaSel ('Just "mpto") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CommoditySymbol) :*: S1 ('MetaSel ('Just "mprate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Quantity)))) |
data MixedAmount #
Instances
Generic MixedAmount | |
Defined in Hledger.Data.Types Associated Types type Rep MixedAmount :: Type -> Type | |
Show MixedAmount | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> MixedAmount -> ShowS show :: MixedAmount -> String showList :: [MixedAmount] -> ShowS | |
Eq MixedAmount | |
Defined in Hledger.Data.Types | |
Ord MixedAmount | |
Defined in Hledger.Data.Types Methods compare :: MixedAmount -> MixedAmount -> Ordering # (<) :: MixedAmount -> MixedAmount -> Bool # (<=) :: MixedAmount -> MixedAmount -> Bool # (>) :: MixedAmount -> MixedAmount -> Bool # (>=) :: MixedAmount -> MixedAmount -> Bool # max :: MixedAmount -> MixedAmount -> MixedAmount # min :: MixedAmount -> MixedAmount -> MixedAmount # | |
type Rep MixedAmount | |
Defined in Hledger.Data.Types type Rep MixedAmount = D1 ('MetaData "MixedAmount" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'True) (C1 ('MetaCons "Mixed" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map MixedAmountKey Amount)))) |
data NormalSign #
Constructors
NormallyPositive | |
NormallyNegative |
Instances
Show NormalSign | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> NormalSign -> ShowS show :: NormalSign -> String showList :: [NormalSign] -> ShowS | |
Eq NormalSign | |
Defined in Hledger.Data.Types |
type ParsedJournal = Journal #
data PayeeDeclarationInfo #
Constructors
PayeeDeclarationInfo | |
Fields
|
Instances
Generic PayeeDeclarationInfo | |
Defined in Hledger.Data.Types Associated Types type Rep PayeeDeclarationInfo :: Type -> Type Methods from :: PayeeDeclarationInfo -> Rep PayeeDeclarationInfo x to :: Rep PayeeDeclarationInfo x -> PayeeDeclarationInfo | |
Show PayeeDeclarationInfo | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> PayeeDeclarationInfo -> ShowS show :: PayeeDeclarationInfo -> String showList :: [PayeeDeclarationInfo] -> ShowS | |
Eq PayeeDeclarationInfo | |
Defined in Hledger.Data.Types Methods (==) :: PayeeDeclarationInfo -> PayeeDeclarationInfo -> Bool (/=) :: PayeeDeclarationInfo -> PayeeDeclarationInfo -> Bool | |
type Rep PayeeDeclarationInfo | |
Defined in Hledger.Data.Types type Rep PayeeDeclarationInfo = D1 ('MetaData "PayeeDeclarationInfo" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "PayeeDeclarationInfo" 'PrefixI 'True) (S1 ('MetaSel ('Just "pdicomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "pditags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Tag]))) |
Constructors
DayPeriod Day | |
WeekPeriod Day | |
MonthPeriod Year Month | |
QuarterPeriod Year Quarter | |
YearPeriod Year | |
PeriodBetween Day Day | |
PeriodFrom Day | |
PeriodTo Day | |
PeriodAll |
Instances
Generic Period | |
Show Period | |
Default Period | |
Defined in Hledger.Data.Types | |
Eq Period | |
Ord Period | |
type Rep Period | |
Defined in Hledger.Data.Types type Rep Period = D1 ('MetaData "Period" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (((C1 ('MetaCons "DayPeriod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day)) :+: C1 ('MetaCons "WeekPeriod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day))) :+: (C1 ('MetaCons "MonthPeriod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Year) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Month)) :+: C1 ('MetaCons "QuarterPeriod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Year) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Quarter)))) :+: ((C1 ('MetaCons "YearPeriod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Year)) :+: C1 ('MetaCons "PeriodBetween" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day))) :+: (C1 ('MetaCons "PeriodFrom" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day)) :+: (C1 ('MetaCons "PeriodTo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day)) :+: C1 ('MetaCons "PeriodAll" 'PrefixI 'False) (U1 :: Type -> Type))))) |
data PeriodicTransaction #
Constructors
PeriodicTransaction | |
Fields
|
Instances
Generic PeriodicTransaction | |
Defined in Hledger.Data.Types Associated Types type Rep PeriodicTransaction :: Type -> Type Methods from :: PeriodicTransaction -> Rep PeriodicTransaction x to :: Rep PeriodicTransaction x -> PeriodicTransaction | |
Eq PeriodicTransaction | |
Defined in Hledger.Data.Types Methods (==) :: PeriodicTransaction -> PeriodicTransaction -> Bool (/=) :: PeriodicTransaction -> PeriodicTransaction -> Bool | |
type Rep PeriodicTransaction | |
Defined in Hledger.Data.Types type Rep PeriodicTransaction = D1 ('MetaData "PeriodicTransaction" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "PeriodicTransaction" 'PrefixI 'True) (((S1 ('MetaSel ('Just "ptperiodexpr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "ptinterval") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Interval)) :*: (S1 ('MetaSel ('Just "ptspan") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DateSpan) :*: (S1 ('MetaSel ('Just "ptsourcepos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SourcePos, SourcePos)) :*: S1 ('MetaSel ('Just "ptstatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Status)))) :*: ((S1 ('MetaSel ('Just "ptcode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "ptdescription") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "ptcomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "pttags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Tag]) :*: S1 ('MetaSel ('Just "ptpostings") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Posting])))))) |
data PostingType #
Constructors
RegularPosting | |
VirtualPosting | |
BalancedVirtualPosting |
Instances
Generic PostingType | |
Defined in Hledger.Data.Types Associated Types type Rep PostingType :: Type -> Type | |
Show PostingType | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> PostingType -> ShowS show :: PostingType -> String showList :: [PostingType] -> ShowS | |
Eq PostingType | |
Defined in Hledger.Data.Types | |
type Rep PostingType | |
Defined in Hledger.Data.Types type Rep PostingType = D1 ('MetaData "PostingType" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "RegularPosting" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "VirtualPosting" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BalancedVirtualPosting" 'PrefixI 'False) (U1 :: Type -> Type))) |
data PriceDirective #
Constructors
PriceDirective | |
Fields
|
Instances
Generic PriceDirective | |
Defined in Hledger.Data.Types Associated Types type Rep PriceDirective :: Type -> Type | |
Show PriceDirective | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> PriceDirective -> ShowS show :: PriceDirective -> String showList :: [PriceDirective] -> ShowS | |
Eq PriceDirective | |
Defined in Hledger.Data.Types Methods (==) :: PriceDirective -> PriceDirective -> Bool (/=) :: PriceDirective -> PriceDirective -> Bool | |
Ord PriceDirective | |
Defined in Hledger.Data.Types Methods compare :: PriceDirective -> PriceDirective -> Ordering # (<) :: PriceDirective -> PriceDirective -> Bool # (<=) :: PriceDirective -> PriceDirective -> Bool # (>) :: PriceDirective -> PriceDirective -> Bool # (>=) :: PriceDirective -> PriceDirective -> Bool # max :: PriceDirective -> PriceDirective -> PriceDirective # min :: PriceDirective -> PriceDirective -> PriceDirective # | |
HasAmounts PriceDirective Source # | |
Defined in Hledger.Cli.Commands.Prices Methods styleAmounts :: Map CommoditySymbol AmountStyle -> PriceDirective -> PriceDirective # | |
type Rep PriceDirective | |
Defined in Hledger.Data.Types type Rep PriceDirective = D1 ('MetaData "PriceDirective" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "PriceDirective" 'PrefixI 'True) (S1 ('MetaSel ('Just "pddate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day) :*: (S1 ('MetaSel ('Just "pdcommodity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CommoditySymbol) :*: S1 ('MetaSel ('Just "pdamount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Amount)))) |
Constructors
NoRounding | |
SoftRounding | |
HardRounding | |
AllRounding |
Instances
Generic Rounding | |
Read Rounding | |
Defined in Hledger.Data.Types | |
Show Rounding | |
Eq Rounding | |
Ord Rounding | |
Defined in Hledger.Data.Types | |
type Rep Rounding | |
Defined in Hledger.Data.Types type Rep Rounding = D1 ('MetaData "Rounding" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) ((C1 ('MetaCons "NoRounding" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SoftRounding" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "HardRounding" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AllRounding" 'PrefixI 'False) (U1 :: Type -> Type))) |
Instances
Generic Side | |
Read Side | |
Defined in Hledger.Data.Types | |
Show Side | |
Eq Side | |
Ord Side | |
type Rep Side | |
Defined in Hledger.Data.Types type Rep Side = D1 ('MetaData "Side" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "L" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "R" 'PrefixI 'False) (U1 :: Type -> Type)) |
Constructors
SmartCompleteDate Day | |
SmartAssumeStart Year (Maybe Month) | |
SmartFromReference (Maybe Month) MonthDay | |
SmartMonth Month | |
SmartRelative Integer SmartInterval |
data SmartInterval #
Instances
Show SmartInterval | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> SmartInterval -> ShowS show :: SmartInterval -> String showList :: [SmartInterval] -> ShowS |
Instances
Bounded Status | |
Defined in Hledger.Data.Types | |
Enum Status | |
Defined in Hledger.Data.Types | |
Generic Status | |
Show Status | |
Eq Status | |
Ord Status | |
type Rep Status | |
Defined in Hledger.Data.Types type Rep Status = D1 ('MetaData "Status" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "Unmarked" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Pending" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Cleared" 'PrefixI 'False) (U1 :: Type -> Type))) |
type StorageFormat = String #
data TMPostingRule #
Constructors
TMPostingRule | |
Fields
|
Instances
Generic TMPostingRule | |
Defined in Hledger.Data.Types Associated Types type Rep TMPostingRule :: Type -> Type | |
Show TMPostingRule | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> TMPostingRule -> ShowS show :: TMPostingRule -> String showList :: [TMPostingRule] -> ShowS | |
Eq TMPostingRule | |
Defined in Hledger.Data.Types | |
type Rep TMPostingRule | |
Defined in Hledger.Data.Types type Rep TMPostingRule = D1 ('MetaData "TMPostingRule" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "TMPostingRule" 'PrefixI 'True) (S1 ('MetaSel ('Just "tmprPosting") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Posting) :*: S1 ('MetaSel ('Just "tmprIsMultiplier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) |
newtype TagDeclarationInfo #
Constructors
TagDeclarationInfo | |
Fields
|
Instances
Generic TagDeclarationInfo | |
Defined in Hledger.Data.Types Associated Types type Rep TagDeclarationInfo :: Type -> Type Methods from :: TagDeclarationInfo -> Rep TagDeclarationInfo x to :: Rep TagDeclarationInfo x -> TagDeclarationInfo | |
Show TagDeclarationInfo | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> TagDeclarationInfo -> ShowS show :: TagDeclarationInfo -> String showList :: [TagDeclarationInfo] -> ShowS | |
Eq TagDeclarationInfo | |
Defined in Hledger.Data.Types Methods (==) :: TagDeclarationInfo -> TagDeclarationInfo -> Bool (/=) :: TagDeclarationInfo -> TagDeclarationInfo -> Bool | |
type Rep TagDeclarationInfo | |
Defined in Hledger.Data.Types type Rep TagDeclarationInfo = D1 ('MetaData "TagDeclarationInfo" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'True) (C1 ('MetaCons "TagDeclarationInfo" 'PrefixI 'True) (S1 ('MetaSel ('Just "tdicomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))) |
data TimeclockCode #
Constructors
SetBalance | |
SetRequiredHours | |
In | |
Out | |
FinalOut |
Instances
Generic TimeclockCode | |
Defined in Hledger.Data.Types Associated Types type Rep TimeclockCode :: Type -> Type | |
Eq TimeclockCode | |
Defined in Hledger.Data.Types | |
Ord TimeclockCode | |
Defined in Hledger.Data.Types Methods compare :: TimeclockCode -> TimeclockCode -> Ordering # (<) :: TimeclockCode -> TimeclockCode -> Bool # (<=) :: TimeclockCode -> TimeclockCode -> Bool # (>) :: TimeclockCode -> TimeclockCode -> Bool # (>=) :: TimeclockCode -> TimeclockCode -> Bool # max :: TimeclockCode -> TimeclockCode -> TimeclockCode # min :: TimeclockCode -> TimeclockCode -> TimeclockCode # | |
type Rep TimeclockCode | |
Defined in Hledger.Data.Types type Rep TimeclockCode = D1 ('MetaData "TimeclockCode" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) ((C1 ('MetaCons "SetBalance" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SetRequiredHours" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "In" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Out" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FinalOut" 'PrefixI 'False) (U1 :: Type -> Type)))) |
data TimeclockEntry #
Constructors
TimeclockEntry | |
Fields
|
Instances
Generic TimeclockEntry | |
Defined in Hledger.Data.Types Associated Types type Rep TimeclockEntry :: Type -> Type | |
Eq TimeclockEntry | |
Defined in Hledger.Data.Types Methods (==) :: TimeclockEntry -> TimeclockEntry -> Bool (/=) :: TimeclockEntry -> TimeclockEntry -> Bool | |
Ord TimeclockEntry | |
Defined in Hledger.Data.Types Methods compare :: TimeclockEntry -> TimeclockEntry -> Ordering # (<) :: TimeclockEntry -> TimeclockEntry -> Bool # (<=) :: TimeclockEntry -> TimeclockEntry -> Bool # (>) :: TimeclockEntry -> TimeclockEntry -> Bool # (>=) :: TimeclockEntry -> TimeclockEntry -> Bool # max :: TimeclockEntry -> TimeclockEntry -> TimeclockEntry # min :: TimeclockEntry -> TimeclockEntry -> TimeclockEntry # | |
type Rep TimeclockEntry | |
Defined in Hledger.Data.Types type Rep TimeclockEntry = D1 ('MetaData "TimeclockEntry" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "TimeclockEntry" 'PrefixI 'True) ((S1 ('MetaSel ('Just "tlsourcepos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourcePos) :*: (S1 ('MetaSel ('Just "tlcode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TimeclockCode) :*: S1 ('MetaSel ('Just "tldatetime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LocalTime))) :*: ((S1 ('MetaSel ('Just "tlaccount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AccountName) :*: S1 ('MetaSel ('Just "tldescription") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "tlcomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "tltags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Tag]))))) |
data TransactionModifier #
Constructors
TransactionModifier | |
Fields
|
Instances
Generic TransactionModifier | |
Defined in Hledger.Data.Types Associated Types type Rep TransactionModifier :: Type -> Type Methods from :: TransactionModifier -> Rep TransactionModifier x to :: Rep TransactionModifier x -> TransactionModifier | |
Show TransactionModifier | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> TransactionModifier -> ShowS show :: TransactionModifier -> String showList :: [TransactionModifier] -> ShowS | |
Eq TransactionModifier | |
Defined in Hledger.Data.Types Methods (==) :: TransactionModifier -> TransactionModifier -> Bool (/=) :: TransactionModifier -> TransactionModifier -> Bool | |
type Rep TransactionModifier | |
Defined in Hledger.Data.Types type Rep TransactionModifier = D1 ('MetaData "TransactionModifier" "Hledger.Data.Types" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "TransactionModifier" 'PrefixI 'True) (S1 ('MetaSel ('Just "tmquerytxt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "tmpostingrules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TMPostingRule]))) |
Constructors
PrimaryDate | |
SecondaryDate |
data ConversionOp #
Constructors
NoConversionOp | |
ToCost |
Instances
Show ConversionOp | |
Defined in Hledger.Data.Valuation Methods showsPrec :: Int -> ConversionOp -> ShowS show :: ConversionOp -> String showList :: [ConversionOp] -> ShowS | |
Eq ConversionOp | |
Defined in Hledger.Data.Valuation |
type PriceOracle = (Day, CommoditySymbol, Maybe CommoditySymbol) -> Maybe (CommoditySymbol, Quantity) #
data ValuationType #
Constructors
AtThen (Maybe CommoditySymbol) | |
AtEnd (Maybe CommoditySymbol) | |
AtNow (Maybe CommoditySymbol) | |
AtDate Day (Maybe CommoditySymbol) |
Instances
Show ValuationType | |
Defined in Hledger.Data.Valuation Methods showsPrec :: Int -> ValuationType -> ShowS show :: ValuationType -> String showList :: [ValuationType] -> ShowS | |
Eq ValuationType | |
Defined in Hledger.Data.Valuation |
Constructors
CompleteValue String | |
CompleteFile String FilePath | |
CompleteDir String FilePath |
Instances
Show Complete | |
Eq Complete | |
Ord Complete | |
Defined in System.Console.CmdArgs.Explicit.Complete |
data TimeLocale #
Constructors
TimeLocale | |
Fields
|
Instances
Show TimeLocale | |
Defined in Data.Time.Format.Locale Methods showsPrec :: Int -> TimeLocale -> ShowS show :: TimeLocale -> String showList :: [TimeLocale] -> ShowS | |
Eq TimeLocale | |
Defined in Data.Time.Format.Locale | |
Ord TimeLocale | |
Defined in Data.Time.Format.Locale Methods compare :: TimeLocale -> TimeLocale -> Ordering # (<) :: TimeLocale -> TimeLocale -> Bool # (<=) :: TimeLocale -> TimeLocale -> Bool # (>) :: TimeLocale -> TimeLocale -> Bool # (>=) :: TimeLocale -> TimeLocale -> Bool # max :: TimeLocale -> TimeLocale -> TimeLocale # min :: TimeLocale -> TimeLocale -> TimeLocale # |
Instances
Foldable Down | |
Defined in Data.Foldable Methods fold :: Monoid m => Down m -> m foldMap :: Monoid m => (a -> m) -> Down a -> m foldMap' :: Monoid m => (a -> m) -> Down a -> m foldr :: (a -> b -> b) -> b -> Down a -> b # foldr' :: (a -> b -> b) -> b -> Down a -> b foldl :: (b -> a -> b) -> b -> Down a -> b # foldl' :: (b -> a -> b) -> b -> Down a -> b # foldr1 :: (a -> a -> a) -> Down a -> a # foldl1 :: (a -> a -> a) -> Down a -> a # elem :: Eq a => a -> Down a -> Bool # maximum :: Ord a => Down a -> a # | |
Traversable Down | |
Applicative Down | |
Functor Down | |
Monad Down | |
NFData1 Down | |
Defined in Control.DeepSeq | |
Generic1 Down | |
Unbox a => Vector Vector (Down a) | |
Defined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: Mutable Vector s (Down a) -> ST s (Vector (Down a)) basicUnsafeThaw :: Vector (Down a) -> ST s (Mutable Vector s (Down a)) basicLength :: Vector (Down a) -> Int basicUnsafeSlice :: Int -> Int -> Vector (Down a) -> Vector (Down a) basicUnsafeIndexM :: Vector (Down a) -> Int -> Box (Down a) basicUnsafeCopy :: Mutable Vector s (Down a) -> Vector (Down a) -> ST s () | |
Unbox a => MVector MVector (Down a) | |
Defined in Data.Vector.Unboxed.Base Methods basicLength :: MVector s (Down a) -> Int basicUnsafeSlice :: Int -> Int -> MVector s (Down a) -> MVector s (Down a) basicOverlaps :: MVector s (Down a) -> MVector s (Down a) -> Bool basicUnsafeNew :: Int -> ST s (MVector s (Down a)) basicInitialize :: MVector s (Down a) -> ST s () basicUnsafeReplicate :: Int -> Down a -> ST s (MVector s (Down a)) basicUnsafeRead :: MVector s (Down a) -> Int -> ST s (Down a) basicUnsafeWrite :: MVector s (Down a) -> Int -> Down a -> ST s () basicClear :: MVector s (Down a) -> ST s () basicSet :: MVector s (Down a) -> Down a -> ST s () basicUnsafeCopy :: MVector s (Down a) -> MVector s (Down a) -> ST s () basicUnsafeMove :: MVector s (Down a) -> MVector s (Down a) -> ST s () basicUnsafeGrow :: MVector s (Down a) -> Int -> ST s (MVector s (Down a)) | |
Data a => Data (Down a) | |
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Down a -> c (Down a) gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Down a) dataTypeOf :: Down a -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Down a)) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Down a)) gmapT :: (forall b. Data b => b -> b) -> Down a -> Down a gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Down a -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Down a -> r gmapQ :: (forall d. Data d => d -> u) -> Down a -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> Down a -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) | |
Storable a => Storable (Down a) | |
Defined in Data.Ord Methods peekElemOff :: Ptr (Down a) -> Int -> IO (Down a) pokeElemOff :: Ptr (Down a) -> Int -> Down a -> IO () peekByteOff :: Ptr b -> Int -> IO (Down a) pokeByteOff :: Ptr b -> Int -> Down a -> IO () | |
Monoid a => Monoid (Down a) | |
Semigroup a => Semigroup (Down a) | |
Bits a => Bits (Down a) | |
Defined in Data.Ord Methods (.&.) :: Down a -> Down a -> Down a (.|.) :: Down a -> Down a -> Down a xor :: Down a -> Down a -> Down a complement :: Down a -> Down a shift :: Down a -> Int -> Down a rotate :: Down a -> Int -> Down a setBit :: Down a -> Int -> Down a clearBit :: Down a -> Int -> Down a complementBit :: Down a -> Int -> Down a testBit :: Down a -> Int -> Bool bitSizeMaybe :: Down a -> Maybe Int shiftL :: Down a -> Int -> Down a unsafeShiftL :: Down a -> Int -> Down a shiftR :: Down a -> Int -> Down a unsafeShiftR :: Down a -> Int -> Down a rotateL :: Down a -> Int -> Down a | |
FiniteBits a => FiniteBits (Down a) | |
Defined in Data.Ord Methods finiteBitSize :: Down a -> Int countLeadingZeros :: Down a -> Int countTrailingZeros :: Down a -> Int | |
Bounded a => Bounded (Down a) | |
(Enum a, Bounded a, Eq a) => Enum (Down a) | |
Floating a => Floating (Down a) | |
RealFloat a => RealFloat (Down a) | |
Defined in Data.Ord Methods floatRadix :: Down a -> Integer floatDigits :: Down a -> Int floatRange :: Down a -> (Int, Int) decodeFloat :: Down a -> (Integer, Int) encodeFloat :: Integer -> Int -> Down a significand :: Down a -> Down a scaleFloat :: Int -> Down a -> Down a isInfinite :: Down a -> Bool isDenormalized :: Down a -> Bool isNegativeZero :: Down a -> Bool | |
Generic (Down a) | |
Ix a => Ix (Down a) | |
Num a => Num (Down a) | |
Read a => Read (Down a) | |
Fractional a => Fractional (Down a) | |
Real a => Real (Down a) | |
Defined in Data.Ord Methods toRational :: Down a -> Rational | |
RealFrac a => RealFrac (Down a) | |
Show a => Show (Down a) | |
NFData a => NFData (Down a) | |
Defined in Control.DeepSeq | |
Eq a => Eq (Down a) | |
Ord a => Ord (Down a) | |
Unbox a => Unbox (Down a) | |
Defined in Data.Vector.Unboxed.Base | |
type Rep1 Down | |
Defined in GHC.Generics | |
newtype MVector s (Down a) | |
Defined in Data.Vector.Unboxed.Base | |
type Rep (Down a) | |
Defined in GHC.Generics | |
newtype Vector (Down a) | |
Defined in Data.Vector.Unboxed.Base |
data WideBuilder #
Constructors
WideBuilder | |
Instances
Monoid WideBuilder | |
Defined in Text.WideString | |
Semigroup WideBuilder | |
Defined in Text.WideString Methods (<>) :: WideBuilder -> WideBuilder -> WideBuilder sconcat :: NonEmpty WideBuilder -> WideBuilder stimes :: Integral b => b -> WideBuilder -> WideBuilder | |
Show WideBuilder | |
Defined in Text.WideString Methods showsPrec :: Int -> WideBuilder -> ShowS show :: WideBuilder -> String showList :: [WideBuilder] -> ShowS |
type TextParser (m :: Type -> Type) a = ParsecT HledgerParseErrorData Text m a #
type HledgerParseErrors = ParseErrorBundle Text HledgerParseErrorData #
data HledgerParseErrorData #
Instances
Constructors
SourcePos | |
Fields
|
Instances
Data SourcePos | |
Defined in Text.Megaparsec.Pos Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourcePos -> c SourcePos gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourcePos toConstr :: SourcePos -> Constr dataTypeOf :: SourcePos -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourcePos) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourcePos) gmapT :: (forall b. Data b => b -> b) -> SourcePos -> SourcePos gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourcePos -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourcePos -> r gmapQ :: (forall d. Data d => d -> u) -> SourcePos -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> SourcePos -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourcePos -> m SourcePos gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourcePos -> m SourcePos gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourcePos -> m SourcePos | |
Generic SourcePos | |
Read SourcePos | |
Defined in Text.Megaparsec.Pos | |
Show SourcePos | |
NFData SourcePos | |
Defined in Text.Megaparsec.Pos | |
Eq SourcePos | |
Ord SourcePos | |
type Rep SourcePos | |
Defined in Text.Megaparsec.Pos type Rep SourcePos = D1 ('MetaData "SourcePos" "Text.Megaparsec.Pos" "megaparsec-9.5.0-81q7R26puLL6FUAd1155SX" 'False) (C1 ('MetaCons "SourcePos" 'PrefixI 'True) (S1 ('MetaSel ('Just "sourceName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath) :*: (S1 ('MetaSel ('Just "sourceLine") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Pos) :*: S1 ('MetaSel ('Just "sourceColumn") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Pos)))) |
Constructors
UTCTime | |
Fields
|
Instances
FromJSON UTCTime | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSONKey UTCTime | |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON UTCTime | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding :: UTCTime -> Encoding toJSONList :: [UTCTime] -> Value toEncodingList :: [UTCTime] -> Encoding | |
ToJSONKey UTCTime | |
Defined in Data.Aeson.Types.ToJSON | |
Data UTCTime | |
Defined in Data.Time.Clock.Internal.UTCTime Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UTCTime -> c UTCTime gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UTCTime dataTypeOf :: UTCTime -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UTCTime) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UTCTime) gmapT :: (forall b. Data b => b -> b) -> UTCTime -> UTCTime gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UTCTime -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UTCTime -> r gmapQ :: (forall d. Data d => d -> u) -> UTCTime -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> UTCTime -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime | |
NFData UTCTime | |
Defined in Data.Time.Clock.Internal.UTCTime | |
Eq UTCTime | |
Ord UTCTime | |
Defined in Data.Time.Clock.Internal.UTCTime |
Constructors
LocalTime | |
Fields
|
Instances
FromJSON LocalTime | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSONKey LocalTime | |
Defined in Data.Aeson.Types.FromJSON Methods fromJSONKey :: FromJSONKeyFunction LocalTime fromJSONKeyList :: FromJSONKeyFunction [LocalTime] | |
ToJSON LocalTime | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding :: LocalTime -> Encoding toJSONList :: [LocalTime] -> Value toEncodingList :: [LocalTime] -> Encoding | |
ToJSONKey LocalTime | |
Defined in Data.Aeson.Types.ToJSON | |
Data LocalTime | |
Defined in Data.Time.LocalTime.Internal.LocalTime Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LocalTime -> c LocalTime gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LocalTime toConstr :: LocalTime -> Constr dataTypeOf :: LocalTime -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LocalTime) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LocalTime) gmapT :: (forall b. Data b => b -> b) -> LocalTime -> LocalTime gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LocalTime -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LocalTime -> r gmapQ :: (forall d. Data d => d -> u) -> LocalTime -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> LocalTime -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime | |
Show LocalTime | |
NFData LocalTime | |
Defined in Data.Time.LocalTime.Internal.LocalTime | |
Eq LocalTime | |
Ord LocalTime | |
Defined in Data.Time.LocalTime.Internal.LocalTime |
type RegexError = String #
Instances
ToJSON Regexp | |
Defined in Hledger.Utils.Regex Methods toEncoding :: Regexp -> Encoding toJSONList :: [Regexp] -> Value toEncodingList :: [Regexp] -> Encoding | |
Read Regexp | |
Defined in Hledger.Utils.Regex | |
Show Regexp | |
Eq Regexp | |
Ord Regexp | |
RegexLike Regexp String | |
Defined in Hledger.Utils.Regex Methods matchOnce :: Regexp -> String -> Maybe MatchArray matchAll :: Regexp -> String -> [MatchArray] matchCount :: Regexp -> String -> Int matchTest :: Regexp -> String -> Bool matchAllText :: Regexp -> String -> [MatchText String] matchOnceText :: Regexp -> String -> Maybe (String, MatchText String, String) | |
RegexContext Regexp String String | |
type Replacement = String #
Instances
FromJSON TimeOfDay | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSONKey TimeOfDay | |
Defined in Data.Aeson.Types.FromJSON Methods fromJSONKey :: FromJSONKeyFunction TimeOfDay fromJSONKeyList :: FromJSONKeyFunction [TimeOfDay] | |
ToJSON TimeOfDay | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding :: TimeOfDay -> Encoding toJSONList :: [TimeOfDay] -> Value toEncodingList :: [TimeOfDay] -> Encoding | |
ToJSONKey TimeOfDay | |
Defined in Data.Aeson.Types.ToJSON | |
Data TimeOfDay | |
Defined in Data.Time.LocalTime.Internal.TimeOfDay Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TimeOfDay -> c TimeOfDay gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TimeOfDay toConstr :: TimeOfDay -> Constr dataTypeOf :: TimeOfDay -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TimeOfDay) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TimeOfDay) gmapT :: (forall b. Data b => b -> b) -> TimeOfDay -> TimeOfDay gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TimeOfDay -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TimeOfDay -> r gmapQ :: (forall d. Data d => d -> u) -> TimeOfDay -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> TimeOfDay -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay | |
Show TimeOfDay | |
NFData TimeOfDay | |
Defined in Data.Time.LocalTime.Internal.TimeOfDay | |
Eq TimeOfDay | |
Ord TimeOfDay | |
Defined in Data.Time.LocalTime.Internal.TimeOfDay |
Instances
Generic1 (Const a :: k -> Type) | |
Unbox a => Vector Vector (Const a b) | |
Defined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze :: Mutable Vector s (Const a b) -> ST s (Vector (Const a b)) basicUnsafeThaw :: Vector (Const a b) -> ST s (Mutable Vector s (Const a b)) basicLength :: Vector (Const a b) -> Int basicUnsafeSlice :: Int -> Int -> Vector (Const a b) -> Vector (Const a b) basicUnsafeIndexM :: Vector (Const a b) -> Int -> Box (Const a b) basicUnsafeCopy :: Mutable Vector s (Const a b) -> Vector (Const a b) -> ST s () | |
Unbox a => MVector MVector (Const a b) | |
Defined in Data.Vector.Unboxed.Base Methods basicLength :: MVector s (Const a b) -> Int basicUnsafeSlice :: Int -> Int -> MVector s (Const a b) -> MVector s (Const a b) basicOverlaps :: MVector s (Const a b) -> MVector s (Const a b) -> Bool basicUnsafeNew :: Int -> ST s (MVector s (Const a b)) basicInitialize :: MVector s (Const a b) -> ST s () basicUnsafeReplicate :: Int -> Const a b -> ST s (MVector s (Const a b)) basicUnsafeRead :: MVector s (Const a b) -> Int -> ST s (Const a b) basicUnsafeWrite :: MVector s (Const a b) -> Int -> Const a b -> ST s () basicClear :: MVector s (Const a b) -> ST s () basicSet :: MVector s (Const a b) -> Const a b -> ST s () basicUnsafeCopy :: MVector s (Const a b) -> MVector s (Const a b) -> ST s () basicUnsafeMove :: MVector s (Const a b) -> MVector s (Const a b) -> ST s () basicUnsafeGrow :: MVector s (Const a b) -> Int -> ST s (MVector s (Const a b)) | |
FromJSON2 (Const :: Type -> Type -> Type) | |
Defined in Data.Aeson.Types.FromJSON Methods liftParseJSON2 :: (Value -> Parser a) -> (Value -> Parser [a]) -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser (Const a b) liftParseJSONList2 :: (Value -> Parser a) -> (Value -> Parser [a]) -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser [Const a b] | |
ToJSON2 (Const :: Type -> Type -> Type) | |
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON2 :: (a -> Value) -> ([a] -> Value) -> (b -> Value) -> ([b] -> Value) -> Const a b -> Value liftToJSONList2 :: (a -> Value) -> ([a] -> Value) -> (b -> Value) -> ([b] -> Value) -> [Const a b] -> Value liftToEncoding2 :: (a -> Encoding) -> ([a] -> Encoding) -> (b -> Encoding) -> ([b] -> Encoding) -> Const a b -> Encoding liftToEncodingList2 :: (a -> Encoding) -> ([a] -> Encoding) -> (b -> Encoding) -> ([b] -> Encoding) -> [Const a b] -> Encoding | |
Bifunctor (Const :: Type -> Type -> Type) | |
NFData2 (Const :: Type -> Type -> Type) | |
Defined in Control.DeepSeq | |
Hashable2 (Const :: Type -> Type -> Type) | |
Defined in Data.Hashable.Class Methods liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> Const a b -> Int | |
FromJSON a => FromJSON1 (Const a :: Type -> Type) | |
Defined in Data.Aeson.Types.FromJSON Methods liftParseJSON :: (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser (Const a a0) liftParseJSONList :: (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser [Const a a0] | |
ToJSON a => ToJSON1 (Const a :: Type -> Type) | |
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON :: (a0 -> Value) -> ([a0] -> Value) -> Const a a0 -> Value liftToJSONList :: (a0 -> Value) -> ([a0] -> Value) -> [Const a a0] -> Value liftToEncoding :: (a0 -> Encoding) -> ([a0] -> Encoding) -> Const a a0 -> Encoding liftToEncodingList :: (a0 -> Encoding) -> ([a0] -> Encoding) -> [Const a a0] -> Encoding | |
Foldable (Const m :: Type -> Type) | |
Defined in Data.Functor.Const Methods fold :: Monoid m0 => Const m m0 -> m0 foldMap :: Monoid m0 => (a -> m0) -> Const m a -> m0 foldMap' :: Monoid m0 => (a -> m0) -> Const m a -> m0 foldr :: (a -> b -> b) -> b -> Const m a -> b # foldr' :: (a -> b -> b) -> b -> Const m a -> b foldl :: (b -> a -> b) -> b -> Const m a -> b # foldl' :: (b -> a -> b) -> b -> Const m a -> b # foldr1 :: (a -> a -> a) -> Const m a -> a # foldl1 :: (a -> a -> a) -> Const m a -> a # elem :: Eq a => a -> Const m a -> Bool # maximum :: Ord a => Const m a -> a # minimum :: Ord a => Const m a -> a # | |
Traversable (Const m :: Type -> Type) | |
Monoid m => Applicative (Const m :: Type -> Type) | |
Functor (Const m :: Type -> Type) | |
NFData a => NFData1 (Const a :: Type -> Type) | |
Defined in Control.DeepSeq | |
Hashable a => Hashable1 (Const a :: Type -> Type) | |
Defined in Data.Hashable.Class Methods liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> Const a a0 -> Int | |
Reportable (Const r :: Type -> Type) e | |
Defined in Hledger.Reports.ReportOptions | |
FromJSON a => FromJSON (Const a b) | |
Defined in Data.Aeson.Types.FromJSON | |
(FromJSON a, FromJSONKey a) => FromJSONKey (Const a b) | |
Defined in Data.Aeson.Types.FromJSON Methods fromJSONKey :: FromJSONKeyFunction (Const a b) fromJSONKeyList :: FromJSONKeyFunction [Const a b] | |
ToJSON a => ToJSON (Const a b) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding :: Const a b -> Encoding toJSONList :: [Const a b] -> Value toEncodingList :: [Const a b] -> Encoding | |
(ToJSON a, ToJSONKey a) => ToJSONKey (Const a b) | |
Defined in Data.Aeson.Types.ToJSON | |
(Typeable k, Data a, Typeable b) => Data (Const a b) | |
Defined in Data.Data Methods gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Const a b -> c (Const a b) gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Const a b) toConstr :: Const a b -> Constr dataTypeOf :: Const a b -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Const a b)) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Const a b)) gmapT :: (forall b0. Data b0 => b0 -> b0) -> Const a b -> Const a b gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r gmapQ :: (forall d. Data d => d -> u) -> Const a b -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> Const a b -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) | |
IsString a => IsString (Const a b) | |
Defined in Data.String Methods fromString :: String -> Const a b | |
Storable a => Storable (Const a b) | |
Defined in Data.Functor.Const Methods peekElemOff :: Ptr (Const a b) -> Int -> IO (Const a b) pokeElemOff :: Ptr (Const a b) -> Int -> Const a b -> IO () peekByteOff :: Ptr b0 -> Int -> IO (Const a b) pokeByteOff :: Ptr b0 -> Int -> Const a b -> IO () | |
Monoid a => Monoid (Const a b) | |
Semigroup a => Semigroup (Const a b) | |
Bits a => Bits (Const a b) | |
Defined in Data.Functor.Const Methods (.&.) :: Const a b -> Const a b -> Const a b (.|.) :: Const a b -> Const a b -> Const a b xor :: Const a b -> Const a b -> Const a b complement :: Const a b -> Const a b shift :: Const a b -> Int -> Const a b rotate :: Const a b -> Int -> Const a b setBit :: Const a b -> Int -> Const a b clearBit :: Const a b -> Int -> Const a b complementBit :: Const a b -> Int -> Const a b testBit :: Const a b -> Int -> Bool bitSizeMaybe :: Const a b -> Maybe Int shiftL :: Const a b -> Int -> Const a b unsafeShiftL :: Const a b -> Int -> Const a b shiftR :: Const a b -> Int -> Const a b unsafeShiftR :: Const a b -> Int -> Const a b rotateL :: Const a b -> Int -> Const a b | |
FiniteBits a => FiniteBits (Const a b) | |
Defined in Data.Functor.Const Methods finiteBitSize :: Const a b -> Int countLeadingZeros :: Const a b -> Int countTrailingZeros :: Const a b -> Int | |
Bounded a => Bounded (Const a b) | |
Defined in Data.Functor.Const | |
Enum a => Enum (Const a b) | |
Defined in Data.Functor.Const | |
Floating a => Floating (Const a b) | |
Defined in Data.Functor.Const Methods sqrt :: Const a b -> Const a b (**) :: Const a b -> Const a b -> Const a b logBase :: Const a b -> Const a b -> Const a b asin :: Const a b -> Const a b acos :: Const a b -> Const a b atan :: Const a b -> Const a b sinh :: Const a b -> Const a b cosh :: Const a b -> Const a b tanh :: Const a b -> Const a b asinh :: Const a b -> Const a b acosh :: Const a b -> Const a b atanh :: Const a b -> Const a b log1p :: Const a b -> Const a b expm1 :: Const a b -> Const a b | |
RealFloat a => RealFloat (Const a b) | |
Defined in Data.Functor.Const Methods floatRadix :: Const a b -> Integer floatDigits :: Const a b -> Int floatRange :: Const a b -> (Int, Int) decodeFloat :: Const a b -> (Integer, Int) encodeFloat :: Integer -> Int -> Const a b significand :: Const a b -> Const a b scaleFloat :: Int -> Const a b -> Const a b isInfinite :: Const a b -> Bool isDenormalized :: Const a b -> Bool isNegativeZero :: Const a b -> Bool | |
Generic (Const a b) | |
Ix a => Ix (Const a b) | |
Defined in Data.Functor.Const Methods range :: (Const a b, Const a b) -> [Const a b] index :: (Const a b, Const a b) -> Const a b -> Int unsafeIndex :: (Const a b, Const a b) -> Const a b -> Int inRange :: (Const a b, Const a b) -> Const a b -> Bool rangeSize :: (Const a b, Const a b) -> Int unsafeRangeSize :: (Const a b, Const a b) -> Int | |
Num a => Num (Const a b) | |
Read a => Read (Const a b) | |
Defined in Data.Functor.Const | |
Fractional a => Fractional (Const a b) | |
Defined in Data.Functor.Const | |
Integral a => Integral (Const a b) | |
Defined in Data.Functor.Const | |
Real a => Real (Const a b) | |
Defined in Data.Functor.Const Methods toRational :: Const a b -> Rational | |
RealFrac a => RealFrac (Const a b) | |
Show a => Show (Const a b) | |
NFData a => NFData (Const a b) | |
Defined in Control.DeepSeq | |
Eq a => Eq (Const a b) | |
Ord a => Ord (Const a b) | |
Hashable a => Hashable (Const a b) | |
Defined in Data.Hashable.Class | |
MonoFoldable (Const m a) | |
Defined in Data.MonoTraversable Methods ofoldMap :: Monoid m0 => (Element (Const m a) -> m0) -> Const m a -> m0 ofoldr :: (Element (Const m a) -> b -> b) -> b -> Const m a -> b ofoldl' :: (a0 -> Element (Const m a) -> a0) -> a0 -> Const m a -> a0 otoList :: Const m a -> [Element (Const m a)] oall :: (Element (Const m a) -> Bool) -> Const m a -> Bool oany :: (Element (Const m a) -> Bool) -> Const m a -> Bool olength64 :: Const m a -> Int64 ocompareLength :: Integral i => Const m a -> i -> Ordering otraverse_ :: Applicative f => (Element (Const m a) -> f b) -> Const m a -> f () ofor_ :: Applicative f => Const m a -> (Element (Const m a) -> f b) -> f () omapM_ :: Applicative m0 => (Element (Const m a) -> m0 ()) -> Const m a -> m0 () oforM_ :: Applicative m0 => Const m a -> (Element (Const m a) -> m0 ()) -> m0 () ofoldlM :: Monad m0 => (a0 -> Element (Const m a) -> m0 a0) -> a0 -> Const m a -> m0 a0 ofoldMap1Ex :: Semigroup m0 => (Element (Const m a) -> m0) -> Const m a -> m0 ofoldr1Ex :: (Element (Const m a) -> Element (Const m a) -> Element (Const m a)) -> Const m a -> Element (Const m a) ofoldl1Ex' :: (Element (Const m a) -> Element (Const m a) -> Element (Const m a)) -> Const m a -> Element (Const m a) headEx :: Const m a -> Element (Const m a) lastEx :: Const m a -> Element (Const m a) unsafeHead :: Const m a -> Element (Const m a) unsafeLast :: Const m a -> Element (Const m a) maximumByEx :: (Element (Const m a) -> Element (Const m a) -> Ordering) -> Const m a -> Element (Const m a) minimumByEx :: (Element (Const m a) -> Element (Const m a) -> Ordering) -> Const m a -> Element (Const m a) | |
MonoFunctor (Const m a) | |
Monoid m => MonoPointed (Const m a) | |
Defined in Data.MonoTraversable | |
MonoTraversable (Const m a) | |
Defined in Data.MonoTraversable | |
Pretty a => Pretty (Const a b) | |
Defined in Prettyprinter.Internal | |
Unbox a => Unbox (Const a b) | |
Defined in Data.Vector.Unboxed.Base | |
type Rep1 (Const a :: k -> Type) | |
Defined in Data.Functor.Const | |
newtype MVector s (Const a b) | |
Defined in Data.Vector.Unboxed.Base | |
type Rep (Const a b) | |
Defined in Data.Functor.Const | |
type Element (Const m a) | |
Defined in Data.MonoTraversable type Element (Const m a) = a | |
newtype Vector (Const a b) | |
Defined in Data.Vector.Unboxed.Base |
data CalendarDiffDays #
Constructors
CalendarDiffDays | |
Instances
type MonthOfYear = Int #
Instances
FromJSON DiffTime | |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON DiffTime | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding :: DiffTime -> Encoding toJSONList :: [DiffTime] -> Value toEncodingList :: [DiffTime] -> Encoding | |
Data DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DiffTime -> c DiffTime gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DiffTime toConstr :: DiffTime -> Constr dataTypeOf :: DiffTime -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DiffTime) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DiffTime) gmapT :: (forall b. Data b => b -> b) -> DiffTime -> DiffTime gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DiffTime -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DiffTime -> r gmapQ :: (forall d. Data d => d -> u) -> DiffTime -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> DiffTime -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime | |
Enum DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime | |
Num DiffTime | |
Read DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime | |
Fractional DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime | |
Real DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime Methods toRational :: DiffTime -> Rational | |
RealFrac DiffTime | |
Show DiffTime | |
NFData DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime | |
Eq DiffTime | |
Ord DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime |
Instances
FromJSON DayOfWeek | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSONKey DayOfWeek | |
Defined in Data.Aeson.Types.FromJSON Methods fromJSONKey :: FromJSONKeyFunction DayOfWeek fromJSONKeyList :: FromJSONKeyFunction [DayOfWeek] | |
ToJSON DayOfWeek | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding :: DayOfWeek -> Encoding toJSONList :: [DayOfWeek] -> Value toEncodingList :: [DayOfWeek] -> Encoding | |
ToJSONKey DayOfWeek | |
Defined in Data.Aeson.Types.ToJSON | |
Data DayOfWeek | |
Defined in Data.Time.Calendar.Week Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DayOfWeek -> c DayOfWeek gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DayOfWeek toConstr :: DayOfWeek -> Constr dataTypeOf :: DayOfWeek -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DayOfWeek) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DayOfWeek) gmapT :: (forall b. Data b => b -> b) -> DayOfWeek -> DayOfWeek gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DayOfWeek -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DayOfWeek -> r gmapQ :: (forall d. Data d => d -> u) -> DayOfWeek -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> DayOfWeek -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek | |
Enum DayOfWeek | |
Defined in Data.Time.Calendar.Week | |
Ix DayOfWeek | |
Defined in Data.Time.Calendar.Week Methods range :: (DayOfWeek, DayOfWeek) -> [DayOfWeek] index :: (DayOfWeek, DayOfWeek) -> DayOfWeek -> Int unsafeIndex :: (DayOfWeek, DayOfWeek) -> DayOfWeek -> Int inRange :: (DayOfWeek, DayOfWeek) -> DayOfWeek -> Bool rangeSize :: (DayOfWeek, DayOfWeek) -> Int unsafeRangeSize :: (DayOfWeek, DayOfWeek) -> Int | |
Read DayOfWeek | |
Defined in Data.Time.Calendar.Week | |
Show DayOfWeek | |
NFData DayOfWeek | |
Defined in Data.Time.Calendar.Week | |
Eq DayOfWeek | |
Ord DayOfWeek | |
data NominalDiffTime #
Instances
newtype UniversalTime #
Constructors
ModJulianDate | |
Fields
|
Instances
Data UniversalTime | |
Defined in Data.Time.Clock.Internal.UniversalTime Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UniversalTime -> c UniversalTime gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UniversalTime toConstr :: UniversalTime -> Constr dataTypeOf :: UniversalTime -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UniversalTime) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UniversalTime) gmapT :: (forall b. Data b => b -> b) -> UniversalTime -> UniversalTime gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UniversalTime -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UniversalTime -> r gmapQ :: (forall d. Data d => d -> u) -> UniversalTime -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> UniversalTime -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime | |
NFData UniversalTime | |
Defined in Data.Time.Clock.Internal.UniversalTime Methods rnf :: UniversalTime -> () | |
Eq UniversalTime | |
Defined in Data.Time.Clock.Internal.UniversalTime | |
Ord UniversalTime | |
Defined in Data.Time.Clock.Internal.UniversalTime Methods compare :: UniversalTime -> UniversalTime -> Ordering # (<) :: UniversalTime -> UniversalTime -> Bool # (<=) :: UniversalTime -> UniversalTime -> Bool # (>) :: UniversalTime -> UniversalTime -> Bool # (>=) :: UniversalTime -> UniversalTime -> Bool # max :: UniversalTime -> UniversalTime -> UniversalTime # min :: UniversalTime -> UniversalTime -> UniversalTime # |
class FormatTime t #
Minimal complete definition
formatCharacter
Instances
FormatTime DotNetTime | |
Defined in Data.Aeson.Types.Internal Methods formatCharacter :: Bool -> Char -> Maybe (FormatOptions -> DotNetTime -> String) |
data CalendarDiffTime #
Constructors
CalendarDiffTime | |
Fields
|
Instances
Constructors
TimeZone | |
Fields
|
Instances
Data TimeZone | |
Defined in Data.Time.LocalTime.Internal.TimeZone Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TimeZone -> c TimeZone gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TimeZone toConstr :: TimeZone -> Constr dataTypeOf :: TimeZone -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TimeZone) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TimeZone) gmapT :: (forall b. Data b => b -> b) -> TimeZone -> TimeZone gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TimeZone -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TimeZone -> r gmapQ :: (forall d. Data d => d -> u) -> TimeZone -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> TimeZone -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone | |
Show TimeZone | |
NFData TimeZone | |
Defined in Data.Time.LocalTime.Internal.TimeZone | |
Eq TimeZone | |
Ord TimeZone | |
Defined in Data.Time.LocalTime.Internal.TimeZone |
Constructors
ZonedTime | |
Fields |
Instances
FromJSON ZonedTime | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSONKey ZonedTime | |
Defined in Data.Aeson.Types.FromJSON Methods fromJSONKey :: FromJSONKeyFunction ZonedTime fromJSONKeyList :: FromJSONKeyFunction [ZonedTime] | |
ToJSON ZonedTime | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding :: ZonedTime -> Encoding toJSONList :: [ZonedTime] -> Value toEncodingList :: [ZonedTime] -> Encoding | |
ToJSONKey ZonedTime | |
Defined in Data.Aeson.Types.ToJSON | |
Data ZonedTime | |
Defined in Data.Time.LocalTime.Internal.ZonedTime Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ZonedTime -> c ZonedTime gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ZonedTime toConstr :: ZonedTime -> Constr dataTypeOf :: ZonedTime -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ZonedTime) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ZonedTime) gmapT :: (forall b. Data b => b -> b) -> ZonedTime -> ZonedTime gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ZonedTime -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ZonedTime -> r gmapQ :: (forall d. Data d => d -> u) -> ZonedTime -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> ZonedTime -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime | |
Show ZonedTime | |
NFData ZonedTime | |
Defined in Data.Time.LocalTime.Internal.ZonedTime |
Instances
Show ThreadId | |
NFData ThreadId | |
Defined in Control.DeepSeq | |
Eq ThreadId | |
Ord ThreadId | |
Defined in GHC.Conc.Sync | |
Hashable ThreadId | |
Defined in Data.Hashable.Class |
Constructors
AbsoluteSeek | |
RelativeSeek | |
SeekFromEnd |
Instances
Enum SeekMode | |
Defined in GHC.IO.Device | |
Ix SeekMode | |
Defined in GHC.IO.Device | |
Read SeekMode | |
Defined in GHC.IO.Device | |
Show SeekMode | |
Eq SeekMode | |
Ord SeekMode | |
Defined in GHC.IO.Device |
data TextEncoding #
Instances
Show TextEncoding | |
Defined in GHC.IO.Encoding.Types Methods showsPrec :: Int -> TextEncoding -> ShowS show :: TextEncoding -> String showList :: [TextEncoding] -> ShowS |
data HandlePosn #
Instances
Show HandlePosn | |
Defined in GHC.IO.Handle Methods showsPrec :: Int -> HandlePosn -> ShowS show :: HandlePosn -> String showList :: [HandlePosn] -> ShowS | |
Eq HandlePosn | |
Defined in GHC.IO.Handle |
data BufferMode #
Constructors
NoBuffering | |
LineBuffering | |
BlockBuffering (Maybe Int) |
Instances
Read BufferMode | |
Defined in GHC.IO.Handle.Types Methods readsPrec :: Int -> ReadS BufferMode readList :: ReadS [BufferMode] readPrec :: ReadPrec BufferMode readListPrec :: ReadPrec [BufferMode] | |
Show BufferMode | |
Defined in GHC.IO.Handle.Types Methods showsPrec :: Int -> BufferMode -> ShowS show :: BufferMode -> String showList :: [BufferMode] -> ShowS | |
Eq BufferMode | |
Defined in GHC.IO.Handle.Types | |
Ord BufferMode | |
Defined in GHC.IO.Handle.Types Methods compare :: BufferMode -> BufferMode -> Ordering # (<) :: BufferMode -> BufferMode -> Bool # (<=) :: BufferMode -> BufferMode -> Bool # (>) :: BufferMode -> BufferMode -> Bool # (>=) :: BufferMode -> BufferMode -> Bool # max :: BufferMode -> BufferMode -> BufferMode # min :: BufferMode -> BufferMode -> BufferMode # |
data NewlineMode #
Constructors
NewlineMode | |
Instances
Read NewlineMode | |
Defined in GHC.IO.Handle.Types Methods readsPrec :: Int -> ReadS NewlineMode readList :: ReadS [NewlineMode] readPrec :: ReadPrec NewlineMode readListPrec :: ReadPrec [NewlineMode] | |
Show NewlineMode | |
Defined in GHC.IO.Handle.Types Methods showsPrec :: Int -> NewlineMode -> ShowS show :: NewlineMode -> String showList :: [NewlineMode] -> ShowS | |
Eq NewlineMode | |
Defined in GHC.IO.Handle.Types | |
Ord NewlineMode | |
Defined in GHC.IO.Handle.Types Methods compare :: NewlineMode -> NewlineMode -> Ordering # (<) :: NewlineMode -> NewlineMode -> Bool # (<=) :: NewlineMode -> NewlineMode -> Bool # (>) :: NewlineMode -> NewlineMode -> Bool # (>=) :: NewlineMode -> NewlineMode -> Bool # max :: NewlineMode -> NewlineMode -> NewlineMode # min :: NewlineMode -> NewlineMode -> NewlineMode # |
Constructors
ReadMode | |
WriteMode | |
AppendMode | |
ReadWriteMode |
Instances
Enum IOMode | |
Defined in GHC.IO.IOMode | |
Ix IOMode | |
Read IOMode | |
Defined in GHC.IO.IOMode | |
Show IOMode | |
Eq IOMode | |
Ord IOMode | |
data FormatAdjustment #
Constructors
LeftAdjust | |
ZeroPad |
data FormatSign #
Constructors
ShellCommand String | |
RawCommand FilePath [String] |
Instances
IsString CmdSpec | |
Defined in System.Process.Common Methods fromString :: String -> CmdSpec | |
Show CmdSpec | |
Eq CmdSpec | |
data CreateProcess #
Constructors
CreateProcess | |
Fields
|
Instances
Show CreateProcess | |
Defined in System.Process.Common Methods showsPrec :: Int -> CreateProcess -> ShowS show :: CreateProcess -> String showList :: [CreateProcess] -> ShowS | |
Eq CreateProcess | |
Defined in System.Process.Common |
data ProcessHandle #
Constructors
Inherit | |
UseHandle Handle | |
CreatePipe | |
NoStream |
Constructors
ExitSuccess | |
ExitFailure Int |
Instances
Exception ExitCode | |
Defined in GHC.IO.Exception Methods toException :: ExitCode -> SomeException fromException :: SomeException -> Maybe ExitCode displayException :: ExitCode -> String | |
Generic ExitCode | |
Read ExitCode | |
Defined in GHC.IO.Exception | |
Show ExitCode | |
NFData ExitCode | |
Defined in Control.DeepSeq | |
Eq ExitCode | |
Ord ExitCode | |
Defined in GHC.IO.Exception | |
type Rep ExitCode | |
Defined in GHC.IO.Exception type Rep ExitCode = D1 ('MetaData "ExitCode" "GHC.IO.Exception" "base" 'False) (C1 ('MetaCons "ExitSuccess" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ExitFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) |
type SimpleStringParser a = Parsec HledgerParseErrorData String a #
type SimpleTextParser = Parsec HledgerParseErrorData Text #
data DependencyType #
Constructors
AllSucceed | |
AllFinish |
Instances
Show DependencyType | |
Defined in Test.Tasty.Core Methods showsPrec :: Int -> DependencyType -> ShowS show :: DependencyType -> String showList :: [DependencyType] -> ShowS | |
Eq DependencyType | |
Defined in Test.Tasty.Core Methods (==) :: DependencyType -> DependencyType -> Bool (/=) :: DependencyType -> DependencyType -> Bool |
Instances
Show Timeout | |
IsOption Timeout | |
Defined in Test.Tasty.Options.Core Methods parseValue :: String -> Maybe Timeout optionName :: Tagged Timeout String optionHelp :: Tagged Timeout String showDefaultValue :: Timeout -> Maybe String optionCLParser :: Parser Timeout |
class Assertable t where #
Instances
Assertable String | |
Defined in Test.Tasty.HUnit.Orig | |
Assertable () | |
Defined in Test.Tasty.HUnit.Orig | |
Assertable Bool | |
Defined in Test.Tasty.HUnit.Orig | |
Assertable t => Assertable (IO t) | |
Defined in Test.Tasty.HUnit.Orig |
class AssertionPredicable t where #
Methods
assertionPredicate :: t -> IO Bool #
Instances
AssertionPredicable Bool | |
Defined in Test.Tasty.HUnit.Orig Methods assertionPredicate :: Bool -> IO Bool # | |
AssertionPredicable t => AssertionPredicable (IO t) | |
Defined in Test.Tasty.HUnit.Orig Methods assertionPredicate :: IO t -> IO Bool # |
type AssertionPredicate = IO Bool #
data HUnitFailure #
Constructors
HUnitFailure (Maybe SrcLoc) String |
Instances
Exception HUnitFailure | |
Defined in Test.Tasty.HUnit.Orig Methods toException :: HUnitFailure -> SomeException fromException :: SomeException -> Maybe HUnitFailure displayException :: HUnitFailure -> String | |
Show HUnitFailure | |
Defined in Test.Tasty.HUnit.Orig Methods showsPrec :: Int -> HUnitFailure -> ShowS show :: HUnitFailure -> String showList :: [HUnitFailure] -> ShowS | |
Eq HUnitFailure | |
Defined in Test.Tasty.HUnit.Orig |
class HPrintfType t #
Minimal complete definition
hspr
Instances
a ~ () => HPrintfType (IO a) | |
Defined in Text.Printf | |
(PrintfArg a, HPrintfType r) => HPrintfType (a -> r) | |
Defined in Text.Printf |
class PrintfType t #
Minimal complete definition
spr
Instances
a ~ () => PrintfType (IO a) | |
Defined in Text.Printf | |
IsChar c => PrintfType [c] | |
Defined in Text.Printf Methods spr :: String -> [UPrintf] -> [c] | |
(PrintfArg a, PrintfType r) => PrintfType (a -> r) | |
Defined in Text.Printf Methods spr :: String -> [UPrintf] -> a -> r |
Constructors
Flag | |
Constructors
Mode | |
Fields
|
Constructors
InputOpts | |
Fields
|
Instances
data ReportSpec #
Constructors
ReportSpec | |
Fields
|
Instances
type PrefixedFilePath = FilePath #
class HasInputOpts c where #
Minimal complete definition
Methods
inputOpts :: Lens' c InputOpts #
balancingopts :: Lens' c BalancingOpts #
forecast :: Lens' c (Maybe DateSpan) #
infer_costs :: Lens' c Bool #
infer_equity :: Lens' c Bool #
mformat :: Lens' c (Maybe StorageFormat) #
mrules_file :: Lens' c (Maybe FilePath) #
reportspan :: Lens' c DateSpan #
verbose_tags :: Lens' c Bool #
Instances
class HasReportSpec c where #
Minimal complete definition
Methods
reportSpec :: Lens' c ReportSpec #
rsQueryOpts :: Lens' c [QueryOpt] #
rsReportOpts :: Lens' c ReportOpts #
Instances
HasReportSpec CliOpts Source # | |
Defined in Hledger.Cli.CliOptions Methods reportSpec :: Lens' CliOpts ReportSpec # rsQuery :: Lens' CliOpts Query # rsQueryOpts :: Lens' CliOpts [QueryOpt] # rsReportOpts :: Lens' CliOpts ReportOpts # | |
HasReportSpec ReportSpec | |
Defined in Hledger.Reports.ReportOptions Methods reportSpec :: Lens' ReportSpec ReportSpec # rsDay :: Lens' ReportSpec Day # rsQuery :: Lens' ReportSpec Query # rsQueryOpts :: Lens' ReportSpec [QueryOpt] # rsReportOpts :: Lens' ReportSpec ReportOpts # |
class HasReportOptsNoUpdate c where #
Minimal complete definition
Methods
reportOptsNoUpdate :: Lens' c ReportOpts #
accountlistmode :: Lens' c AccountListMode #
balanceaccum :: Lens' c BalanceAccumulation #
balancecalc :: Lens' c BalanceCalculation #
budgetpat :: Lens' c (Maybe Text) #
conversionop :: Lens' c (Maybe ConversionOp) #
date2NoUpdate :: Lens' c Bool #
depthNoUpdate :: Lens' c (Maybe Int) #
format :: Lens' c StringFormat #
infer_prices :: Lens' c Bool #
interval :: Lens' c Interval #
normalbalance :: Lens' c (Maybe NormalSign) #
periodNoUpdate :: Lens' c Period #
querystringNoUpdate :: Lens' c [Text] #
realNoUpdate :: Lens' c Bool #
show_costs :: Lens' c Bool #
sort_amount :: Lens' c Bool #
statusesNoUpdate :: Lens' c [Status] #
summary_only :: Lens' c Bool #
transpose__ :: Lens' c Bool #
value :: Lens' c (Maybe ValuationType) #
Instances
class HasReportOptsNoUpdate a => HasReportOpts a where #
Minimal complete definition
Nothing
Methods
reportOpts :: ReportableLens' a ReportOpts #
period :: ReportableLens' a Period #
statuses :: ReportableLens' a [Status] #
depth :: ReportableLens' a (Maybe Int) #
date2 :: ReportableLens' a Bool #
real :: ReportableLens' a Bool #
querystring :: ReportableLens' a [Text] #
Instances
data GeneralCategory #
Constructors
Instances
Bounded GeneralCategory | |
Defined in GHC.Unicode | |
Enum GeneralCategory | |
Defined in GHC.Unicode Methods succ :: GeneralCategory -> GeneralCategory pred :: GeneralCategory -> GeneralCategory toEnum :: Int -> GeneralCategory fromEnum :: GeneralCategory -> Int enumFrom :: GeneralCategory -> [GeneralCategory] enumFromThen :: GeneralCategory -> GeneralCategory -> [GeneralCategory] enumFromTo :: GeneralCategory -> GeneralCategory -> [GeneralCategory] enumFromThenTo :: GeneralCategory -> GeneralCategory -> GeneralCategory -> [GeneralCategory] | |
Generic GeneralCategory | |
Defined in GHC.Generics Associated Types type Rep GeneralCategory :: Type -> Type Methods from :: GeneralCategory -> Rep GeneralCategory x to :: Rep GeneralCategory x -> GeneralCategory | |
Ix GeneralCategory | |
Defined in GHC.Unicode Methods range :: (GeneralCategory, GeneralCategory) -> [GeneralCategory] index :: (GeneralCategory, GeneralCategory) -> GeneralCategory -> Int unsafeIndex :: (GeneralCategory, GeneralCategory) -> GeneralCategory -> Int inRange :: (GeneralCategory, GeneralCategory) -> GeneralCategory -> Bool rangeSize :: (GeneralCategory, GeneralCategory) -> Int unsafeRangeSize :: (GeneralCategory, GeneralCategory) -> Int | |
Read GeneralCategory | |
Defined in GHC.Read Methods readsPrec :: Int -> ReadS GeneralCategory readList :: ReadS [GeneralCategory] readPrec :: ReadPrec GeneralCategory readListPrec :: ReadPrec [GeneralCategory] | |
Show GeneralCategory | |
Defined in GHC.Unicode Methods showsPrec :: Int -> GeneralCategory -> ShowS show :: GeneralCategory -> String showList :: [GeneralCategory] -> ShowS | |
Eq GeneralCategory | |
Defined in GHC.Unicode Methods (==) :: GeneralCategory -> GeneralCategory -> Bool (/=) :: GeneralCategory -> GeneralCategory -> Bool | |
Ord GeneralCategory | |
Defined in GHC.Unicode Methods compare :: GeneralCategory -> GeneralCategory -> Ordering # (<) :: GeneralCategory -> GeneralCategory -> Bool # (<=) :: GeneralCategory -> GeneralCategory -> Bool # (>) :: GeneralCategory -> GeneralCategory -> Bool # (>=) :: GeneralCategory -> GeneralCategory -> Bool # max :: GeneralCategory -> GeneralCategory -> GeneralCategory # min :: GeneralCategory -> GeneralCategory -> GeneralCategory # | |
type Rep GeneralCategory | |
Defined in GHC.Generics type Rep GeneralCategory = D1 ('MetaData "GeneralCategory" "GHC.Unicode" "base" 'False) ((((C1 ('MetaCons "UppercaseLetter" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "LowercaseLetter" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TitlecaseLetter" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ModifierLetter" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OtherLetter" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NonSpacingMark" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SpacingCombiningMark" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "EnclosingMark" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DecimalNumber" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LetterNumber" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OtherNumber" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ConnectorPunctuation" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DashPunctuation" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "OpenPunctuation" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ClosePunctuation" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "InitialQuote" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "FinalQuote" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OtherPunctuation" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "MathSymbol" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CurrencySymbol" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ModifierSymbol" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OtherSymbol" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "Space" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LineSeparator" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ParagraphSeparator" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Control" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Format" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Surrogate" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PrivateUse" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NotAssigned" 'PrefixI 'False) (U1 :: Type -> Type)))))) |
data HelpFormat #
Instances
Constructors
FlagReq | |
FlagOpt String | |
FlagOptRare String | |
FlagNone |
Instances
Show FlagInfo | |
Eq FlagInfo | |
Ord FlagInfo | |
Defined in System.Console.CmdArgs.Explicit.Type |
class Remap (m :: Type -> Type) where #
Instances
Remap Arg | |
Defined in System.Console.CmdArgs.Explicit.Type | |
Remap Flag | |
Defined in System.Console.CmdArgs.Explicit.Type | |
Remap Mode | |
Defined in System.Console.CmdArgs.Explicit.Type |
data Permissions #
Instances
Read Permissions | |
Defined in System.Directory.Internal.Common Methods readsPrec :: Int -> ReadS Permissions readList :: ReadS [Permissions] readPrec :: ReadPrec Permissions readListPrec :: ReadPrec [Permissions] | |
Show Permissions | |
Defined in System.Directory.Internal.Common Methods showsPrec :: Int -> Permissions -> ShowS show :: Permissions -> String showList :: [Permissions] -> ShowS | |
Eq Permissions | |
Defined in System.Directory.Internal.Common | |
Ord Permissions | |
Defined in System.Directory.Internal.Common Methods compare :: Permissions -> Permissions -> Ordering # (<) :: Permissions -> Permissions -> Bool # (<=) :: Permissions -> Permissions -> Bool # (>) :: Permissions -> Permissions -> Bool # (>=) :: Permissions -> Permissions -> Bool # max :: Permissions -> Permissions -> Permissions # min :: Permissions -> Permissions -> Permissions # |
data XdgDirectory #
Instances
data XdgDirectoryList #
Constructors
XdgDataDirs | |
XdgConfigDirs |
Instances
Constructors
QueryOptInAcctOnly AccountName | |
QueryOptInAcct AccountName |
data Reader (m :: Type -> Type) #
Constructors
Reader | |
Fields
|
type AccountTransactionsReportItem = (Transaction, Transaction, Bool, Text, MixedAmount, MixedAmount) #
type BalanceReport = ([BalanceReportItem], MixedAmount) #
type BalanceReportItem = (AccountName, AccountName, Int, MixedAmount) #
type BudgetAverage = Average #
type BudgetCell = (Maybe Change, Maybe BudgetGoal) #
type BudgetGoal = Change #
type BudgetTotal = Total #
type EntriesReport = [EntriesReportItem] #
type EntriesReportItem = Transaction #
type PostingsReport = [PostingsReportItem] #
type PostingsReportItem = (Maybe Day, Maybe Period, Maybe Text, Posting, MixedAmount) #
data AccountListMode #
Instances
Show AccountListMode | |
Defined in Hledger.Reports.ReportOptions Methods showsPrec :: Int -> AccountListMode -> ShowS show :: AccountListMode -> String showList :: [AccountListMode] -> ShowS | |
Default AccountListMode | |
Defined in Hledger.Reports.ReportOptions Methods | |
Eq AccountListMode | |
Defined in Hledger.Reports.ReportOptions Methods (==) :: AccountListMode -> AccountListMode -> Bool (/=) :: AccountListMode -> AccountListMode -> Bool |
data BalanceAccumulation #
Constructors
PerPeriod | |
Cumulative | |
Historical |
Instances
Show BalanceAccumulation | |
Defined in Hledger.Reports.ReportOptions Methods showsPrec :: Int -> BalanceAccumulation -> ShowS show :: BalanceAccumulation -> String showList :: [BalanceAccumulation] -> ShowS | |
Default BalanceAccumulation | |
Defined in Hledger.Reports.ReportOptions Methods | |
Eq BalanceAccumulation | |
Defined in Hledger.Reports.ReportOptions Methods (==) :: BalanceAccumulation -> BalanceAccumulation -> Bool (/=) :: BalanceAccumulation -> BalanceAccumulation -> Bool |
data BalanceCalculation #
Constructors
CalcChange | |
CalcBudget | |
CalcValueChange | |
CalcGain | |
CalcPostingsCount |
Instances
Show BalanceCalculation | |
Defined in Hledger.Reports.ReportOptions Methods showsPrec :: Int -> BalanceCalculation -> ShowS show :: BalanceCalculation -> String showList :: [BalanceCalculation] -> ShowS | |
Default BalanceCalculation | |
Defined in Hledger.Reports.ReportOptions Methods | |
Eq BalanceCalculation | |
Defined in Hledger.Reports.ReportOptions Methods (==) :: BalanceCalculation -> BalanceCalculation -> Bool (/=) :: BalanceCalculation -> BalanceCalculation -> Bool |
Constructors
LayoutWide (Maybe Int) | |
LayoutTall | |
LayoutBare | |
LayoutTidy |
data ReportOpts #
Constructors
ReportOpts | |
Fields
|
Instances
type Average = MixedAmount #
data CBCSubreportSpec a #
Constructors
CBCSubreportSpec | |
type Change = MixedAmount #
data CompoundPeriodicReport a b #
Constructors
CompoundPeriodicReport | |
Fields
|
Instances
Functor (CompoundPeriodicReport a) | |
Defined in Hledger.Reports.ReportTypes Methods fmap :: (a0 -> b) -> CompoundPeriodicReport a a0 -> CompoundPeriodicReport a b # (<$) :: a0 -> CompoundPeriodicReport a b -> CompoundPeriodicReport a a0 # | |
(ToJSON b, ToJSON a) => ToJSON (CompoundPeriodicReport a b) | |
Defined in Hledger.Reports.ReportTypes Methods toJSON :: CompoundPeriodicReport a b -> Value toEncoding :: CompoundPeriodicReport a b -> Encoding toJSONList :: [CompoundPeriodicReport a b] -> Value toEncodingList :: [CompoundPeriodicReport a b] -> Encoding | |
Generic (CompoundPeriodicReport a b) | |
Defined in Hledger.Reports.ReportTypes Associated Types type Rep (CompoundPeriodicReport a b) :: Type -> Type Methods from :: CompoundPeriodicReport a b -> Rep (CompoundPeriodicReport a b) x to :: Rep (CompoundPeriodicReport a b) x -> CompoundPeriodicReport a b | |
(Show a, Show b) => Show (CompoundPeriodicReport a b) | |
Defined in Hledger.Reports.ReportTypes Methods showsPrec :: Int -> CompoundPeriodicReport a b -> ShowS show :: CompoundPeriodicReport a b -> String showList :: [CompoundPeriodicReport a b] -> ShowS | |
HasAmounts b => HasAmounts (CompoundPeriodicReport a b) | |
Defined in Hledger.Reports.ReportTypes Methods styleAmounts :: Map CommoditySymbol AmountStyle -> CompoundPeriodicReport a b -> CompoundPeriodicReport a b # | |
type Rep (CompoundPeriodicReport a b) | |
Defined in Hledger.Reports.ReportTypes type Rep (CompoundPeriodicReport a b) = D1 ('MetaData "CompoundPeriodicReport" "Hledger.Reports.ReportTypes" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "CompoundPeriodicReport" 'PrefixI 'True) ((S1 ('MetaSel ('Just "cbrTitle") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "cbrDates") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [DateSpan])) :*: (S1 ('MetaSel ('Just "cbrSubreports") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Text, PeriodicReport a b, Bool)]) :*: S1 ('MetaSel ('Just "cbrTotals") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PeriodicReportRow () b))))) |
data DisplayName #
Constructors
DisplayName | |
Fields
|
Instances
ToJSON DisplayName | |
Defined in Hledger.Reports.ReportTypes Methods toJSON :: DisplayName -> Value toEncoding :: DisplayName -> Encoding toJSONList :: [DisplayName] -> Value toEncodingList :: [DisplayName] -> Encoding | |
Show DisplayName | |
Defined in Hledger.Reports.ReportTypes Methods showsPrec :: Int -> DisplayName -> ShowS show :: DisplayName -> String showList :: [DisplayName] -> ShowS | |
Eq DisplayName | |
Defined in Hledger.Reports.ReportTypes | |
Ord DisplayName | |
Defined in Hledger.Reports.ReportTypes Methods compare :: DisplayName -> DisplayName -> Ordering # (<) :: DisplayName -> DisplayName -> Bool # (<=) :: DisplayName -> DisplayName -> Bool # (>) :: DisplayName -> DisplayName -> Bool # (>=) :: DisplayName -> DisplayName -> Bool # max :: DisplayName -> DisplayName -> DisplayName # min :: DisplayName -> DisplayName -> DisplayName # |
type Percentage = Decimal #
data PeriodicReport a b #
Constructors
PeriodicReport | |
Fields
|
Instances
Bifunctor PeriodicReport | |
Defined in Hledger.Reports.ReportTypes Methods bimap :: (a -> b) -> (c -> d) -> PeriodicReport a c -> PeriodicReport b d first :: (a -> b) -> PeriodicReport a c -> PeriodicReport b c second :: (b -> c) -> PeriodicReport a b -> PeriodicReport a c | |
Functor (PeriodicReport a) | |
Defined in Hledger.Reports.ReportTypes Methods fmap :: (a0 -> b) -> PeriodicReport a a0 -> PeriodicReport a b # (<$) :: a0 -> PeriodicReport a b -> PeriodicReport a a0 # | |
(ToJSON a, ToJSON b) => ToJSON (PeriodicReport a b) | |
Defined in Hledger.Reports.ReportTypes Methods toJSON :: PeriodicReport a b -> Value toEncoding :: PeriodicReport a b -> Encoding toJSONList :: [PeriodicReport a b] -> Value toEncodingList :: [PeriodicReport a b] -> Encoding | |
Generic (PeriodicReport a b) | |
Defined in Hledger.Reports.ReportTypes Associated Types type Rep (PeriodicReport a b) :: Type -> Type Methods from :: PeriodicReport a b -> Rep (PeriodicReport a b) x to :: Rep (PeriodicReport a b) x -> PeriodicReport a b | |
(Show a, Show b) => Show (PeriodicReport a b) | |
Defined in Hledger.Reports.ReportTypes Methods showsPrec :: Int -> PeriodicReport a b -> ShowS show :: PeriodicReport a b -> String showList :: [PeriodicReport a b] -> ShowS | |
HasAmounts b => HasAmounts (PeriodicReport a b) | |
Defined in Hledger.Reports.ReportTypes Methods styleAmounts :: Map CommoditySymbol AmountStyle -> PeriodicReport a b -> PeriodicReport a b # | |
HasAmounts b => HasAmounts (Text, PeriodicReport a b, Bool) | |
Defined in Hledger.Reports.ReportTypes Methods styleAmounts :: Map CommoditySymbol AmountStyle -> (Text, PeriodicReport a b, Bool) -> (Text, PeriodicReport a b, Bool) # | |
type Rep (PeriodicReport a b) | |
Defined in Hledger.Reports.ReportTypes type Rep (PeriodicReport a b) = D1 ('MetaData "PeriodicReport" "Hledger.Reports.ReportTypes" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "PeriodicReport" 'PrefixI 'True) (S1 ('MetaSel ('Just "prDates") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [DateSpan]) :*: (S1 ('MetaSel ('Just "prRows") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [PeriodicReportRow a b]) :*: S1 ('MetaSel ('Just "prTotals") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PeriodicReportRow () b))))) |
data PeriodicReportRow a b #
Constructors
PeriodicReportRow | |
Fields
|
Instances
Bifunctor PeriodicReportRow | |
Defined in Hledger.Reports.ReportTypes Methods bimap :: (a -> b) -> (c -> d) -> PeriodicReportRow a c -> PeriodicReportRow b d first :: (a -> b) -> PeriodicReportRow a c -> PeriodicReportRow b c second :: (b -> c) -> PeriodicReportRow a b -> PeriodicReportRow a c | |
Functor (PeriodicReportRow a) | |
Defined in Hledger.Reports.ReportTypes Methods fmap :: (a0 -> b) -> PeriodicReportRow a a0 -> PeriodicReportRow a b # (<$) :: a0 -> PeriodicReportRow a b -> PeriodicReportRow a a0 # | |
(ToJSON b, ToJSON a) => ToJSON (PeriodicReportRow a b) | |
Defined in Hledger.Reports.ReportTypes Methods toJSON :: PeriodicReportRow a b -> Value toEncoding :: PeriodicReportRow a b -> Encoding toJSONList :: [PeriodicReportRow a b] -> Value toEncodingList :: [PeriodicReportRow a b] -> Encoding | |
Semigroup b => Semigroup (PeriodicReportRow a b) | |
Defined in Hledger.Reports.ReportTypes Methods (<>) :: PeriodicReportRow a b -> PeriodicReportRow a b -> PeriodicReportRow a b sconcat :: NonEmpty (PeriodicReportRow a b) -> PeriodicReportRow a b stimes :: Integral b0 => b0 -> PeriodicReportRow a b -> PeriodicReportRow a b | |
Generic (PeriodicReportRow a b) | |
Defined in Hledger.Reports.ReportTypes Associated Types type Rep (PeriodicReportRow a b) :: Type -> Type Methods from :: PeriodicReportRow a b -> Rep (PeriodicReportRow a b) x to :: Rep (PeriodicReportRow a b) x -> PeriodicReportRow a b | |
(Show a, Show b) => Show (PeriodicReportRow a b) | |
Defined in Hledger.Reports.ReportTypes Methods showsPrec :: Int -> PeriodicReportRow a b -> ShowS show :: PeriodicReportRow a b -> String showList :: [PeriodicReportRow a b] -> ShowS | |
HasAmounts b => HasAmounts (PeriodicReportRow a b) | |
Defined in Hledger.Reports.ReportTypes Methods styleAmounts :: Map CommoditySymbol AmountStyle -> PeriodicReportRow a b -> PeriodicReportRow a b # | |
type Rep (PeriodicReportRow a b) | |
Defined in Hledger.Reports.ReportTypes type Rep (PeriodicReportRow a b) = D1 ('MetaData "PeriodicReportRow" "Hledger.Reports.ReportTypes" "hledger-lib-1.32.3-DKfJdY2gc0PiAvD6gkPRg" 'False) (C1 ('MetaCons "PeriodicReportRow" 'PrefixI 'True) ((S1 ('MetaSel ('Just "prrName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "prrAmounts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [b])) :*: (S1 ('MetaSel ('Just "prrTotal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b) :*: S1 ('MetaSel ('Just "prrAverage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)))) |
type Total = MixedAmount #
Constructors
ZipList | |
Fields
|
Instances
Foldable ZipList | |
Defined in Control.Applicative Methods fold :: Monoid m => ZipList m -> m foldMap :: Monoid m => (a -> m) -> ZipList a -> m foldMap' :: Monoid m => (a -> m) -> ZipList a -> m foldr :: (a -> b -> b) -> b -> ZipList a -> b # foldr' :: (a -> b -> b) -> b -> ZipList a -> b foldl :: (b -> a -> b) -> b -> ZipList a -> b # foldl' :: (b -> a -> b) -> b -> ZipList a -> b # foldr1 :: (a -> a -> a) -> ZipList a -> a # foldl1 :: (a -> a -> a) -> ZipList a -> a # elem :: Eq a => a -> ZipList a -> Bool # maximum :: Ord a => ZipList a -> a # minimum :: Ord a => ZipList a -> a # | |
Traversable ZipList | |
Alternative ZipList | |
Applicative ZipList | |
Functor ZipList | |
NFData1 ZipList | |
Defined in Control.DeepSeq | |
Generic1 ZipList | |
Data a => Data (ZipList a) | |
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ZipList a -> c (ZipList a) gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ZipList a) toConstr :: ZipList a -> Constr dataTypeOf :: ZipList a -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ZipList a)) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ZipList a)) gmapT :: (forall b. Data b => b -> b) -> ZipList a -> ZipList a gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ZipList a -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ZipList a -> r gmapQ :: (forall d. Data d => d -> u) -> ZipList a -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> ZipList a -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) | |
Generic (ZipList a) | |
IsList (ZipList a) | |
Read a => Read (ZipList a) | |
Defined in Control.Applicative | |
Show a => Show (ZipList a) | |
NFData a => NFData (ZipList a) | |
Defined in Control.DeepSeq | |
Eq a => Eq (ZipList a) | |
Ord a => Ord (ZipList a) | |
MonoFunctor (ZipList a) | |
MonoPointed (ZipList a) | |
Defined in Data.MonoTraversable | |
type Rep1 ZipList | |
Defined in Control.Applicative | |
type Rep (ZipList a) | |
Defined in Control.Applicative | |
type Item (ZipList a) | |
Defined in GHC.IsList type Item (ZipList a) = a | |
type Element (ZipList a) | |
Defined in Data.MonoTraversable type Element (ZipList a) = a |
newtype WrappedArrow (a :: Type -> Type -> Type) b c #
Constructors
WrapArrow | |
Fields
|
Instances
Generic1 (WrappedArrow a b :: Type -> Type) | |
Defined in Control.Applicative Associated Types type Rep1 (WrappedArrow a b) :: k -> Type Methods from1 :: forall (a0 :: k). WrappedArrow a b a0 -> Rep1 (WrappedArrow a b) a0 to1 :: forall (a0 :: k). Rep1 (WrappedArrow a b) a0 -> WrappedArrow a b a0 | |
(ArrowZero a, ArrowPlus a) => Alternative (WrappedArrow a b) | |
Defined in Control.Applicative Methods empty :: WrappedArrow a b a0 # (<|>) :: WrappedArrow a b a0 -> WrappedArrow a b a0 -> WrappedArrow a b a0 # some :: WrappedArrow a b a0 -> WrappedArrow a b [a0] # many :: WrappedArrow a b a0 -> WrappedArrow a b [a0] # | |
Arrow a => Applicative (WrappedArrow a b) | |
Defined in Control.Applicative Methods pure :: a0 -> WrappedArrow a b a0 # (<*>) :: WrappedArrow a b (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 # liftA2 :: (a0 -> b0 -> c) -> WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b c # (*>) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b b0 # (<*) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 # | |
Arrow a => Functor (WrappedArrow a b) | |
Defined in Control.Applicative Methods fmap :: (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 # (<$) :: a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 # | |
(Typeable a, Typeable b, Typeable c, Data (a b c)) => Data (WrappedArrow a b c) | |
Defined in Data.Data Methods gfoldl :: (forall d b0. Data d => c0 (d -> b0) -> d -> c0 b0) -> (forall g. g -> c0 g) -> WrappedArrow a b c -> c0 (WrappedArrow a b c) gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (WrappedArrow a b c) toConstr :: WrappedArrow a b c -> Constr dataTypeOf :: WrappedArrow a b c -> DataType dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (WrappedArrow a b c)) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (WrappedArrow a b c)) gmapT :: (forall b0. Data b0 => b0 -> b0) -> WrappedArrow a b c -> WrappedArrow a b c gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedArrow a b c -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedArrow a b c -> r gmapQ :: (forall d. Data d => d -> u) -> WrappedArrow a b c -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedArrow a b c -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) | |
Generic (WrappedArrow a b c) | |
Defined in Control.Applicative Associated Types type Rep (WrappedArrow a b c) :: Type -> Type Methods from :: WrappedArrow a b c -> Rep (WrappedArrow a b c) x to :: Rep (WrappedArrow a b c) x -> WrappedArrow a b c | |
Arrow a => MonoFunctor (WrappedArrow a b c) | |
Defined in Data.MonoTraversable Methods omap :: (Element (WrappedArrow a b c) -> Element (WrappedArrow a b c)) -> WrappedArrow a b c -> WrappedArrow a b c | |
Arrow a => MonoPointed (WrappedArrow a b c) | |
Defined in Data.MonoTraversable Methods opoint :: Element (WrappedArrow a b c) -> WrappedArrow a b c | |
type Rep1 (WrappedArrow a b :: Type -> Type) | |
Defined in Control.Applicative type Rep1 (WrappedArrow a b :: Type -> Type) = D1 ('MetaData "WrappedArrow" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapArrow" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapArrow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (a b)))) | |
type Rep (WrappedArrow a b c) | |
Defined in Control.Applicative type Rep (WrappedArrow a b c) = D1 ('MetaData "WrappedArrow" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapArrow" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapArrow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (a b c)))) | |
type Element (WrappedArrow a b c) | |
Defined in Data.MonoTraversable type Element (WrappedArrow a b c) = c |
newtype WrappedMonad (m :: Type -> Type) a #
Constructors
WrapMonad | |
Fields
|
Instances
Generic1 (WrappedMonad m :: Type -> Type) | |
Defined in Control.Applicative Associated Types type Rep1 (WrappedMonad m) :: k -> Type Methods from1 :: forall (a :: k). WrappedMonad m a -> Rep1 (WrappedMonad m) a to1 :: forall (a :: k). Rep1 (WrappedMonad m) a -> WrappedMonad m a | |
MonadPlus m => Alternative (WrappedMonad m) | |
Defined in Control.Applicative Methods empty :: WrappedMonad m a # (<|>) :: WrappedMonad m a -> WrappedMonad m a -> WrappedMonad m a # some :: WrappedMonad m a -> WrappedMonad m [a] # many :: WrappedMonad m a -> WrappedMonad m [a] # | |
Monad m => Applicative (WrappedMonad m) | |
Defined in Control.Applicative Methods pure :: a -> WrappedMonad m a # (<*>) :: WrappedMonad m (a -> b) -> WrappedMonad m a -> WrappedMonad m b # liftA2 :: (a -> b -> c) -> WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m c # (*>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b # (<*) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m a # | |
Monad m => Functor (WrappedMonad m) | |
Defined in Control.Applicative Methods fmap :: (a -> b) -> WrappedMonad m a -> WrappedMonad m b # (<$) :: a -> WrappedMonad m b -> WrappedMonad m a # | |
Monad m => Monad (WrappedMonad m) | |
Defined in Control.Applicative Methods (>>=) :: WrappedMonad m a -> (a -> WrappedMonad m b) -> WrappedMonad m b # (>>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b # return :: a -> WrappedMonad m a # | |
(Typeable m, Typeable a, Data (m a)) => Data (WrappedMonad m a) | |
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WrappedMonad m a -> c (WrappedMonad m a) gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (WrappedMonad m a) toConstr :: WrappedMonad m a -> Constr dataTypeOf :: WrappedMonad m a -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (WrappedMonad m a)) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (WrappedMonad m a)) gmapT :: (forall b. Data b => b -> b) -> WrappedMonad m a -> WrappedMonad m a gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonad m a -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonad m a -> r gmapQ :: (forall d. Data d => d -> u) -> WrappedMonad m a -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedMonad m a -> u gmapM :: Monad m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) gmapMp :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) gmapMo :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) | |
Generic (WrappedMonad m a) | |
Defined in Control.Applicative Associated Types type Rep (WrappedMonad m a) :: Type -> Type Methods from :: WrappedMonad m a -> Rep (WrappedMonad m a) x to :: Rep (WrappedMonad m a) x -> WrappedMonad m a | |
Monad m => MonoFunctor (WrappedMonad m a) | |
Defined in Data.MonoTraversable Methods omap :: (Element (WrappedMonad m a) -> Element (WrappedMonad m a)) -> WrappedMonad m a -> WrappedMonad m a | |
Monad m => MonoPointed (WrappedMonad m a) | |
Defined in Data.MonoTraversable Methods opoint :: Element (WrappedMonad m a) -> WrappedMonad m a | |
type Rep1 (WrappedMonad m :: Type -> Type) | |
Defined in Control.Applicative type Rep1 (WrappedMonad m :: Type -> Type) = D1 ('MetaData "WrappedMonad" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapMonad" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapMonad") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 m))) | |
type Rep (WrappedMonad m a) | |
Defined in Control.Applicative type Rep (WrappedMonad m a) = D1 ('MetaData "WrappedMonad" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapMonad" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapMonad") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (m a)))) | |
type Element (WrappedMonad m a) | |
Defined in Data.MonoTraversable type Element (WrappedMonad m a) = a |
data IOErrorType #
Instances
Show IOErrorType | |
Defined in GHC.IO.Exception Methods showsPrec :: Int -> IOErrorType -> ShowS show :: IOErrorType -> String showList :: [IOErrorType] -> ShowS | |
Eq IOErrorType | |
Defined in GHC.IO.Exception |
pattern MixedAmountKeyNoPrice :: !CommoditySymbol -> MixedAmountKey #
pattern MixedAmountKeyTotalPrice :: !CommoditySymbol -> !CommoditySymbol -> MixedAmountKey #
pattern MixedAmountKeyUnitPrice :: !CommoditySymbol -> !CommoditySymbol -> !Quantity -> MixedAmountKey #
pattern April :: MonthOfYear #
pattern August :: MonthOfYear #
pattern BeforeCommonEra :: Integer -> Year #
pattern December :: MonthOfYear #
pattern February :: MonthOfYear #
pattern January :: MonthOfYear #
pattern July :: MonthOfYear #
pattern June :: MonthOfYear #
pattern March :: MonthOfYear #
pattern May :: MonthOfYear #
pattern November :: MonthOfYear #
pattern October :: MonthOfYear #
pattern September :: MonthOfYear #
pattern YearMonthDay :: Year -> MonthOfYear -> DayOfMonth -> Day #
cycle :: HasCallStack => [a] -> [a] #
stripPrefix :: Eq a => [a] -> [a] -> Maybe [a] #
when :: Applicative f => Bool -> f () -> f () #
head :: HasCallStack => [a] -> a #
tail :: HasCallStack => [a] -> [a] #
init :: HasCallStack => [a] -> [a] #
last :: HasCallStack => [a] -> a #
proc :: FilePath -> [String] -> CreateProcess #
argsToCliOpts :: [String] -> [String] -> IO CliOpts Source #
Parse hledger CLI options from these command line arguments and add-on command names, or raise any error.
detailedversionflag :: Flag RawOpts Source #
A hidden flag just for the hledger executable.
flattreeflags :: Bool -> [Flag RawOpts] Source #
Flags for selecting flat/tree mode, used for reports organised by account. With a True argument, shows some extra help about inclusive/exclusive amounts.
Common flags that are accepted but not shown in --help, such as --effective, --aux-date.
inputflags :: [Flag RawOpts] Source #
Common input-related flags: --file, --rules-file, --alias...
reportflags :: [Flag RawOpts] Source #
Common report-related flags: --period, --cost, etc.
outputFormatFlag :: [String] -> Flag RawOpts Source #
Common output-related flags: --output-file, --output-format...
generalflagsgroup1 :: (String, [Flag RawOpts]) Source #
generalflagsgroup2 :: (String, [Flag RawOpts]) Source #
generalflagsgroup3 :: (String, [Flag RawOpts]) Source #
defMode :: Mode RawOpts Source #
An empty cmdargs mode to use as a template. Modes describe the top-level command, ie the program, or a subcommand, telling cmdargs how to parse a command line and how to generate the command's usage text.
defCommandMode :: [Name] -> Mode RawOpts Source #
A cmdargs mode suitable for a hledger built-in command with the given names (primary name + optional aliases). The usage message shows [QUERY] as argument.
addonCommandMode :: Name -> Mode RawOpts Source #
A cmdargs mode representing the hledger add-on command with the given name, providing hledger's common inputreportinghelp flags. Just used when invoking addons.
hledgerCommandMode :: CommandDoc -> [Flag RawOpts] -> [(String, [Flag RawOpts])] -> [Flag RawOpts] -> ([Arg RawOpts], Maybe (Arg RawOpts)) -> Mode RawOpts Source #
Build a cmdarg mode for a hledger command, from a help template and flag/argument specifications. Reduces boilerplate a little, though the complicated cmdargs flag and argument specs are still required.
showModeUsage :: Mode a -> String Source #
Get a mode's usage message as a nicely wrapped string.
withAliases :: String -> [String] -> String Source #
Add command aliases to the command's help string.
likelyExecutablesInPath :: IO [String] Source #
Get all sorted unique filenames in the current user's PATH. We do not currently filter out non-file objects or files without execute permission.
hledgerExecutablesInPath :: IO [String] Source #
Get the sorted unique filenames of all hledger-* executables in the current user's PATH. These are files in any of the PATH directories, named hledger-*, with either no extension (and no periods in the name) or one of the addonExtensions. We do not currently filter out non-file objects or files without execute permission.
ensureDebugHasArg :: (Eq (t Char), IsString (t Char), Foldable t) => [t Char] -> [t Char] Source #
Convert an argument-less --debug flag to --debug=1 in the given arguments list. Used by hledgeruiweb to make their command line parsing easier somehow.
defcliopts :: CliOpts Source #
getHledgerCliOpts' :: Mode RawOpts -> [String] -> IO CliOpts Source #
A helper for addon commands: this parses options and arguments from the current command line using the given hledger-style cmdargs mode, and returns a CliOpts. Or, with --help or -h present, it prints long or short help, and exits the program. When --debug is present, also prints some debug output. Note this is not used by the main hledger executable.
The help texts are generated from the mode. Long help includes the full usage description generated by cmdargs (including all supported options), framed by whatever pre- and postamble text the mode specifies. It's intended that this forms a complete help document or manual.
Short help is a truncated version of the above: the preamble and the first part of the usage, up to the first line containing "flags:" (normally this marks the start of the common hledger flags); plus a mention of --help and the (presumed supported) common hledger options not displayed.
Tips: Empty lines in the pre/postamble are removed by cmdargs; add a space character to preserve them.
rawOptsToCliOpts :: RawOpts -> IO CliOpts Source #
Parse raw option string values to the desired final data types. Any relative smart dates will be converted to fixed dates based on today's date. Parsing failures will raise an error. Also records the terminal width, if supported.
outputFormats :: [String] Source #
All the output formats known by any command, for outputFormatFromOpts. To automatically infer it from -o/--output-file, it needs to be listed here.
defaultOutputFormat :: String Source #
journalFilePathFromOpts :: CliOpts -> IO [String] Source #
Get the (tilde-expanded, absolute) journal file path from 1. options, 2. an environment variable, or 3. the default. Actually, returns one or more file paths. There will be more than one if multiple -f options were provided. File paths can have a READER: prefix naming a reader/data format.
rulesFilePathFromOpts :: CliOpts -> IO (Maybe FilePath) Source #
Get the (tilde-expanded) rules file path from options, if any.
outputFileFromOpts :: CliOpts -> IO (Maybe FilePath) Source #
Get the expanded, absolute output file path specified by an -o/--output-file options, or nothing, meaning stdout.
outputFormatFromOpts :: CliOpts -> String Source #
Get the output format from the --output-format option, otherwise from a recognised file extension in the --output-file option, otherwise the default (txt).
defaultWidth :: Int Source #
Default width for hledger console output, when not otherwise specified.
replaceNumericFlags :: [String] -> [String] Source #
Replace any numeric flags (eg -2) with their long form (--depth 2), as I'm guessing cmdargs doesn't support this directly.
registerWidthsFromOpts :: CliOpts -> (Int, Maybe Int) Source #
Get the width in characters to use for the register command's console output,
and also the description column width if specified (following the main width, comma-separated).
The widths will be as follows:
no --width flag - overall width is the available width (COLUMNS, or posix terminal width, or 80); description width is unspecified (auto)
--width W - overall width is W, description width is auto
--width W,D - overall width is W, description width is D
Will raise a parse error for a malformed --width argument.
hledgerAddons :: IO [String] Source #
Get the sorted unique canonical names of hledger addon commands found in the current user's PATH. These are used in command line parsing and to display the commands list.
Canonical addon names are the filenames of hledger-* executables in PATH, without the "hledger-" prefix, and without the file extension except when it's needed for disambiguation (see below).
When there are exactly two versions of an executable (same base name, different extensions) that look like a source and compiled pair (one has .exe, .com, or no extension), the source version will be excluded (even if it happens to be newer). When there are three or more versions (or two versions that don't look like a source/compiled pair), they are all included, with file extensions intact.
topicForMode :: Mode a -> Topic Source #
Get the most appropriate documentation topic for a mode. Currently, that is either the hledger, hledger-ui or hledger-web manual.
intercalate :: [a] -> [[a]] -> [a] #
exitSuccess :: IO a #
isPrefixOf :: Eq a => [a] -> [a] -> Bool #
isSuffixOf :: Eq a => [a] -> [a] -> Bool #
testcmd :: CliOpts -> Journal -> IO () Source #
The test command, which runs the hledger and hledger-lib packages' unit tests. This command also accepts tasty test runner options, written after a -- (double hyphen).
Unlike most hledger commands, this one does not read the user's journal.
A Journal
argument remains in the type signature, but it should
not be used (and would raise an error).
builtinCommands :: [(Mode RawOpts, CliOpts -> Journal -> IO ())] Source #
The cmdargs subcommand mode (for command-line parsing) and IO action (for doing the command's work) for each builtin command. Command actions take parsed CLI options and a (lazy) finalised journal.
builtinCommandNames :: [String] Source #
All names and aliases of the builtin commands.
findBuiltinCommand :: String -> Maybe (Mode RawOpts, CliOpts -> Journal -> IO ()) Source #
Look up a builtin command's mode and action by exact command name or alias.
knownAddonCommands :: [String] Source #
Canonical names of the known addon commands which have a slot in the commands list, in alphabetical order.
knownCommands :: [String] Source #
Canonical names of all commands which have a slot in the commands list, in alphabetical order. These include the builtin commands and the known addon commands.
printCommandsList :: String -> [String] -> IO () Source #
Print the commands list, with a pager if appropriate, customising the commandsList template above with the given version string and the installed addons. Uninstalled known addons will be removed from the list, installed known addons will have the + prefix removed, and installed unknown addons will be added under Misc.
isAlphaNum :: Char -> Bool #
accountsmode :: Mode RawOpts Source #
Command line options for this command.
printf :: PrintfType r => String -> r #
add :: CliOpts -> Journal -> IO () Source #
Read multiple transactions from the console, prompting for each field, and append them to the journal file. If the journal came from stdin, this command has no effect.
appendToJournalFileOrStdout :: FilePath -> Text -> IO () Source #
Append a string, typically one or more transactions, to a journal file, or if the file is "-", dump it to stdout. Tries to avoid excess whitespace.
XXX This writes unix line endings (n), some at least, even if the file uses dos line endings (rn), which could leave mixed line endings in the file. See also writeFileWithBackupIfChanged.
journalAddTransaction :: Journal -> CliOpts -> Transaction -> IO Journal Source #
Append this transaction to the journal's file and transaction list.
fromJust :: HasCallStack => Maybe a -> a #
formatTime :: FormatTime t => TimeLocale -> String -> t -> String #
postingsReportAsText :: CliOpts -> PostingsReport -> Text Source #
Render a register report as plain text suitable for console output.
journalSimilarTransaction :: CliOpts -> Journal -> Text -> Maybe Transaction Source #
aregister :: CliOpts -> Journal -> IO () Source #
Print an account register report for a specified account.
balancemode :: Mode RawOpts Source #
Command line options for this command.
balanceReportAsText :: ReportOpts -> BalanceReport -> Builder Source #
Render a single-column balance report as plain text.
balanceReportAsCsv :: ReportOpts -> BalanceReport -> CSV Source #
Render a single-column balance report as CSV.
balanceReportItemAsText :: ReportOpts -> BalanceReportItem -> (Builder, [Int]) Source #
Render one balance report line item as plain text suitable for console output (or whatever string format is specified). Note, prices will not be rendered, and differently-priced quantities of the same commodity will appear merged. The output will be one or more lines depending on the format and number of commodities.
multiBalanceRowAsCsvText :: ReportOpts -> [DateSpan] -> PeriodicReportRow a MixedAmount -> [[Text]] Source #
multiBalanceRowAsTableText :: ReportOpts -> PeriodicReportRow a MixedAmount -> [[WideBuilder]] Source #
multiBalanceReportAsText :: ReportOpts -> MultiBalanceReport -> Text Source #
Render a multi-column balance report as plain text suitable for console output.
multiBalanceReportAsCsv :: ReportOpts -> MultiBalanceReport -> CSV Source #
Render a multi-column balance report as CSV. The CSV will always include the initial headings row, and will include the final totals row unless --no-total is set.
multiBalanceReportAsHtml :: ReportOpts -> MultiBalanceReport -> Html () Source #
Render a multi-column balance report as HTML.
multiBalanceReportHtmlRows :: ReportOpts -> MultiBalanceReport -> (Html (), [Html ()], [Html ()]) Source #
Render the HTML table rows for a MultiBalanceReport. Returns the heading row, 0 or more body rows, and the totals row if enabled.
multiBalanceReportHtmlFootRow :: ReportOpts -> [Text] -> Html () Source #
Render one MultiBalanceReport totals row as a HTML table row.
balanceReportAsTable :: ReportOpts -> MultiBalanceReport -> Table Text Text WideBuilder Source #
Build a Table
from a multi-column balance report.
balanceReportTableAsText :: ReportOpts -> Table Text Text WideBuilder -> Builder #
fromGregorian :: Year -> MonthOfYear -> DayOfMonth -> Day #
maximumMay :: Ord a => [a] -> Maybe a #
partitionEithers :: [Either a b] -> ([a], [b]) #
commoditiesmode :: Mode RawOpts Source #
Command line options for this command.
exitFailure :: IO a #
threadDelay :: Int -> IO () #
callProcess :: FilePath -> [String] -> IO () #
dropWhileEnd :: (a -> Bool) -> [a] -> [a] #
descriptionsmode :: Mode RawOpts Source #
Command line options for this command.
help' :: CliOpts -> Journal -> IO () Source #
Display the hledger manual in various formats. You can select a docs viewer with one of the `--info`, `--man`, `--pager` flags. Otherwise it will use the first available of: info, man, $PAGER, less, stdout (and always stdout if output is non-interactive).
embedFileRelative :: FilePath -> Q Exp #
importmode :: Mode RawOpts Source #
payeesmode :: Mode RawOpts Source #
Command line options for this command.
pricesmode :: Mode RawOpts Source #
transactionWithMostlyOriginalPostings :: Transaction -> Transaction Source #
Replace this transaction's postings with the original postings if any, but keep the current possibly rewritten account names, and the inferred values of any auto postings. This is mainly for showing transactions with the amounts in their original journal format.
intersperse :: a -> [a] -> [a] #
minimumDef :: Ord a => a -> [a] -> a #
postingsReportItemAsText :: CliOpts -> Int -> Int -> (PostingsReportItem, [WideBuilder], [WideBuilder]) -> Builder Source #
Render one register report line item as plain text. Layout is like so:
width (specified, terminal width, or 80) --------------------
date (10) description account amount (12) balance (12)
DDDDDDDDDD dddddddddddddddddddd aaaaaaaaaaaaaaaaaaa AAAAAAAAAAAA AAAAAAAAAAAA
If description's width is specified, account will use the remaining space.
Otherwise, description and account divide up the space equally.
With a report interval, the layout is like so:
width (specified, terminal width, or 80) --------------------
date (21) account amount (12) balance (12)
DDDDDDDDDDDDDDDDDDDDD aaaaaaaaaaaaaaaaaaaaaaaaaaaaa AAAAAAAAAAAA AAAAAAAAAAAA
date and description are shown for the first posting of a transaction only.
Returns a string which can be multi-line, eg if the running balance has multiple commodities. Does not yet support formatting control like balance reports.
Also returns the natural width (without padding) of the amount and balance fields.
writeOutputLazyText :: CliOpts -> Text -> IO () Source #
Write some output to stdout or to a file selected by --output-file. If the file exists it will be overwritten. This function operates on Lazy Text values.
compoundBalanceCommandMode :: CompoundBalanceCommandSpec -> Mode RawOpts Source #
Generate a cmdargs option-parsing mode from a compound balance command specification.
compoundBalanceCommand :: CompoundBalanceCommandSpec -> CliOpts -> Journal -> IO () Source #
Generate a runnable command from a compound balance command specification.
unsupportedOutputFormatError :: String -> String Source #
Standard error message for a bad output format specified with -O/-o.
printHelpForTopic :: Tool -> Maybe Topic -> IO () Source #
Print plain text help for this tool. Takes an optional topic argument for convenience but it is currently ignored.
runManForTopic :: Tool -> Maybe Topic -> IO () Source #
Display a man page for this tool, scrolled to the given topic if provided, using the "man" executable in $PATH. Note when a topic is provided we force man to use the "less" executable in $PATH, ignoring $MANPAGER and $PAGER.
runInfoForTopic :: Tool -> Maybe Topic -> IO () Source #
Display an info manual for this topic, opened at the given topic if provided, using the "info" executable in $PATH.
runPagerForTopic :: Tool -> Maybe Topic -> IO () Source #
Display plain text help for this tool, scrolled to the given topic if provided, using the given pager executable. Note when a topic is provided we ignore the provided pager and use the "less" executable in $PATH.
formatString :: Bool -> Maybe Int -> Maybe Int -> String -> String #
withJournalDo :: CliOpts -> (Journal -> IO a) -> IO a Source #
Parse the user's specified journal file(s) as a Journal, maybe apply some transformations according to options, and run a hledger command with it. Or, throw an error.
writeOutput :: CliOpts -> String -> IO () Source #
Write some output to stdout or to a file selected by --output-file. If the file exists it will be overwritten.
journalTransform :: CliOpts -> Journal -> Journal Source #
Apply some extra post-parse transformations to the journal, if enabled by options. These happen after parsing and finalising the journal, but before report calculation. They are, in processing order:
- pivoting account names (--pivot)
- anonymising (--anonymise).
journalReload :: CliOpts -> ExceptT String IO Journal Source #
Re-read the journal file(s) specified by options, applying any transformations specified by options. Or return an error string. Reads the full journal, without filtering.
journalReloadIfChanged :: CliOpts -> Day -> Journal -> ExceptT String IO (Journal, Bool) Source #
Re-read the option-specified journal file(s), but only if any of them has changed since last read. (If the file is standard input, this will either do nothing or give an error, not tested yet). Returns a journal or error message, and a flag indicating whether it was re-read or not. Like withJournalDo and journalReload, reads the full journal, without filtering.
journalFileIsNewer :: Journal -> FilePath -> IO Bool Source #
Has the specified file changed since the journal was last read ? Typically this is one of the journal's journalFilePaths. These are not always real files, so the file's existence is tested first; for non-files the answer is always no.
openBrowserOn :: String -> IO ExitCode Source #
Attempt to open a web browser on the given url, all platforms.
writeFileWithBackup :: FilePath -> String -> IO () Source #
Back up this file with a (incrementing) numbered suffix, then overwrite it with this new text, or give an error.
writeFileWithBackupIfChanged :: FilePath -> Text -> IO Bool Source #
Back up this file with a (incrementing) numbered suffix then overwrite it with this new text, or give an error, but only if the text is different from the current file contents, and return a flag indicating whether we did anything.
The given text should have unix line endings (n); the existing file content will be normalised to unix line endings before comparing the two. If the file is overwritten, the new file will have the current system's native line endings (n on unix, rn on windows). This could be different from the file's previous line endings, if working with a DOS file on unix or vice-versa.
pivotByOpts :: CliOpts -> Journal -> Journal Source #
Apply the pivot transformation on a journal (replacing account names by a different field's value), if option is present.
anonymiseByOpts :: CliOpts -> Journal -> Journal Source #
Raise an error, announcing the rename to --obfuscate and its limitations.
postingsOrTransactionsReportAsText :: Bool -> CliOpts -> (Int -> Int -> (a, [WideBuilder], [WideBuilder]) -> Builder) -> (a -> MixedAmount) -> (a -> MixedAmount) -> [a] -> Builder Source #
Render a PostingsReport
or AccountTransactionsReport
as Text,
determining the appropriate starting widths and increasing as necessary.
getModificationTime :: FilePath -> IO UTCTime #
getDirectoryContents :: FilePath -> IO [FilePath] #
doesFileExist :: FilePath -> IO Bool #
splitFileName :: FilePath -> (String, String) #
takeDirectory :: FilePath -> FilePath #
readProcessWithExitCode :: FilePath -> [String] -> String -> IO (ExitCode, String, String) #
packageversion :: PackageVersion Source #
The "1.32.3" string defined with -D in this package's package.yaml/.cabal file (by Shake setversion), if any. Normally a dotted number string with 1-3 components.
packagemajorversion :: PackageVersion Source #
Just the first 1-2 components of packageversion.
progname :: ProgramName Source #
The name of this package's main executable.
versionStringWith :: Either String GitInfo -> ProgramName -> PackageVersion -> VersionString Source #
Given possible git state info from the build directory (or an error message, which is ignored), the name of a program (executable) in the currently building package, and the package's version, make a complete version string. Here is the logic:
- Program name, OS and architecture are always shown.
- The package version is always shown.
- If there is git info at build time, the latest commit hash and commit date are shown, and (TODO, requires githash to use -uno for giDirty): if the working copy has uncommitted changes a + sign is appended.
- (TODO, requires adding --match support to githash: If there are tags matching THISPKG-[0-9]*, the latest one is used to calculate patch level (number of commits since tag), and if non-zero, it and the branch name are shown.)
Some example outputs:
- A homebrew binary, not built in git repo: hledger-ui 1.24, mac-aarch64
- A CI release build, built in git repo at release tag: hledger-ui 1.24.1-g455b35293-20211210, mac-x86_64
- (TODO) A dev build, built in git repo: hledger-ui 1.24.1+1-g4abd8ef10-20211210 (1.24-branch), mac-x86_64
This function requires git log to show the default (rfc2822-style) date format, so that must not be overridden by a log.date git config variable.
splitAtElement :: Eq a => a -> [a] -> [[a]] #
txnTieKnot :: Transaction -> Transaction #
(!!) :: HasCallStack => [a] -> Int -> a #
appendFile :: FilePath -> String -> IO () #
getContents :: IO String #
formatRealFloat :: RealFloat a => a -> FieldFormatter #
intToDigit :: Int -> Char #
foldl1' :: HasCallStack => (a -> a -> a) -> [a] -> a #
errorShortFormat :: a #
accountSetDeclarationInfo :: Journal -> Account -> Account #
accountTree :: AccountName -> [AccountName] -> Account #
accountsFromPostings :: [Posting] -> [Account] #
accountsLevels :: Account -> [[Account]] #
anyAccounts :: (Account -> Bool) -> Account -> Bool #
clipAccounts :: Int -> Account -> Account #
clipAccountsAndAggregate :: Maybe Int -> [Account] -> [Account] #
filterAccounts :: (Account -> Bool) -> Account -> [Account] #
flattenAccounts :: Account -> [Account] #
lookupAccount :: AccountName -> [Account] -> Maybe Account #
parentAccounts :: Account -> [Account] #
printAccounts :: Account -> IO () #
showAccounts :: Account -> String #
showAccountsBoringFlag :: Account -> String #
sortAccountNamesByDeclaration :: Journal -> Bool -> [AccountName] -> [AccountName] #
sortAccountTreeByAmount :: NormalSign -> Account -> Account #
sumAccounts :: Account -> Account #
accountLeafName :: AccountName -> Text #
accountNameComponents :: AccountName -> [Text] #
accountNameDrop :: Int -> AccountName -> AccountName #
accountNameFromComponents :: [Text] -> AccountName #
accountNameLevel :: AccountName -> Int #
accountNameToBeancount :: AccountName -> BeancountAccountName #
accountNameTreeFrom :: [AccountName] -> Tree AccountName #
accountNameType :: Map AccountName AccountType -> AccountName -> Maybe AccountType #
acctsepchar :: Char #
beancountTopLevelAccounts :: IsString a => [a] #
clipAccountName :: Maybe Int -> AccountName -> AccountName #
clipOrEllipsifyAccountName :: Maybe Int -> AccountName -> AccountName #
concatAccountNames :: [AccountName] -> AccountName #
elideAccountName :: Int -> AccountName -> AccountName #
escapeName :: AccountName -> Text #
expandAccountName :: AccountName -> [AccountName] #
expandAccountNames :: [AccountName] -> [AccountName] #
isAccountNamePrefixOf :: AccountName -> AccountName -> Bool #
isSubAccountNameOf :: AccountName -> AccountName -> Bool #
joinAccountNames :: AccountName -> AccountName -> AccountName #
parentAccountNames :: AccountName -> [AccountName] #
subAccountNamesFrom :: [AccountName] -> AccountName -> [AccountName] #
topAccountNames :: [AccountName] -> [AccountName] #
amountCost :: Amount -> Amount #
amountDisplayPrecision :: Amount -> Word8 #
amountInternalPrecision :: Amount -> Word8 #
amountIsZero :: Amount -> Bool #
amountLooksZero :: Amount -> Bool #
amountSetFullPrecision :: Amount -> Amount #
amountSetFullPrecisionOr :: Maybe Word8 -> Amount -> Amount #
amountSetPrecision :: AmountPrecision -> Amount -> Amount #
amountSetPrecisionMax :: Word8 -> Amount -> Amount #
amountSetPrecisionMin :: Word8 -> Amount -> Amount #
amountSetStyles :: Map CommoditySymbol AmountStyle -> Amount -> Amount #
amountStripCost :: Amount -> Amount #
amountStylesSetRounding :: Rounding -> Map CommoditySymbol AmountStyle -> Map CommoditySymbol AmountStyle #
amountUnstyled :: Amount -> Amount #
amountWithCommodity :: CommoditySymbol -> Amount -> Amount #
amounts :: MixedAmount -> [Amount] #
amountsPreservingZeros :: MixedAmount -> [Amount] #
amountsRaw :: MixedAmount -> [Amount] #
averageMixedAmounts :: [MixedAmount] -> MixedAmount #
canonicaliseAmount :: Map CommoditySymbol AmountStyle -> Amount -> Amount #
canonicaliseMixedAmount :: Map CommoditySymbol AmountStyle -> MixedAmount -> MixedAmount #
cshowAmount :: Amount -> String #
defaultMaxPrecision :: Word8 #
divideAmount :: Quantity -> Amount -> Amount #
divideMixedAmount :: Quantity -> MixedAmount -> MixedAmount #
filterMixedAmount :: (Amount -> Bool) -> MixedAmount -> MixedAmount #
invertAmount :: Amount -> Amount #
isMissingMixedAmount :: MixedAmount -> Bool #
isNegativeAmount :: Amount -> Bool #
isNegativeMixedAmount :: MixedAmount -> Maybe Bool #
isNonsimpleCommodityChar :: Char -> Bool #
maAddAmount :: MixedAmount -> Amount -> MixedAmount #
maAddAmounts :: Foldable t => MixedAmount -> t Amount -> MixedAmount #
maCommodities :: MixedAmount -> Set CommoditySymbol #
maIsNonZero :: MixedAmount -> Bool #
maIsZero :: MixedAmount -> Bool #
maMinus :: MixedAmount -> MixedAmount -> MixedAmount #
maNegate :: MixedAmount -> MixedAmount #
maPlus :: MixedAmount -> MixedAmount -> MixedAmount #
maSum :: Foldable t => t MixedAmount -> MixedAmount #
mapMixedAmount :: (Amount -> Amount) -> MixedAmount -> MixedAmount #
missingamt :: Amount #
mixed :: Foldable t => t Amount -> MixedAmount #
mixedAmount :: Amount -> MixedAmount #
mixedAmountIsZero :: MixedAmount -> Bool #
mixedAmountLooksZero :: MixedAmount -> Bool #
mixedAmountSetPrecisionMax :: Word8 -> MixedAmount -> MixedAmount #
mixedAmountSetPrecisionMin :: Word8 -> MixedAmount -> MixedAmount #
mixedAmountSetStyles :: Map CommoditySymbol AmountStyle -> MixedAmount -> MixedAmount #
multiplyAmount :: Quantity -> Amount -> Amount #
multiplyMixedAmount :: Quantity -> MixedAmount -> MixedAmount #
setAmountInternalPrecision :: Word8 -> Amount -> Amount #
showAmount :: Amount -> String #
showAmountB :: AmountDisplayOpts -> Amount -> WideBuilder #
showAmountCostB :: Amount -> WideBuilder #
showAmountDebug :: Amount -> String #
showAmountWith :: AmountDisplayOpts -> Amount -> String #
showAmountWithZeroCommodity :: Amount -> String #
showAmountWithoutPrice :: Amount -> String #
showCommoditySymbol :: Text -> Text #
showMixedAmount :: MixedAmount -> String #
showMixedAmountDebug :: MixedAmount -> String #
showMixedAmountElided :: Int -> Bool -> MixedAmount -> String #
showMixedAmountOneLine :: MixedAmount -> String #
showMixedAmountOneLineWithoutPrice :: Bool -> MixedAmount -> String #
showMixedAmountWith :: AmountDisplayOpts -> MixedAmount -> String #
showMixedAmountWithZeroCommodity :: MixedAmount -> String #
showMixedAmountWithoutPrice :: Bool -> MixedAmount -> String #
styleAmount :: Map CommoditySymbol AmountStyle -> Amount -> Amount #
styleMixedAmount :: Map CommoditySymbol AmountStyle -> MixedAmount -> MixedAmount #
unifyMixedAmount :: MixedAmount -> Maybe Amount #
withInternalPrecision :: Amount -> Word8 -> Amount #
withPrecision :: Amount -> AmountPrecision -> Amount #
balanceTransaction :: BalancingOpts -> Transaction -> Either String Transaction #
balanceTransactionHelper :: BalancingOpts -> Transaction -> Either String (Transaction, [(AccountName, MixedAmount)]) #
isTransactionBalanced :: BalancingOpts -> Transaction -> Bool #
journalBalanceTransactions :: BalancingOpts -> Journal -> Either String Journal #
journalCheckBalanceAssertions :: Journal -> Maybe String #
datesepchar :: forall (m :: Type -> Type). TextParser m Char #
datesepchars :: String #
daysInSpan :: DateSpan -> Maybe Integer #
elapsedSeconds :: Fractional a => UTCTime -> UTCTime -> a #
fixSmartDate :: Day -> SmartDate -> EFDay #
fixSmartDateStr :: Day -> Text -> Text #
fixSmartDateStrEither :: Day -> Text -> Either HledgerParseErrors Text #
fixSmartDateStrEither' :: Day -> Text -> Either HledgerParseErrors EFDay #
getCurrentDay :: IO Day #
getCurrentMonth :: IO Int #
getCurrentYear :: IO Integer #
groupByDateSpan :: Bool -> (a -> Day) -> [DateSpan] -> [a] -> [(DateSpan, [a])] #
intervalBoundaryBefore :: Interval -> Day -> Day #
isDateSepChar :: Char -> Bool #
parsePeriodExpr :: Day -> Text -> Either HledgerParseErrors (Interval, DateSpan) #
parsedateM :: String -> Maybe Day #
periodContainsDate :: Period -> Day -> Bool #
periodexprp :: forall (m :: Type -> Type). Day -> TextParser m (Interval, DateSpan) #
showDateSpan :: DateSpan -> Text #
showDateSpanDebug :: DateSpan -> String #
showDateSpanMonthAbbrev :: DateSpan -> Text #
showEFDate :: EFDay -> Text #
smartdate :: forall (m :: Type -> Type). TextParser m SmartDate #
spanContainsDate :: DateSpan -> Day -> Bool #
spanDefaultsFrom :: DateSpan -> DateSpan -> DateSpan #
spanEndYear :: DateSpan -> Maybe Year #
spanIntersect :: DateSpan -> DateSpan -> DateSpan #
spanStartYear :: DateSpan -> Maybe Year #
spansFromBoundaries :: Day -> [Day] -> [DateSpan] #
spansIntersect :: [DateSpan] -> DateSpan #
spansUnion :: [DateSpan] -> DateSpan #
tests_Dates :: TestTree #
yearp :: forall (m :: Type -> Type). TextParser m Integer #
makeAccountTagErrorExcerpt :: (AccountName, AccountDeclarationInfo) -> TagName -> (FilePath, Int, Maybe (Int, Maybe Int), Text) #
makePostingErrorExcerpt :: Posting -> (Posting -> Transaction -> Text -> Maybe (Int, Maybe Int)) -> (FilePath, Int, Maybe (Int, Maybe Int), Text) #
makeTransactionErrorExcerpt :: Transaction -> (Transaction -> Maybe (Int, Maybe Int)) -> (FilePath, Int, Maybe (Int, Maybe Int), Text) #
transactionFindPostingIndex :: (Posting -> Bool) -> Transaction -> Maybe Int #
addPriceDirective :: PriceDirective -> Journal -> Journal #
addTransaction :: Transaction -> Journal -> Journal #
canonicalStyleFrom :: [AmountStyle] -> AmountStyle #
commodityStylesFromAmounts :: [Amount] -> Either String (Map CommoditySymbol AmountStyle) #
dbgJournalAcctDeclOrder :: String -> Journal -> Journal #
filterJournalAmounts :: Query -> Journal -> Journal #
filterJournalPostings :: Query -> Journal -> Journal #
filterJournalRelatedPostings :: Query -> Journal -> Journal #
filterJournalTransactions :: Query -> Journal -> Journal #
filterTransactionAmounts :: Query -> Transaction -> Transaction #
filterTransactionPostingsExtra :: (AccountName -> Maybe AccountType) -> Query -> Transaction -> Transaction #
journalAccountNameTree :: Journal -> Tree AccountName #
journalAccountNames :: Journal -> [AccountName] #
journalAccountNamesUsed :: Journal -> [AccountName] #
journalAccountTags :: Journal -> AccountName -> [Tag] #
journalAccountType :: Journal -> AccountName -> Maybe AccountType #
journalAccountTypes :: Journal -> Map AccountName AccountType #
journalApplyAliases :: [AccountAlias] -> Journal -> Either RegexError Journal #
journalCommodities :: Journal -> Set CommoditySymbol #
journalCommodityStyles :: Journal -> Map CommoditySymbol AmountStyle #
journalCommodityStylesWith :: Rounding -> Journal -> Map CommoditySymbol AmountStyle #
journalConcat :: Journal -> Journal -> Journal #
journalConversionAccounts :: Journal -> [AccountName] #
journalDateSpan :: Bool -> Journal -> DateSpan #
journalDescriptions :: Journal -> [Text] #
journalEndDate :: Bool -> Journal -> Maybe Day #
journalFilePath :: Journal -> FilePath #
journalFilePaths :: Journal -> [FilePath] #
journalInferCommodityStyles :: Journal -> Either String Journal #
journalInferCostsFromEquity :: Journal -> Either String Journal #
journalInferEquityFromCosts :: Bool -> Journal -> Journal #
journalInheritedAccountTags :: Journal -> AccountName -> [Tag] #
journalLastDay :: Bool -> Journal -> Maybe Day #
journalLeafAccountNames :: Journal -> [AccountName] #
journalMapPostingAmounts :: (MixedAmount -> MixedAmount) -> Journal -> Journal #
journalMapTransactions :: (Transaction -> Transaction) -> Journal -> Journal #
journalMarkRedundantCosts :: Journal -> Either String Journal #
journalPayeesDeclared :: Journal -> [Payee] #
journalPayeesDeclaredOrUsed :: Journal -> [Payee] #
journalPayeesUsed :: Journal -> [Payee] #
journalPivot :: Text -> Journal -> Journal #
journalPostingAmounts :: Journal -> [MixedAmount] #
journalPostings :: Journal -> [Posting] #
journalReverse :: Journal -> Journal #
journalSetLastReadTime :: POSIXTime -> Journal -> Journal #
journalStartDate :: Bool -> Journal -> Maybe Day #
journalStyleAmounts :: Journal -> Either String Journal #
journalTagsDeclared :: Journal -> [TagName] #
journalTagsDeclaredOrUsed :: Journal -> [TagName] #
journalTagsUsed :: Journal -> [TagName] #
journalToCost :: ConversionOp -> Journal -> Journal #
journalTransactionAt :: Journal -> Integer -> Maybe Transaction #
journalTransactionsSimilarTo :: Journal -> Text -> Query -> SimilarityScore -> Int -> [(DateWeightedSimilarityScore, Age, SimilarityScore, Transaction)] #
nulljournal :: Journal #
samplejournalMaybeExplicit :: Bool -> Journal #
showJournalAmountsDebug :: Journal -> String #
journalCheckAccounts :: Journal -> Either String () #
journalCheckCommodities :: Journal -> Either String () #
journalCheckPairedConversionPostings :: Journal -> Either String () #
journalCheckPayees :: Journal -> Either String () #
journalCheckRecentAssertions :: Day -> Journal -> Either String () #
journalCheckTags :: Journal -> Either String () #
journalCheckOrdereddates :: WhichDate -> Journal -> Either String () #
journalCheckUniqueleafnames :: Journal -> Either String () #
readJsonFile :: FromJSON a => FilePath -> IO a #
toJsonText :: ToJSON a => a -> Text #
writeJsonFile :: ToJSON a => FilePath -> a -> IO () #
ledgerAccount :: Ledger -> AccountName -> Maybe Account #
ledgerAccountNames :: Ledger -> [AccountName] #
ledgerCommodities :: Ledger -> [CommoditySymbol] #
ledgerDateSpan :: Ledger -> DateSpan #
ledgerFromJournal :: Query -> Journal -> Ledger #
ledgerLeafAccounts :: Ledger -> [Account] #
ledgerPostings :: Ledger -> [Posting] #
ledgerRootAccount :: Ledger -> Account #
ledgerTopAccounts :: Ledger -> [Account] #
nullledger :: Ledger #
dateSpanAsPeriod :: DateSpan -> Period #
firstMonthOfQuarter :: Num a => a -> a #
isLastDayOfMonth :: (Eq a1, Eq a2, Num a1, Num a2) => Year -> a1 -> a2 -> Bool #
isStandardPeriod :: Period -> Bool #
mondayBefore :: Day -> Day #
periodAsDateSpan :: Period -> DateSpan #
periodGrow :: Period -> Period #
periodMoveTo :: Day -> Period -> Period #
periodNext :: Period -> Period #
periodNextIn :: DateSpan -> Period -> Period #
periodPrevious :: Period -> Period #
periodPreviousIn :: DateSpan -> Period -> Period #
periodShrink :: Day -> Period -> Period #
periodStart :: Period -> Maybe Day #
periodTextWidth :: Period -> Int #
quarterContainingMonth :: Integral a => a -> a #
showPeriod :: Period -> Text #
showPeriodMonthAbbrev :: Period -> Text #
simplifyPeriod :: Period -> Period #
startOfFirstWeekInMonth :: Integer -> Int -> Day #
yearMonthContainingWeekStarting :: Day -> (Year, MonthOfYear) #
runPeriodicTransaction :: Bool -> PeriodicTransaction -> DateSpan -> [Transaction] #
accountNamesFromPostings :: [Posting] -> [AccountName] #
balassert :: Amount -> Maybe BalanceAssertion #
balassertTot :: Amount -> Maybe BalanceAssertion #
commentAddTag :: Text -> Tag -> Text #
commentAddTagNextLine :: Text -> Tag -> Text #
commentAddTagUnspaced :: Text -> Tag -> Text #
commentJoin :: Text -> Text -> Text #
hasBalanceAssignment :: Posting -> Bool #
isBalancedVirtual :: Posting -> Bool #
isEmptyPosting :: Posting -> Bool #
isPostingInDateSpan :: DateSpan -> Posting -> Bool #
isPostingInDateSpan' :: WhichDate -> DateSpan -> Posting -> Bool #
nullposting :: Posting #
nullsourcepos :: (SourcePos, SourcePos) #
originalPosting :: Posting -> Posting #
post :: AccountName -> Amount -> Posting #
post' :: AccountName -> Amount -> Maybe BalanceAssertion -> Posting #
postingAddInferredEquityPostings :: Bool -> Text -> Posting -> [Posting] #
postingAddTags :: Posting -> [Tag] -> Posting #
postingAllTags :: Posting -> [Tag] #
postingApplyAliases :: [AccountAlias] -> Posting -> Either RegexError Posting #
postingApplyCommodityStyles :: Map CommoditySymbol AmountStyle -> Posting -> Posting #
postingApplyValuation :: PriceOracle -> Map CommoditySymbol AmountStyle -> Day -> Day -> ValuationType -> Posting -> Posting #
postingAsLines :: Bool -> Bool -> Int -> Int -> Posting -> ([Text], Int, Int) #
postingAsLinesBeancount :: Bool -> Int -> Int -> Posting -> ([Text], Int, Int) #
postingDate :: Posting -> Day #
postingDate2 :: Posting -> Day #
postingDateOrDate2 :: WhichDate -> Posting -> Day #
postingStatus :: Posting -> Status #
postingStripPrices :: Posting -> Posting #
postingStyleAmounts :: Map CommoditySymbol AmountStyle -> Posting -> Posting #
postingToCost :: ConversionOp -> Posting -> Maybe Posting #
postingTransformAmount :: (MixedAmount -> MixedAmount) -> Posting -> Posting #
postingsAsLines :: Bool -> [Posting] -> [Text] #
postingsAsLinesBeancount :: [Posting] -> [Text] #
relatedPostings :: Posting -> [Posting] #
renderCommentLines :: Text -> [Text] #
showAccountName :: Maybe Int -> PostingType -> AccountName -> Text #
showAccountNameBeancount :: Maybe Int -> AccountName -> Text #
showPosting :: Posting -> String #
showPostingLines :: Posting -> [Text] #
sumPostings :: [Posting] -> MixedAmount #
transactionAllTags :: Transaction -> [Tag] #
vpost :: AccountName -> Amount -> Posting #
vpost' :: AccountName -> Amount -> Maybe BalanceAssertion -> Posting #
appendopts :: [(String, String)] -> RawOpts -> RawOpts #
collectopts :: ((String, String) -> Maybe a) -> RawOpts -> [a] #
listofstringopt :: String -> RawOpts -> [String] #
maybecharopt :: String -> RawOpts -> Maybe Char #
maybeintopt :: String -> RawOpts -> Maybe Int #
maybeposintopt :: String -> RawOpts -> Maybe Int #
maybestringopt :: String -> RawOpts -> Maybe String #
overRawOpts :: ([(String, String)] -> [(String, String)]) -> RawOpts -> RawOpts #
setboolopt :: String -> RawOpts -> RawOpts #
unsetboolopt :: String -> RawOpts -> RawOpts #
parseStringFormat :: Text -> Either String StringFormat #
timeclockEntriesToTransactions :: LocalTime -> [TimeclockEntry] -> [Transaction] #
annotateErrorWithTransaction :: Transaction -> String -> String #
assignmentPostings :: Transaction -> [Posting] #
balancedVirtualPostings :: Transaction -> [Posting] #
hasRealPostings :: Transaction -> Bool #
partitionAndCheckConversionPostings :: Bool -> [AccountName] -> [IdxPosting] -> Either Text ([(IdxPosting, IdxPosting)], ([IdxPosting], [IdxPosting])) #
realPostings :: Transaction -> [Posting] #
showTransaction :: Transaction -> Text #
transaction :: Day -> [Posting] -> Transaction #
transactionAddInferredEquityPostings :: Bool -> AccountName -> Transaction -> Transaction #
transactionAmounts :: Transaction -> [MixedAmount] #
transactionApplyValuation :: PriceOracle -> Map CommoditySymbol AmountStyle -> Day -> Day -> ValuationType -> Transaction -> Transaction #
transactionDate2 :: Transaction -> Day #
transactionDateOrDate2 :: WhichDate -> Transaction -> Day #
transactionFile :: Transaction -> FilePath #
transactionInferCostsFromEquity :: Bool -> [AccountName] -> Transaction -> Either String Transaction #
transactionMapPostingAmounts :: (MixedAmount -> MixedAmount) -> Transaction -> Transaction #
transactionMapPostings :: (Posting -> Posting) -> Transaction -> Transaction #
transactionNote :: Transaction -> Text #
transactionPayee :: Transaction -> Text #
transactionToCost :: ConversionOp -> Transaction -> Transaction #
transactionTransformPostings :: (Posting -> Posting) -> Transaction -> Transaction #
transactionsPostings :: [Transaction] -> [Posting] #
txnUntieKnot :: Transaction -> Transaction #
virtualPostings :: Transaction -> [Posting] #
modifyTransactions :: (AccountName -> Maybe AccountType) -> (AccountName -> [Tag]) -> Map CommoditySymbol AmountStyle -> Day -> Bool -> [TransactionModifier] -> [Transaction] -> Either String [Transaction] #
isAccountSubtypeOf :: AccountType -> AccountType -> Bool #
isBalanceSheetAccountType :: AccountType -> Bool #
isDecimalMark :: Char -> Bool #
isIncomeStatementAccountType :: AccountType -> Bool #
maCompare :: MixedAmount -> MixedAmount -> Ordering #
journalPriceOracle :: Bool -> Journal -> PriceOracle #
mixedAmountApplyGain :: PriceOracle -> Map CommoditySymbol AmountStyle -> Day -> Day -> Day -> ValuationType -> MixedAmount -> MixedAmount #
mixedAmountApplyValuation :: PriceOracle -> Map CommoditySymbol AmountStyle -> Day -> Day -> Day -> ValuationType -> MixedAmount -> MixedAmount #
mixedAmountGainAtDate :: PriceOracle -> Map CommoditySymbol AmountStyle -> Maybe CommoditySymbol -> Day -> MixedAmount -> MixedAmount #
mixedAmountToCost :: Map CommoditySymbol AmountStyle -> ConversionOp -> MixedAmount -> MixedAmount #
mixedAmountValueAtDate :: PriceOracle -> Map CommoditySymbol AmountStyle -> Maybe CommoditySymbol -> Day -> MixedAmount -> MixedAmount #
wbToText :: WideBuilder -> Text #
wbUnpack :: WideBuilder -> String #
tests_Data :: TestTree #
char8 :: TextEncoding #
showLitChar :: Char -> ShowS #
numDigitsInt :: Integral a => Int -> a #
numDigitsInteger :: Integer -> Int #
colorB :: ColorIntensity -> Color -> WideBuilder -> WideBuilder #
textQuoteIfNeeded :: Text -> Text #
wbFromText :: Text -> WideBuilder #
choice' :: forall (m :: Type -> Type) a. [TextParser m a] -> TextParser m a #
skipNonNewlineSpaces :: forall s (m :: Type -> Type). (Stream s, Token s ~ Char) => ParsecT HledgerParseErrorData s m () #
readDecimal :: Text -> Integer #
customErrorBundlePretty :: HledgerParseErrors -> String #
isNonNewlineSpace :: Char -> Bool #
showGregorian :: Day -> String #
isLeapYear :: Year -> Bool #
parseTimeMultipleM :: (MonadFail m, ParseTime t) => Bool -> TimeLocale -> [(String, String)] -> m t #
matchesAmount :: Query -> Amount -> Bool #
matchesPosting :: Query -> Posting -> Bool #
matchesPostingExtra :: (AccountName -> Maybe AccountType) -> Query -> Posting -> Bool #
matchesTransaction :: Query -> Transaction -> Bool #
matchesTransactionExtra :: (AccountName -> Maybe AccountType) -> Query -> Transaction -> Bool #
treeLeaves :: Tree a -> [a] #
debugLevel :: Int #
traceOrLogAtWith :: Int -> (a -> String) -> a -> a #
filterQuery :: (Query -> Bool) -> Query -> Query #
queryIsDepth :: Query -> Bool #
queryIsSym :: Query -> Bool #
sourcePosPairPretty :: (SourcePos, SourcePos) -> String #
escapeBackslash :: Text -> Text #
escapeDoubleQuotes :: Text -> Text #
genericTake :: Integral i => i -> [a] -> [a] #
addGregorianDurationClip :: CalendarDiffDays -> Day -> Day #
addGregorianDurationRollOver :: CalendarDiffDays -> Day -> Day #
addGregorianMonthsClip :: Integer -> Day -> Day #
addGregorianMonthsRollOver :: Integer -> Day -> Day #
addGregorianYearsClip :: Integer -> Day -> Day #
addGregorianYearsRollOver :: Integer -> Day -> Day #
diffGregorianDurationClip :: Day -> Day -> CalendarDiffDays #
diffGregorianDurationRollOver :: Day -> Day -> CalendarDiffDays #
fromGregorianValid :: Year -> MonthOfYear -> DayOfMonth -> Maybe Day #
gregorianMonthLength :: Year -> MonthOfYear -> DayOfMonth #
toGregorian :: Day -> (Year, MonthOfYear, DayOfMonth) #
utcToLocalTime :: TimeZone -> UTCTime -> LocalTime #
ut1ToLocalTime :: Rational -> UniversalTime -> LocalTime #
utcToZonedTime :: TimeZone -> UTCTime -> ZonedTime #
zonedTimeToUTC :: ZonedTime -> UTCTime #
iso8601DateFormat :: Maybe String -> String #
rfc822DateFormat :: String #
localTimeToUT1 :: Rational -> LocalTime -> UniversalTime #
localTimeToUTC :: TimeZone -> LocalTime -> UTCTime #
parseTimeM :: (MonadFail m, ParseTime t) => Bool -> TimeLocale -> String -> String -> m t #
parseTimeOrError :: ParseTime t => Bool -> TimeLocale -> String -> String -> t #
readPTime :: ParseTime t => Bool -> TimeLocale -> String -> ReadP t #
readSTime :: ParseTime t => Bool -> TimeLocale -> String -> ReadS t #
minutesToTimeZone :: Int -> TimeZone #
addUTCTime :: NominalDiffTime -> UTCTime -> UTCTime #
diffUTCTime :: UTCTime -> UTCTime -> NominalDiffTime #
dayFractionToTimeOfDay :: Rational -> TimeOfDay #
localToUTCTimeOfDay :: TimeZone -> TimeOfDay -> (Integer, TimeOfDay) #
timeOfDayToDayFraction :: TimeOfDay -> Rational #
timeOfDayToTime :: TimeOfDay -> DiffTime #
timeToTimeOfDay :: DiffTime -> TimeOfDay #
utcToLocalTimeOfDay :: TimeZone -> TimeOfDay -> (Integer, TimeOfDay) #
addLocalTime :: NominalDiffTime -> LocalTime -> LocalTime #
diffLocalTime :: LocalTime -> LocalTime -> NominalDiffTime #
getCurrentTime :: IO UTCTime #
getTimeZone :: UTCTime -> IO TimeZone #
getZonedTime :: IO ZonedTime #
utcToLocalZonedTime :: UTCTime -> IO ZonedTime #
filterM :: Applicative m => (a -> m Bool) -> [a] -> m [a] #
zipWithM :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m [c] #
zipWithM_ :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m () #
elemIndices :: Eq a => a -> [a] -> [Int] #
findIndices :: (a -> Bool) -> [a] -> [Int] #
replicateM :: Applicative m => Int -> m a -> m [a] #
(<**>) :: Applicative f => f a -> f (a -> b) -> f b #
liftA :: Applicative f => (a -> b) -> f a -> f b #
liftA3 :: Applicative f => (a -> b -> c -> d) -> f a -> f b -> f c -> f d #
liftM5 :: Monad m => (a1 -> a2 -> a3 -> a4 -> a5 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m a5 -> m r #
initialPos :: FilePath -> SourcePos #
sourcePosPretty :: SourcePos -> String #
periodAllDays :: DayPeriod p => p -> [Day] #
periodFromDay :: DayPeriod p => Day -> (p, Int) #
periodLength :: DayPeriod p => p -> Int #
periodToDay :: DayPeriod p => p -> Int -> Day #
periodToDayValid :: DayPeriod p => p -> Int -> Maybe Day #
after :: DependencyType -> String -> TestTree -> TestTree #
nominalDiffTimeToSeconds :: NominalDiffTime -> Pico #
secondsToNominalDiffTime :: Pico -> NominalDiffTime #
callCommand :: String -> IO () #
hGetContents :: Handle -> IO String #
listToMaybe :: [a] -> Maybe a #
maybeToList :: Maybe a -> [a] #
latin1 :: TextEncoding #
mkTextEncoding :: String -> IO TextEncoding #
utf16 :: TextEncoding #
utf16be :: TextEncoding #
utf16le :: TextEncoding #
utf32 :: TextEncoding #
utf32be :: TextEncoding #
utf32le :: TextEncoding #
utf8 :: TextEncoding #
hGetBuffering :: Handle -> IO BufferMode #
hGetEncoding :: Handle -> IO (Maybe TextEncoding) #
hGetPosn :: Handle -> IO HandlePosn #
hIsReadable :: Handle -> IO Bool #
hIsSeekable :: Handle -> IO Bool #
hIsTerminalDevice :: Handle -> IO Bool #
hIsWritable :: Handle -> IO Bool #
hLookAhead :: Handle -> IO Char #
hSetBinaryMode :: Handle -> Bool -> IO () #
hSetBuffering :: Handle -> BufferMode -> IO () #
hSetEncoding :: Handle -> TextEncoding -> IO () #
hSetFileSize :: Handle -> Integer -> IO () #
hSetNewlineMode :: Handle -> NewlineMode -> IO () #
hSetPosn :: HandlePosn -> IO () #
hGetBufNonBlocking :: Handle -> Ptr a -> Int -> IO Int #
hGetBufSome :: Handle -> Ptr a -> Int -> IO Int #
hGetContents' :: Handle -> IO String #
hPutBufNonBlocking :: Handle -> Ptr a -> Int -> IO Int #
hWaitForInput :: Handle -> Int -> IO Bool #
newEmptyMVar :: IO (MVar a) #
getContents' :: IO String #
createPipe :: IO (Handle, Handle) #
createPipeFd :: IO (FD, FD) #
createProcess_ :: String -> CreateProcess -> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) #
interruptProcessGroupOf :: ProcessHandle -> IO () #
terminateProcess :: ProcessHandle -> IO () #
getProcessExitCode :: ProcessHandle -> IO (Maybe ExitCode) #
cleanupProcess :: (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) -> IO () #
createProcess :: CreateProcess -> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) #
getCurrentPid :: IO Pid #
readCreateProcess :: CreateProcess -> String -> IO String #
readCreateProcessWithExitCode :: CreateProcess -> String -> IO (ExitCode, String, String) #
readProcess :: FilePath -> [String] -> String -> IO String #
runCommand :: String -> IO ProcessHandle #
runInteractiveCommand :: String -> IO (Handle, Handle, Handle, ProcessHandle) #
runInteractiveProcess :: FilePath -> [String] -> Maybe FilePath -> Maybe [(String, String)] -> IO (Handle, Handle, Handle, ProcessHandle) #
runProcess :: FilePath -> [String] -> Maybe FilePath -> Maybe [(String, String)] -> Maybe Handle -> Maybe Handle -> Maybe Handle -> IO ProcessHandle #
shell :: String -> CreateProcess #
showCommandForUser :: FilePath -> [String] -> String #
spawnCommand :: String -> IO ProcessHandle #
spawnProcess :: FilePath -> [String] -> IO ProcessHandle #
waitForProcess :: ProcessHandle -> IO ExitCode #
withCreateProcess :: CreateProcess -> (Maybe Handle -> Maybe Handle -> Maybe Handle -> ProcessHandle -> IO a) -> IO a #
ptraceAtIO :: (MonadIO m, Show a) => Int -> String -> a -> m () #
ptraceLogAt :: Show a => Int -> String -> a -> a #
ptraceLogAtIO :: (MonadIO m, Show a) => Int -> String -> a -> m () #
ptraceOrLogAt :: Show a => Int -> String -> a -> a #
ptraceOrLogAtIO :: (MonadIO m, Show a) => Int -> String -> a -> m () #
traceAtWith :: Int -> (a -> String) -> a -> a #
traceLogAt :: Int -> String -> a -> a #
traceLogAtIO :: MonadIO m => Int -> String -> m () #
traceLogAtWith :: Int -> (a -> String) -> a -> a #
traceLogIO :: MonadIO m => String -> m () #
traceLogWith :: (a -> String) -> a -> a #
traceOrLog :: String -> a -> a #
traceOrLogAt :: Int -> String -> a -> a #
bgColorB :: ColorIntensity -> Color -> WideBuilder -> WideBuilder #
brightBlack' :: String -> String #
brightBlue' :: String -> String #
brightCyan' :: String -> String #
brightGreen' :: String -> String #
brightMagenta' :: String -> String #
brightRed' :: String -> String #
brightWhite' :: String -> String #
brightYellow' :: String -> String #
colorOption :: String #
expandHomePath :: FilePath -> IO FilePath #
getTerminalHeight :: IO (Maybe Int) #
getTerminalHeightWidth :: IO (Maybe (Int, Int)) #
getTerminalWidth :: IO (Maybe Int) #
hasOutputFile :: Bool #
outputFileOption :: Maybe String #
readFileOrStdinPortably :: String -> IO Text #
readFilePortably :: FilePath -> IO Text #
readFileStrictly :: FilePath -> IO Text #
readHandlePortably :: Handle -> IO Text #
setupPager :: IO () #
sortByModTime :: [FilePath] -> IO [FilePath] #
terminalBgColor :: Maybe (RGB Float) #
terminalFgColor :: Maybe (RGB Float) #
terminalIsLight :: Maybe Bool #
terminalLightness :: Maybe Float #
usageError :: String -> a #
useColorOnStderr :: Bool #
useColorOnStdout :: Bool #
choiceInState :: forall s (m :: Type -> Type) a. [StateT s (ParsecT HledgerParseErrorData Text m) a] -> StateT s (ParsecT HledgerParseErrorData Text m) a #
dbgparse :: forall (m :: Type -> Type). Int -> String -> TextParser m () #
eolof :: forall (m :: Type -> Type). TextParser m () #
nonspace :: forall (m :: Type -> Type). TextParser m Char #
parseWithState :: Monad m => st -> StateT st (ParsecT HledgerParseErrorData Text m) a -> Text -> m (Either HledgerParseErrors a) #
parseWithState' :: Stream s => st -> StateT st (ParsecT e s Identity) a -> s -> Either (ParseErrorBundle s e) a #
parseerror :: (Show t, Show (Token t), Show e) => ParseErrorBundle t e -> a #
parsewithString :: Parsec e String a -> String -> Either (ParseErrorBundle String e) a #
restofline :: forall (m :: Type -> Type). TextParser m String #
rtp :: TextParser Identity a -> Text -> Either HledgerParseErrors a #
runTextParser :: TextParser Identity a -> Text -> Either HledgerParseErrors a #
showDateParseError :: (Show t, Show (Token t), Show e) => ParseErrorBundle t e -> String #
skipNonNewlineSpaces' :: forall s (m :: Type -> Type). (Stream s, Token s ~ Char) => ParsecT HledgerParseErrorData s m Bool #
skipNonNewlineSpaces1 :: forall s (m :: Type -> Type). (Stream s, Token s ~ Char) => ParsecT HledgerParseErrorData s m () #
spacenonewline :: forall s (m :: Type -> Type). (Stream s, Char ~ Token s) => ParsecT HledgerParseErrorData s m Char #
surroundedBy :: Applicative m => m openclose -> m a -> m a #
traceOrLogParse :: forall (m :: Type -> Type). String -> TextParser m () #
regexMatch :: Regexp -> String -> Bool #
regexMatchText :: Regexp -> Text -> Bool #
regexMatchTextGroups :: Regexp -> Text -> [Text] #
regexReplace :: Regexp -> Replacement -> String -> Either RegexError String #
regexReplaceAllBy :: Regexp -> (String -> String) -> String -> String #
regexReplaceUnmemo :: Regexp -> Replacement -> String -> Either RegexError String #
toRegexCI' :: Text -> Regexp #
capitalise :: String -> String #
elideRight :: Int -> String -> String #
quoteForCommandLine :: String -> String #
quoteIfNeeded :: String -> String #
singleQuoteIfNeeded :: String -> String #
singleline :: String -> String #
strWidthAnsi :: String -> Int #
strip1Char :: Char -> Char -> String -> String #
stripbrackets :: String -> String #
assertLeft :: (HasCallStack, Eq b, Show b) => Either a b -> Assertion #
assertParse :: (HasCallStack, Default st) => StateT st (ParsecT HledgerParseErrorData Text IO) a -> Text -> Assertion #
assertParseE :: (HasCallStack, Eq a, Show a, Default st) => StateT st (ParsecT HledgerParseErrorData Text (ExceptT FinalParseError IO)) a -> Text -> Assertion #
assertParseEq :: (HasCallStack, Eq a, Show a, Default st) => StateT st (ParsecT HledgerParseErrorData Text IO) a -> Text -> a -> Assertion #
assertParseEqE :: (Default st, Eq a, Show a, HasCallStack) => StateT st (ParsecT HledgerParseErrorData Text (ExceptT FinalParseError IO)) a -> Text -> a -> Assertion #
assertParseEqOn :: (HasCallStack, Eq b, Show b, Default st) => StateT st (ParsecT HledgerParseErrorData Text IO) a -> Text -> (a -> b) -> b -> Assertion #
assertParseError :: (HasCallStack, Eq a, Show a, Default st) => StateT st (ParsecT HledgerParseErrorData Text IO) a -> Text -> String -> Assertion #
assertParseErrorE :: (Default st, Eq a, Show a, HasCallStack) => StateT st (ParsecT HledgerParseErrorData Text (ExceptT FinalParseError IO)) a -> Text -> String -> Assertion #
assertParseStateOn :: (HasCallStack, Eq b, Show b, Default st) => StateT st (ParsecT HledgerParseErrorData Text IO) a -> Text -> (st -> b) -> b -> Assertion #
assertRight :: (HasCallStack, Eq a, Show a) => Either a b -> Assertion #
linesPrepend :: Text -> Text -> Text #
quoteIfSpaced :: Text -> Text #
stripquotes :: Text -> Text #
tests_Text :: TestTree #
textCapitalise :: Text -> Text #
textConcatBottomPadded :: [Text] -> Text #
textConcatTopPadded :: [Text] -> Text #
textElideRight :: Int -> Text -> Text #
textTakeWidth :: Int -> Text -> Text #
textUnbracket :: Text -> Text #
traceShowId :: Show a => a -> a #
makeHledgerClassyLenses :: Name -> DecsQ #
maximumStrict :: Ord a => [a] -> a #
minimumStrict :: Ord a => [a] -> a #
tests_Utils :: TestTree #
adjustOption :: IsOption v => (v -> v) -> TestTree -> TestTree #
defaultIngredients :: [Ingredient] #
localOption :: IsOption v => v -> TestTree -> TestTree #
defaultMainWithIngredients :: [Ingredient] -> TestTree -> IO () #
after_ :: DependencyType -> Expr -> TestTree -> TestTree #
includingOptions :: [OptionDescription] -> Ingredient #
testCaseInfo :: TestName -> IO String -> TestTree #
(@=?) :: (Eq a, Show a, HasCallStack) => a -> a -> Assertion #
(@?) :: (AssertionPredicable t, HasCallStack) => t -> String -> Assertion #
(@?=) :: (Eq a, Show a, HasCallStack) => a -> a -> Assertion #
assertBool :: HasCallStack => String -> Bool -> Assertion #
assertEqual :: (Eq a, Show a, HasCallStack) => String -> a -> a -> Assertion #
assertFailure :: HasCallStack => String -> IO a #
assertString :: HasCallStack => String -> Assertion #
formatInt :: (Integral a, Bounded a) => a -> FieldFormatter #
errorBadArgument :: a #
errorBadFormat :: Char -> a #
errorMissingArgument :: a #
formatChar :: Char -> FieldFormatter #
formatInteger :: Integer -> FieldFormatter #
hPrintf :: HPrintfType r => Handle -> String -> r #
vFmt :: Char -> FieldFormat -> FieldFormat #
getEnvironment :: IO [(String, String)] #
getProgName :: IO String #
withProgName :: String -> IO a -> IO a #
readEitherSafe :: Read a => String -> Either String a #
isPathSeparator :: Char -> Bool #
isRelative :: FilePath -> Bool #
deleteFirstsBy :: (a -> a -> Bool) -> [a] -> [a] -> [a] #
genericDrop :: Integral i => i -> [a] -> [a] #
genericIndex :: Integral i => [a] -> i -> a #
genericLength :: Num i => [a] -> i #
genericReplicate :: Integral i => i -> a -> [a] #
genericSplitAt :: Integral i => i -> [a] -> ([a], [a]) #
intersectBy :: (a -> a -> Bool) -> [a] -> [a] -> [a] #
permutations :: [a] -> [[a]] #
subsequences :: [a] -> [[a]] #
zipWith7 :: (a -> b -> c -> d -> e -> f -> g -> h) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -> [h] #
isSubsequenceOf :: Eq a => [a] -> [a] -> Bool #
asum :: (Foldable t, Alternative f) => t (f a) -> f a #
helpText :: [String] -> HelpFormat -> Mode a -> [Text] #
rawOptsToInputOpts :: Day -> RawOpts -> InputOpts #
rawOptsToReportSpec :: Day -> RawOpts -> Either String ReportSpec #
expandArgsAt :: [String] -> IO [String] #
defaultJournalPath :: IO String #
splitReaderPrefix :: PrefixedFilePath -> (Maybe String, FilePath) #
splitExtension :: FilePath -> (String, String) #
optional :: Alternative f => f a -> f (Maybe a) #
takeBaseName :: FilePath -> String #
takeExtension :: FilePath -> String #
replicateM_ :: Applicative m => Int -> m a -> m () #
unless :: Applicative f => Bool -> f () -> f () #
forever :: Applicative f => f a -> f b #
mapAndUnzipM :: Applicative m => (a -> m (b, c)) -> [a] -> m ([b], [c]) #
guard :: Alternative f => Bool -> f () #
lexLitChar :: ReadS String #
readLitChar :: ReadS Char #
generalCategory :: Char -> GeneralCategory #
isAsciiLower :: Char -> Bool #
isAsciiUpper :: Char -> Bool #
isHexDigit :: Char -> Bool #
isLowerCase :: Char -> Bool #
isOctDigit :: Char -> Bool #
isPunctuation :: Char -> Bool #
isUpperCase :: Char -> Bool #
digitToInt :: Char -> Int #
isSeparator :: Char -> Bool #
foldl1Def' :: a -> (a -> a -> a) -> [a] -> a #
assertNote :: Partial => String -> Bool -> a -> a #
elemIndexJust :: (Partial, Eq a) => a -> [a] -> Int #
elemIndexJustDef :: Eq a => Int -> a -> [a] -> Int #
elemIndexJustNote :: (Partial, Eq a) => String -> a -> [a] -> Int #
findIndexJust :: (a -> Bool) -> [a] -> Int #
findIndexJustDef :: Int -> (a -> Bool) -> [a] -> Int #
findIndexJustNote :: Partial => String -> (a -> Bool) -> [a] -> Int #
findJustDef :: a -> (a -> Bool) -> [a] -> a #
findJustNote :: Partial => String -> (a -> Bool) -> [a] -> a #
foldl1May' :: (a -> a -> a) -> [a] -> Maybe a #
foldl1Note :: Partial => String -> (a -> a -> a) -> [a] -> a #
foldl1Note' :: Partial => String -> (a -> a -> a) -> [a] -> a #
foldr1Note :: Partial => String -> (a -> a -> a) -> [a] -> a #
fromJustDef :: a -> Maybe a -> a #
fromJustNote :: Partial => String -> Maybe a -> a #
lookupJust :: (Eq a, Partial) => a -> [(a, b)] -> b #
lookupJustDef :: Eq a => b -> a -> [(a, b)] -> b #
lookupJustNote :: (Partial, Eq a) => String -> a -> [(a, b)] -> b #
maximumBound :: Ord a => a -> [a] -> a #
maximumBoundBy :: a -> (a -> a -> Ordering) -> [a] -> a #
maximumBounded :: (Ord a, Bounded a) => [a] -> a #
maximumByDef :: a -> (a -> a -> Ordering) -> [a] -> a #
maximumByMay :: (a -> a -> Ordering) -> [a] -> Maybe a #
maximumByNote :: Partial => String -> (a -> a -> Ordering) -> [a] -> a #
maximumDef :: Ord a => a -> [a] -> a #
maximumNote :: (Partial, Ord a) => String -> [a] -> a #
minimumBound :: Ord a => a -> [a] -> a #
minimumBoundBy :: a -> (a -> a -> Ordering) -> [a] -> a #
minimumBounded :: (Ord a, Bounded a) => [a] -> a #
minimumByDef :: a -> (a -> a -> Ordering) -> [a] -> a #
minimumByMay :: (a -> a -> Ordering) -> [a] -> Maybe a #
minimumByNote :: Partial => String -> (a -> a -> Ordering) -> [a] -> a #
minimumMay :: Ord a => [a] -> Maybe a #
minimumNote :: (Partial, Ord a) => String -> [a] -> a #
scanl1Note :: Partial => String -> (a -> a -> a) -> [a] -> [a] #
scanr1Note :: Partial => String -> (a -> a -> a) -> [a] -> [a] #
toEnumNote :: (Partial, Enum a, Bounded a) => String -> Int -> a #
toEnumSafe :: (Enum a, Bounded a) => Int -> a #
fromFlagOpt :: FlagInfo -> String #
remapUpdate :: (a -> b) -> (b -> (a, a -> b)) -> Update a -> Update b #
flagHelpFormat :: (HelpFormat -> TextFormat -> a -> a) -> Flag a #
flagHelpSimple :: (a -> a) -> Flag a #
flagNumericVersion :: (a -> a) -> Flag a #
flagVersion :: (a -> a) -> Flag a #
flagsVerbosity :: (Verbosity -> a -> a) -> [Flag a] #
processArgs :: Mode a -> IO a #
processValue :: Mode a -> [String] -> a #
processValueIO :: Mode a -> [String] -> IO a #
canonicalizePath :: FilePath -> IO FilePath #
copyFileWithMetadata :: FilePath -> FilePath -> IO () #
copyPermissions :: FilePath -> FilePath -> IO () #
createDirectory :: FilePath -> IO () #
createDirectoryIfMissing :: Bool -> FilePath -> IO () #
createDirectoryLink :: FilePath -> FilePath -> IO () #
createFileLink :: FilePath -> FilePath -> IO () #
doesDirectoryExist :: FilePath -> IO Bool #
doesPathExist :: FilePath -> IO Bool #
exeExtension :: String #
findExecutable :: String -> IO (Maybe FilePath) #
findExecutables :: String -> IO [FilePath] #
findExecutablesInDirectories :: [FilePath] -> String -> IO [FilePath] #
getAccessTime :: FilePath -> IO UTCTime #
getFileSize :: FilePath -> IO Integer #
getPermissions :: FilePath -> IO Permissions #
getSymbolicLinkTarget :: FilePath -> IO FilePath #
getXdgDirectory :: XdgDirectory -> FilePath -> IO FilePath #
getXdgDirectoryList :: XdgDirectoryList -> IO [FilePath] #
listDirectory :: FilePath -> IO [FilePath] #
makeAbsolute :: FilePath -> IO FilePath #
pathIsSymbolicLink :: FilePath -> IO Bool #
removeDirectory :: FilePath -> IO () #
removeDirectoryLink :: FilePath -> IO () #
removeDirectoryRecursive :: FilePath -> IO () #
removeFile :: FilePath -> IO () #
removePathForcibly :: FilePath -> IO () #
renameDirectory :: FilePath -> FilePath -> IO () #
renameFile :: FilePath -> FilePath -> IO () #
renamePath :: FilePath -> FilePath -> IO () #
setAccessTime :: FilePath -> UTCTime -> IO () #
setCurrentDirectory :: FilePath -> IO () #
setModificationTime :: FilePath -> UTCTime -> IO () #
setPermissions :: FilePath -> Permissions -> IO () #
withCurrentDirectory :: FilePath -> IO a -> IO a #
isSymbolicLink :: FilePath -> IO Bool #
setOwnerExecutable :: Bool -> Permissions -> Permissions #
setOwnerReadable :: Bool -> Permissions -> Permissions #
setOwnerSearchable :: Bool -> Permissions -> Permissions #
setOwnerWritable :: Bool -> Permissions -> Permissions #
addExtension :: FilePath -> String -> FilePath #
makeRelative :: FilePath -> FilePath -> FilePath #
dropExtension :: FilePath -> FilePath #
dropExtensions :: FilePath -> FilePath #
dropFileName :: FilePath -> FilePath #
equalFilePath :: FilePath -> FilePath -> Bool #
extSeparator :: Char #
getSearchPath :: IO [FilePath] #
hasExtension :: FilePath -> Bool #
hasTrailingPathSeparator :: FilePath -> Bool #
isAbsolute :: FilePath -> Bool #
isExtSeparator :: Char -> Bool #
isExtensionOf :: String -> FilePath -> Bool #
isSearchPathSeparator :: Char -> Bool #
pathSeparator :: Char #
pathSeparators :: [Char] #
replaceBaseName :: FilePath -> String -> FilePath #
replaceDirectory :: FilePath -> String -> FilePath #
replaceExtension :: FilePath -> String -> FilePath #
replaceExtensions :: FilePath -> String -> FilePath #
replaceFileName :: FilePath -> String -> FilePath #
splitDirectories :: FilePath -> [FilePath] #
splitDrive :: FilePath -> (FilePath, FilePath) #
splitExtensions :: FilePath -> (FilePath, String) #
splitSearchPath :: String -> [FilePath] #
stripExtension :: String -> FilePath -> Maybe FilePath #
takeExtensions :: FilePath -> String #
takeFileName :: FilePath -> FilePath #
filterQueryOrNotQuery :: (Query -> Bool) -> Query -> Query #
inAccount :: [QueryOpt] -> Maybe (AccountName, Bool) #
inAccountQuery :: [QueryOpt] -> Maybe Query #
matchesAccount :: Query -> AccountName -> Bool #
matchesAccountExtra :: (AccountName -> Maybe AccountType) -> (AccountName -> [Tag]) -> Query -> AccountName -> Bool #
matchesCommodity :: Query -> CommoditySymbol -> Bool #
matchesDescription :: Query -> Text -> Bool #
matchesMixedAmount :: Query -> MixedAmount -> Bool #
matchesPayeeWIP :: Query -> Payee -> Bool #
matchesPriceDirective :: Query -> PriceDirective -> Bool #
matchesQuery :: (Query -> Bool) -> Query -> Bool #
parseAccountType :: Bool -> Text -> Either String AccountType #
queryDateSpan :: Bool -> Query -> DateSpan #
queryDateSpan' :: Query -> DateSpan #
queryDepth :: Query -> Maybe Int #
queryEndDate :: Bool -> Query -> Maybe Day #
queryIsAcct :: Query -> Bool #
queryIsAmt :: Query -> Bool #
queryIsCode :: Query -> Bool #
queryIsDate :: Query -> Bool #
queryIsDate2 :: Query -> Bool #
queryIsDateOrDate2 :: Query -> Bool #
queryIsDesc :: Query -> Bool #
queryIsNull :: Query -> Bool #
queryIsReal :: Query -> Bool #
queryIsStartDateOnly :: Bool -> Query -> Bool #
queryIsStatus :: Query -> Bool #
queryIsTag :: Query -> Bool #
queryIsTransactionRelated :: Query -> Bool #
queryIsType :: Query -> Bool #
queryStartDate :: Bool -> Query -> Maybe Day #
queryprefixes :: [Text] #
simplifyQuery :: Query -> Query #
tests_Query :: TestTree #
defaultJournal :: IO Journal #
ensureJournalFileExists :: FilePath -> IO () #
journalStrictChecks :: Journal -> Either String () #
orDieTrying :: MonadIO m => ExceptT String m a -> m a #
readJournal' :: Text -> IO Journal #
readJournalFile :: InputOpts -> PrefixedFilePath -> ExceptT String IO Journal #
readJournalFiles :: InputOpts -> [PrefixedFilePath] -> ExceptT String IO Journal #
readJournalFiles' :: [PrefixedFilePath] -> IO Journal #
readJournalFilesAndLatestDates :: InputOpts -> [PrefixedFilePath] -> ExceptT String IO (Journal, [LatestDatesForFile]) #
requireJournalFileExists :: FilePath -> IO () #
saveLatestDates :: LatestDates -> FilePath -> IO () #
saveLatestDatesForFiles :: [LatestDatesForFile] -> IO () #
tests_Read :: TestTree #
accountaliasp :: forall (m :: Type -> Type). TextParser m AccountAlias #
accountnamep :: forall (m :: Type -> Type). TextParser m AccountName #
addAccountAlias :: MonadState Journal m => AccountAlias -> m () #
addDeclaredAccountTags :: forall (m :: Type -> Type). AccountName -> [Tag] -> JournalParser m () #
addDeclaredAccountType :: forall (m :: Type -> Type). AccountName -> AccountType -> JournalParser m () #
aliasesFromOpts :: InputOpts -> [AccountAlias] #
amountp :: forall (m :: Type -> Type). JournalParser m Amount #
amountp' :: forall (m :: Type -> Type). Bool -> JournalParser m Amount #
balanceassertionp :: forall (m :: Type -> Type). JournalParser m BalanceAssertion #
bracketeddatetagsp :: forall (m :: Type -> Type). Maybe Year -> TextParser m [(TagName, Day)] #
clearAccountAliases :: MonadState Journal m => m () #
codep :: forall (m :: Type -> Type). TextParser m Text #
commenttagsp :: forall (m :: Type -> Type). TextParser m [Tag] #
commoditysymbolp :: forall (m :: Type -> Type). TextParser m CommoditySymbol #
costp :: forall (m :: Type -> Type). Amount -> JournalParser m AmountPrice #
datep :: forall (m :: Type -> Type). JournalParser m Day #
datetimep :: forall (m :: Type -> Type). JournalParser m LocalTime #
descriptionp :: forall (m :: Type -> Type). TextParser m Text #
doublequotedtextp :: forall (m :: Type -> Type). TextParser m Text #
emptyorcommentlinep :: forall (m :: Type -> Type). TextParser m () #
followingcommentp :: forall (m :: Type -> Type). TextParser m Text #
fromRawNumber :: RawNumber -> Maybe Integer -> Either String (Quantity, Word8, Maybe Char, Maybe DigitGroupStyle) #
getAccountAliases :: MonadState Journal m => m [AccountAlias] #
getAmountStyle :: forall (m :: Type -> Type). CommoditySymbol -> JournalParser m (Maybe AmountStyle) #
getDefaultAmountStyle :: forall (m :: Type -> Type). JournalParser m (Maybe AmountStyle) #
getDefaultCommodityAndStyle :: forall (m :: Type -> Type). JournalParser m (Maybe (CommoditySymbol, AmountStyle)) #
getParentAccount :: forall (m :: Type -> Type). JournalParser m AccountName #
getYear :: forall (m :: Type -> Type). JournalParser m (Maybe Year) #
initialiseAndParseJournal :: ErroringJournalParser IO ParsedJournal -> InputOpts -> FilePath -> Text -> ExceptT String IO Journal #
isLineCommentStart :: Char -> Bool #
isSameLineCommentStart :: Char -> Bool #
journalAddAutoPostings :: Bool -> Day -> BalancingOpts -> Journal -> Either String Journal #
journalFinalise :: InputOpts -> FilePath -> Text -> ParsedJournal -> ExceptT String IO Journal #
lotcostp :: forall (m :: Type -> Type). JournalParser m () #
modifiedaccountnamep :: forall (m :: Type -> Type). JournalParser m AccountName #
multilinecommentp :: forall (m :: Type -> Type). TextParser m () #
noncommenttext1p :: forall (m :: Type -> Type). TextParser m Text #
noncommenttextp :: forall (m :: Type -> Type). TextParser m Text #
numberp :: forall (m :: Type -> Type). Maybe AmountStyle -> TextParser m (Quantity, Word8, Maybe Char, Maybe DigitGroupStyle) #
parseAndFinaliseJournal :: ErroringJournalParser IO ParsedJournal -> InputOpts -> FilePath -> Text -> ExceptT String IO Journal #
parseamount :: String -> Either HledgerParseErrors Amount #
parseamount' :: String -> Amount #
parsemixedamount :: String -> Either HledgerParseErrors MixedAmount #
parsemixedamount' :: String -> MixedAmount #
popParentAccount :: forall (m :: Type -> Type). JournalParser m () #
postingcommentp :: forall (m :: Type -> Type). Maybe Year -> TextParser m (Text, [Tag], Maybe Day, Maybe Day) #
pushParentAccount :: forall (m :: Type -> Type). AccountName -> JournalParser m () #
rawnumberp :: forall (m :: Type -> Type). TextParser m (Either AmbiguousNumber RawNumber) #
secondarydatep :: forall (m :: Type -> Type). Day -> TextParser m Day #
setDefaultCommodityAndStyle :: forall (m :: Type -> Type). (CommoditySymbol, AmountStyle) -> JournalParser m () #
setYear :: forall (m :: Type -> Type). Year -> JournalParser m () #
singlespacednoncommenttext1p :: forall (m :: Type -> Type). TextParser m Text #
singlespacedtext1p :: forall (m :: Type -> Type). TextParser m Text #
singlespacedtextsatisfying1p :: forall (m :: Type -> Type). (Char -> Bool) -> TextParser m Text #
singlespacep :: forall (m :: Type -> Type). TextParser m () #
spaceandamountormissingp :: forall (m :: Type -> Type). JournalParser m MixedAmount #
statusp :: forall (m :: Type -> Type). TextParser m Status #
transactioncommentp :: forall (m :: Type -> Type). TextParser m (Text, [Tag]) #
findReader :: forall (m :: Type -> Type). MonadIO m => Maybe StorageFormat -> Maybe FilePath -> Maybe (Reader m) #
runJournalParser :: Monad m => JournalParser m a -> Text -> m (Either HledgerParseErrors a) #
tmpostingrulep :: forall (m :: Type -> Type). Maybe Year -> JournalParser m TMPostingRule #
accountTransactionsReportByCommodity :: AccountTransactionsReport -> [(CommoditySymbol, AccountTransactionsReport)] #
accountTransactionsReportItems :: Query -> Query -> MixedAmount -> (MixedAmount -> MixedAmount) -> (AccountName -> Maybe AccountType) -> [(Day, Transaction)] -> [AccountTransactionsReportItem] #
transactionRegisterDate :: WhichDate -> Query -> Query -> Transaction -> Day #
triBalance :: (a, b, c, d, e, f) -> f #
triCommodityAmount :: CommoditySymbol -> (a, b, c, d, MixedAmount, f) -> MixedAmount #
triCommodityBalance :: CommoditySymbol -> (a, b, c, d, e, MixedAmount) -> MixedAmount #
triDate :: (a, Transaction, c, d, e, f) -> Day #
triOrigTransaction :: (a, b, c, d, e, f) -> a #
balanceReport :: ReportSpec -> Journal -> BalanceReport #
flatShowsExclusiveBalance :: Bool #
budgetReport :: ReportSpec -> BalancingOpts -> DateSpan -> Journal -> BudgetReport #
budgetReportAsCsv :: ReportOpts -> BudgetReport -> [[Text]] #
budgetReportAsTable :: ReportOpts -> BudgetReport -> Table Text Text WideBuilder #
budgetReportAsText :: ReportOpts -> BudgetReport -> Text #
combineBudgetAndActual :: ReportOpts -> Journal -> MultiBalanceReport -> MultiBalanceReport -> BudgetReport #
entriesReport :: ReportSpec -> Journal -> EntriesReport #
compoundBalanceReport :: ReportSpec -> Journal -> [CBCSubreportSpec a] -> CompoundPeriodicReport a MixedAmount #
compoundBalanceReportWith :: ReportSpec -> Journal -> PriceOracle -> [CBCSubreportSpec a] -> CompoundPeriodicReport a MixedAmount #
generateMultiBalanceReport :: ReportSpec -> Journal -> PriceOracle -> Set AccountName -> [(DateSpan, [Posting])] -> HashMap AccountName Account -> MultiBalanceReport #
getPostings :: ReportSpec -> Journal -> PriceOracle -> [Posting] #
getPostingsByColumn :: ReportSpec -> Journal -> PriceOracle -> [DateSpan] -> [(DateSpan, [Posting])] #
makeReportQuery :: ReportSpec -> DateSpan -> ReportSpec #
multiBalanceReportWith :: ReportSpec -> Journal -> PriceOracle -> Set AccountName -> MultiBalanceReport #
sortRows :: ReportOpts -> Journal -> [MultiBalanceReportRow] -> [MultiBalanceReportRow] #
sortRowsLike :: [AccountName] -> [PeriodicReportRow DisplayName b] -> [PeriodicReportRow DisplayName b] #
startingPostings :: ReportSpec -> Journal -> PriceOracle -> DateSpan -> [Posting] #
mkpostingsReportItem :: Bool -> Bool -> WhichDate -> Maybe Period -> Posting -> MixedAmount -> PostingsReportItem #
postingsReport :: ReportSpec -> Journal -> PostingsReport #
flat_ :: ReportOpts -> Bool #
intervalFromRawOpts :: RawOpts -> Interval #
mixedAmountApplyValuationAfterSumFromOptsWith :: ReportOpts -> Journal -> PriceOracle -> DateSpan -> MixedAmount -> MixedAmount #
overEither :: ((a -> Either e b) -> s -> Either e t) -> (a -> b) -> s -> Either e t #
postingDateFn :: ReportOpts -> Posting -> Day #
queryFromFlags :: ReportOpts -> Query #
rawOptsToReportOpts :: Day -> RawOpts -> ReportOpts #
reportEndDate :: Journal -> ReportSpec -> Maybe Day #
reportOptsToSpec :: Day -> ReportOpts -> Either String ReportSpec #
reportOptsToggleStatus :: Status -> ReportOpts -> ReportOpts #
reportPeriodLastDay :: ReportSpec -> Maybe Day #
reportPeriodName :: BalanceAccumulation -> [DateSpan] -> DateSpan -> Text #
reportPeriodOrJournalLastDay :: ReportSpec -> Journal -> Maybe Day #
reportPeriodOrJournalStart :: ReportSpec -> Journal -> Maybe Day #
reportPeriodStart :: ReportSpec -> Maybe Day #
reportSpan :: Journal -> ReportSpec -> (DateSpan, [DateSpan]) #
reportSpanBothDates :: Journal -> ReportSpec -> (DateSpan, [DateSpan]) #
reportStartDate :: Journal -> ReportSpec -> Maybe Day #
simplifyStatuses :: Ord a => [a] -> [a] #
transactionDateFn :: ReportOpts -> Transaction -> Day #
tree_ :: ReportOpts -> Bool #
updateReportSpec :: ReportOpts -> ReportSpec -> Either String ReportSpec #
updateReportSpecWith :: (ReportOpts -> ReportOpts) -> ReportSpec -> Either String ReportSpec #
whichDate :: ReportOpts -> WhichDate #
periodicReportSpan :: PeriodicReport a b -> DateSpan #
prMapMaybeName :: (a -> Maybe b) -> PeriodicReport a c -> PeriodicReport b c #
prMapName :: (a -> b) -> PeriodicReport a c -> PeriodicReport b c #
prrAdd :: Semigroup b => PeriodicReportRow a b -> PeriodicReportRow a b -> PeriodicReportRow a b #
prrDepth :: PeriodicReportRow DisplayName a -> Int #
runExceptT :: ExceptT e m a -> m (Either e a) #
scaleCalendarDiffDays :: Integer -> CalendarDiffDays -> CalendarDiffDays #
dayOfWeekDiff :: DayOfWeek -> DayOfWeek -> Int #
firstDayOfWeekOnAfter :: DayOfWeek -> Day -> Day #
weekAllDays :: DayOfWeek -> Day -> [Day] #
weekFirstDay :: DayOfWeek -> Day -> Day #
weekLastDay :: DayOfWeek -> Day -> Day #
diffTimeToPicoseconds :: DiffTime -> Integer #
picosecondsToDiffTime :: Integer -> DiffTime #
secondsToDiffTime :: Integer -> DiffTime #
scaleCalendarDiffTime :: Integer -> CalendarDiffTime -> CalendarDiffTime #
daysAndTimeOfDayToTime :: Integer -> TimeOfDay -> NominalDiffTime #
makeTimeOfDayValid :: Int -> Int -> Pico -> Maybe TimeOfDay #
pastMidnight :: DiffTime -> TimeOfDay #
sinceMidnight :: TimeOfDay -> DiffTime #
timeToDaysAndTimeOfDay :: NominalDiffTime -> (Integer, TimeOfDay) #
hoursToTimeZone :: Int -> TimeZone #
timeZoneOffsetString :: TimeZone -> String #
timeZoneOffsetString' :: Maybe Char -> TimeZone -> String #
getChanContents :: Chan a -> IO [a] #
writeList2Chan :: Chan a -> [a] -> IO () #
addMVarFinalizer :: MVar a -> IO () -> IO () #
modifyMVar :: MVar a -> (a -> IO (a, b)) -> IO b #
modifyMVarMasked :: MVar a -> (a -> IO (a, b)) -> IO b #
modifyMVarMasked_ :: MVar a -> (a -> IO a) -> IO () #
modifyMVar_ :: MVar a -> (a -> IO a) -> IO () #
withMVarMasked :: MVar a -> (a -> IO b) -> IO b #
signalQSem :: QSem -> IO () #
signalQSemN :: QSemN -> Int -> IO () #
threadWaitRead :: Fd -> IO () #
threadWaitReadSTM :: Fd -> IO (STM (), IO ()) #
threadWaitWrite :: Fd -> IO () #
threadWaitWriteSTM :: Fd -> IO (STM (), IO ()) #
getNumCapabilities :: IO Int #
killThread :: ThreadId -> IO () #
mkWeakThreadId :: ThreadId -> IO (Weak ThreadId) #
myThreadId :: IO ThreadId #
setNumCapabilities :: Int -> IO () #
threadCapability :: ThreadId -> IO (Int, Bool) #
isEmptyMVar :: MVar a -> IO Bool #
tryPutMVar :: MVar a -> a -> IO Bool #
tryReadMVar :: MVar a -> IO (Maybe a) #
tryTakeMVar :: MVar a -> IO (Maybe a) #
rtsSupportsBoundThreads :: Bool #
isCurrentThreadBound :: IO Bool #
runInBoundThread :: IO a -> IO a #
runInUnboundThread :: IO a -> IO a #
ioeGetErrorString :: IOError -> String #
ioeGetErrorType :: IOError -> IOErrorType #
ioeGetFileName :: IOError -> Maybe FilePath #
ioeGetHandle :: IOError -> Maybe Handle #
ioeGetLocation :: IOError -> String #
ioeSetErrorString :: IOError -> String -> IOError #
ioeSetErrorType :: IOError -> IOErrorType -> IOError #
ioeSetFileName :: IOError -> FilePath -> IOError #
ioeSetHandle :: IOError -> Handle -> IOError #
ioeSetLocation :: IOError -> String -> IOError #
isAlreadyExistsError :: IOError -> Bool #
isAlreadyExistsErrorType :: IOErrorType -> Bool #
isAlreadyInUseError :: IOError -> Bool #
isAlreadyInUseErrorType :: IOErrorType -> Bool #
isDoesNotExistError :: IOError -> Bool #
isDoesNotExistErrorType :: IOErrorType -> Bool #
isEOFError :: IOError -> Bool #
isEOFErrorType :: IOErrorType -> Bool #
isFullError :: IOError -> Bool #
isFullErrorType :: IOErrorType -> Bool #
isIllegalOperation :: IOError -> Bool #
isIllegalOperationErrorType :: IOErrorType -> Bool #
isPermissionError :: IOError -> Bool #
isPermissionErrorType :: IOErrorType -> Bool #
isResourceVanishedError :: IOError -> Bool #
isResourceVanishedErrorType :: IOErrorType -> Bool #
isUserError :: IOError -> Bool #
isUserErrorType :: IOErrorType -> Bool #
activity :: CliOpts -> Journal -> IO () Source #
Print a bar chart of number of postings per report interval.
showHistogram :: ReportSpec -> Journal -> String Source #
printDayWith :: (PrintfArg t1, PrintfType t2) => (t3 -> t1) -> (DateSpan, t3) -> t2 Source #