Safe Haskell | None |
---|---|
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
- module Hledger.Cli.CliOptions
- module Hledger.Cli.Commands
- module Hledger.Cli.CompoundBalanceCommand
- module Hledger.Cli.DocFiles
- module Hledger.Cli.Utils
- module Hledger.Cli.Version
- class HasReportOptsNoUpdate c where
- reportOptsNoUpdate :: Lens' c ReportOpts
- accountlistmode :: Lens' c AccountListMode
- average :: Lens' c Bool
- balance_base_url :: Lens' c (Maybe Text)
- 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 DepthSpec
- 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
- sortspec :: Lens' c SortSpec
- statusesNoUpdate :: Lens' c [Status]
- summary_only :: Lens' c Bool
- transpose__ :: Lens' c Bool
- txn_dates :: Lens' c Bool
- value :: Lens' c (Maybe ValuationType)
- process :: Mode a -> [String] -> Either String a
- class HasInputOpts c where
- inputOpts :: Lens' c InputOpts
- aliases :: Lens' c [String]
- anon__ :: Lens' c Bool
- auto__ :: Lens' c Bool
- balancingopts :: Lens' c BalancingOpts
- defer :: Lens' c Bool
- 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
- oldtimeclock :: Lens' c Bool
- pivot :: Lens' c String
- posting_account_tags :: Lens' c Bool
- reportspan :: Lens' c DateSpan
- strict :: Lens' c Bool
- verbose_tags :: Lens' c Bool
- group :: Eq a => [a] -> [[a]]
- proc :: FilePath -> [String] -> CreateProcess
- argsToCliOpts :: [String] -> [String] -> IO CliOpts
- 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
- class Applicative m => Monad (m :: Type -> Type) where
- when :: Applicative f => Bool -> f () -> f ()
- unless :: Applicative f => Bool -> f () -> f ()
- data Char
- isDigit :: Char -> Bool
- data Either a b
- isRight :: Either a b -> Bool
- class Functor (f :: Type -> Type) where
- (<&>) :: Functor f => f a -> (a -> b) -> f b
- data List a
- data Maybe a
- isJust :: Maybe a -> Bool
- fromMaybe :: a -> Maybe a -> a
- fromJust :: HasCallStack => Maybe a -> a
- data Text
- pack :: String -> Text
- type Name = String
- optional :: Alternative f => f a -> f (Maybe a)
- newtype Day = ModifiedJulianDay {
- toModifiedJulianDay :: Integer
- data SmartInterval
- error' :: String -> a
- quoteIfSpaced :: Text -> Text
- showDateSpan :: DateSpan -> Text
- showDate :: Day -> Text
- data DateSpan = DateSpan (Maybe EFDay) (Maybe EFDay)
- data IO a
- intercalate :: [a] -> [[a]] -> [a]
- isInfixOf :: Eq a => [a] -> [a] -> Bool
- exitSuccess :: IO a
- type FilePath = String
- isPrefixOf :: Eq a => [a] -> [a] -> Bool
- isSuffixOf :: Eq a => [a] -> [a] -> Bool
- isAlphaNum :: Char -> Bool
- isSpace :: Char -> Bool
- toLower :: Char -> Char
- headErr :: Partial => [a] -> a
- withArgs :: [String] -> IO a -> IO a
- dropExtension :: FilePath -> FilePath
- takeBaseName :: FilePath -> String
- takeExtension :: FilePath -> String
- type Balance = MixedAmount
- type Help = String
- forM_ :: (Foldable t, Monad m) => t a -> (a -> m b) -> m ()
- headDef :: a -> [a] -> a
- sortOn :: Ord b => (a -> b) -> [a] -> [a]
- printf :: PrintfType r => String -> r
- toUpper :: Char -> Char
- nub :: Eq a => [a] -> [a]
- toGregorian :: Day -> (Year, MonthOfYear, DayOfMonth)
- 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 ()
- find :: Foldable t => (a -> Bool) -> t a -> Maybe a
- data Side
- flagReq :: [Name] -> Update a -> FlagHelp -> Help -> Flag a
- data SepFormat
- guard :: Alternative f => Bool -> f ()
- transpose :: [[a]] -> [[a]]
- mapMaybe :: (a -> Maybe b) -> [a] -> [b]
- addDays :: Integer -> Day -> Day
- fromGregorian :: Year -> MonthOfYear -> DayOfMonth -> Day
- flagOpt :: String -> [Name] -> Update a -> FlagHelp -> Help -> Flag a
- maximumMay :: Ord a => [a] -> Maybe a
- partitionEithers :: [Either a b] -> ([a], [b])
- sort :: Ord a => [a] -> [a]
- groupBy :: (a -> a -> Bool) -> [a] -> [[a]]
- lastDef :: a -> [a] -> a
- readMay :: Read a => String -> Maybe a
- readDef :: Read a => a -> String -> a
- threadDelay :: Int -> IO ()
- callProcess :: FilePath -> [String] -> IO ()
- catchIOError :: IO a -> (IOError -> IO a) -> IO a
- findIndex :: (a -> Bool) -> [a] -> Maybe Int
- dropWhileEnd :: (a -> Bool) -> [a] -> [a]
- class Functor f => Applicative (f :: Type -> Type) where
- class Applicative f => Alternative (f :: Type -> Type) where
- tailMay :: [a] -> Maybe [a]
- hClose :: Handle -> IO ()
- (\\) :: Eq a => [a] -> [a] -> [a]
- nubBy :: (a -> a -> Bool) -> [a] -> [a]
- sortBy :: (a -> a -> Ordering) -> [a] -> [a]
- class Eq a => Ord a where
- comparing :: Ord a => (b -> a) -> b -> b -> Ordering
- diffDays :: Day -> Day -> Integer
- embedFileRelative :: FilePath -> Q Exp
- intersperse :: a -> [a] -> [a]
- lastMay :: [a] -> Maybe a
- minimumDef :: Ord a => a -> [a] -> a
- catMaybes :: [Maybe a] -> [a]
- per :: Quantity -> Amount
- data Group a = Group {
- groupUnnamed :: [a]
- groupHidden :: [a]
- groupNamed :: [(Help, [a])]
- intersect :: Eq a => [a] -> [a] -> [a]
- 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 ExitCode
- = ExitSuccess
- | ExitFailure Int
- exitWith :: ExitCode -> IO a
- expandArgsAt :: [String] -> IO [String]
- stdin :: Handle
- hIsTerminalDevice :: Handle -> IO Bool
- hIsOpen :: Handle -> IO Bool
- system :: String -> IO ExitCode
- data MVar a
- lookupEnv :: String -> IO (Maybe String)
- setupPager :: IO ()
- localeEncoding :: TextEncoding
- takeFileName :: FilePath -> FilePath
- maybeToList :: Maybe a -> [a]
- data ReportOpts = ReportOpts {
- period_ :: Period
- interval_ :: Interval
- statuses_ :: [Status]
- conversionop_ :: Maybe ConversionOp
- value_ :: Maybe ValuationType
- infer_prices_ :: Bool
- depth_ :: DepthSpec
- date2_ :: Bool
- empty_ :: Bool
- no_elide_ :: Bool
- real_ :: Bool
- format_ :: StringFormat
- balance_base_url_ :: Maybe Text
- pretty_ :: Bool
- querystring_ :: [Text]
- average_ :: Bool
- related_ :: Bool
- sortspec_ :: SortSpec
- 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
- void :: Functor f => f a -> f ()
- forM :: (Traversable t, Monad m) => t a -> (a -> m b) -> m (t b)
- getHomeDirectory :: IO FilePath
- getXdgDirectory :: XdgDirectory -> FilePath -> IO FilePath
- data XdgDirectory
- doesFileExist :: FilePath -> IO Bool
- getCurrentDirectory :: IO FilePath
- (</>) :: FilePath -> FilePath -> FilePath
- takeDirectory :: FilePath -> FilePath
- strip :: String -> String
- words' :: String -> [String]
- data RawOpts
- expandPath :: FilePath -> FilePath -> IO FilePath
- collectopts :: ((String, String) -> Maybe a) -> RawOpts -> [a]
- setEnv :: String -> String -> IO ()
- first3 :: (a, b, c) -> a
- second3 :: (a, b, c) -> b
- third3 :: (a, b, c) -> c
- unzip :: [(a, b)] -> ([a], [b])
- formatString :: Bool -> Maybe Int -> Maybe Int -> String -> String
- unpack :: Text -> String
- at :: Amount -> Amount -> Amount
- getModificationTime :: FilePath -> IO UTCTime
- getDirectoryContents :: FilePath -> IO [FilePath]
- copyFile :: FilePath -> FilePath -> IO ()
- splitFileName :: FilePath -> (String, String)
- readProcessWithExitCode :: FilePath -> [String] -> String -> IO (ExitCode, String, String)
- ghcDebugSupportedInLib :: Bool
- splitAtElement :: Eq a => a -> [a] -> [[a]]
- rstrip :: String -> String
- parsedate :: String -> Maybe Day
- getEnv :: String -> IO String
- map :: (a -> b) -> [a] -> [b]
- filter :: (a -> Bool) -> [a] -> [a]
- all :: Foldable t => (a -> Bool) -> t a -> Bool
- (=<<) :: Monad m => (a -> m b) -> m a -> m b
- either :: (a -> c) -> (b -> c) -> Either a b -> c
- and :: Foldable t => t Bool -> Bool
- any :: Foldable t => (a -> Bool) -> t a -> Bool
- concat :: Foldable t => t [a] -> [a]
- 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 ()
- (<$>) :: Functor f => (a -> b) -> f a -> f b
- maybe :: b -> (a -> b) -> Maybe a -> b
- lines :: String -> [String]
- unlines :: [String] -> String
- unwords :: [String] -> String
- words :: String -> [String]
- ioError :: IOError -> IO a
- userError :: String -> IOError
- (!!) :: HasCallStack => [a] -> Int -> a
- break :: (a -> Bool) -> [a] -> ([a], [a])
- cycle :: HasCallStack => [a] -> [a]
- drop :: Int -> [a] -> [a]
- dropWhile :: (a -> Bool) -> [a] -> [a]
- head :: HasCallStack => [a] -> a
- init :: HasCallStack => [a] -> [a]
- iterate :: (a -> a) -> a -> [a]
- last :: HasCallStack => [a] -> a
- lookup :: Eq a => a -> [(a, b)] -> Maybe b
- repeat :: a -> [a]
- replicate :: Int -> a -> [a]
- 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]
- span :: (a -> Bool) -> [a] -> ([a], [a])
- splitAt :: Int -> [a] -> ([a], [a])
- tail :: HasCallStack => [a] -> [a]
- take :: Int -> [a] -> [a]
- takeWhile :: (a -> Bool) -> [a] -> [a]
- unzip3 :: [(a, b, c)] -> ([a], [b], [c])
- zip3 :: [a] -> [b] -> [c] -> [(a, b, c)]
- zipWith :: (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 ()
- 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 ()
- elem :: (Foldable t, Eq a) => a -> t a -> Bool
- foldl :: Foldable t => (b -> a -> b) -> b -> t a -> b
- foldl' :: Foldable t => (b -> a -> b) -> b -> t a -> b
- foldl1 :: Foldable t => (a -> a -> a) -> t a -> a
- foldr :: Foldable t => (a -> b -> b) -> b -> t a -> b
- foldr1 :: Foldable t => (a -> a -> a) -> t a -> a
- length :: Foldable t => t a -> Int
- maximum :: (Foldable t, Ord a) => t a -> a
- minimum :: (Foldable t, Ord a) => t a -> a
- null :: Foldable t => t a -> Bool
- product :: (Foldable t, Num a) => t a -> a
- sum :: (Foldable t, Num a) => t a -> a
- mapM :: (Traversable t, Monad m) => (a -> m b) -> t a -> m (t b)
- sequence :: (Traversable t, Monad m) => t (m a) -> m (t a)
- type IOError = IOException
- data Ordering
- class Assertable t where
- (++) :: [a] -> [a] -> [a]
- join :: Monad m => m (m a) -> m a
- zip :: [a] -> [b] -> [(a, b)]
- data Query
- print :: Show a => a -> IO ()
- data OrdPlus
- foldl1' :: HasCallStack => (a -> a -> a) -> [a] -> a
- unfoldr :: (b -> Maybe (a, b)) -> b -> [a]
- isAscii :: Char -> Bool
- singleton :: a -> [a]
- class Monad m => MonadFail (m :: Type -> Type) where
- fail :: String -> m a
- inits :: [a] -> [[a]]
- 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)
- partition :: (a -> Bool) -> [a] -> ([a], [a])
- stripPrefix :: Eq a => [a] -> [a] -> Maybe [a]
- tails :: [a] -> [[a]]
- takeEnd :: Int -> [a] -> [a]
- toTitle :: Char -> Char
- uncons :: [a] -> Maybe (a, [a])
- unsnoc :: [a] -> Maybe ([a], a)
- 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
- errorShortFormat :: a
- data FormatParse = FormatParse {
- fpModifiers :: String
- fpChar :: Char
- fpRest :: String
- type HasCallStack = ?callStack :: CallStack
- data CalendarDiffDays = CalendarDiffDays {}
- calendarDay :: CalendarDiffDays
- calendarMonth :: CalendarDiffDays
- calendarWeek :: CalendarDiffDays
- calendarYear :: CalendarDiffDays
- scaleCalendarDiffDays :: Integer -> CalendarDiffDays -> CalendarDiffDays
- class Ord p => DayPeriod p where
- periodFirstDay :: p -> Day
- periodLastDay :: p -> Day
- dayPeriod :: Day -> p
- data Period
- 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
- pattern YearMonthDay :: Year -> MonthOfYear -> DayOfMonth -> Day
- 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
- showGregorian :: Day -> String
- isLeapYear :: Year -> Bool
- pattern April :: MonthOfYear
- pattern August :: MonthOfYear
- pattern BeforeCommonEra :: Integer -> Year
- pattern CommonEra :: Integer -> Year
- type DayOfMonth = Int
- pattern December :: MonthOfYear
- pattern February :: MonthOfYear
- pattern January :: MonthOfYear
- pattern July :: MonthOfYear
- pattern June :: MonthOfYear
- pattern March :: MonthOfYear
- pattern May :: MonthOfYear
- type MonthOfYear = Int
- pattern November :: MonthOfYear
- pattern October :: MonthOfYear
- pattern September :: MonthOfYear
- type Year = Integer
- data DayOfWeek
- dayOfWeek :: Day -> DayOfWeek
- dayOfWeekDiff :: DayOfWeek -> DayOfWeek -> Int
- firstDayOfWeekOnAfter :: DayOfWeek -> Day -> Day
- weekAllDays :: DayOfWeek -> Day -> [Day]
- weekFirstDay :: DayOfWeek -> Day -> Day
- weekLastDay :: DayOfWeek -> Day -> Day
- data DiffTime
- diffTimeToPicoseconds :: DiffTime -> Integer
- picosecondsToDiffTime :: Integer -> DiffTime
- secondsToDiffTime :: Integer -> DiffTime
- data NominalDiffTime
- nominalDay :: NominalDiffTime
- nominalDiffTimeToSeconds :: NominalDiffTime -> Pico
- secondsToNominalDiffTime :: Pico -> NominalDiffTime
- getTime_resolution :: DiffTime
- addUTCTime :: NominalDiffTime -> UTCTime -> UTCTime
- diffUTCTime :: UTCTime -> UTCTime -> NominalDiffTime
- data UTCTime = UTCTime {
- utctDay :: Day
- utctDayTime :: DiffTime
- newtype UniversalTime = ModJulianDate {
- getModJulianDate :: Rational
- getCurrentTime :: IO UTCTime
- class FormatTime t
- data TimeLocale = TimeLocale {
- wDays :: [(String, String)]
- months :: [(String, String)]
- amPm :: (String, String)
- dateTimeFmt :: String
- dateFmt :: String
- timeFmt :: String
- time12Fmt :: String
- knownTimeZones :: [TimeZone]
- iso8601DateFormat :: Maybe String -> String
- rfc822DateFormat :: String
- parseTimeM :: (MonadFail m, ParseTime t) => Bool -> TimeLocale -> String -> String -> m t
- parseTimeMultipleM :: (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
- class ParseTime t
- data CalendarDiffTime = CalendarDiffTime {
- ctMonths :: Integer
- ctTime :: NominalDiffTime
- calendarTimeDays :: CalendarDiffDays -> CalendarDiffTime
- calendarTimeTime :: NominalDiffTime -> CalendarDiffTime
- scaleCalendarDiffTime :: Integer -> CalendarDiffTime -> CalendarDiffTime
- data LocalTime = LocalTime {}
- addLocalTime :: NominalDiffTime -> LocalTime -> LocalTime
- diffLocalTime :: LocalTime -> LocalTime -> NominalDiffTime
- localTimeToUT1 :: Rational -> LocalTime -> UniversalTime
- localTimeToUTC :: TimeZone -> LocalTime -> UTCTime
- ut1ToLocalTime :: Rational -> UniversalTime -> LocalTime
- utcToLocalTime :: TimeZone -> UTCTime -> LocalTime
- data TimeOfDay = TimeOfDay {}
- dayFractionToTimeOfDay :: Rational -> TimeOfDay
- daysAndTimeOfDayToTime :: Integer -> TimeOfDay -> NominalDiffTime
- localToUTCTimeOfDay :: TimeZone -> TimeOfDay -> (Integer, TimeOfDay)
- makeTimeOfDayValid :: Int -> Int -> Pico -> Maybe TimeOfDay
- midday :: TimeOfDay
- midnight :: TimeOfDay
- pastMidnight :: DiffTime -> TimeOfDay
- sinceMidnight :: TimeOfDay -> DiffTime
- timeOfDayToDayFraction :: TimeOfDay -> Rational
- timeOfDayToTime :: TimeOfDay -> DiffTime
- timeToDaysAndTimeOfDay :: NominalDiffTime -> (Integer, TimeOfDay)
- timeToTimeOfDay :: DiffTime -> TimeOfDay
- utcToLocalTimeOfDay :: TimeZone -> TimeOfDay -> (Integer, TimeOfDay)
- data TimeZone = TimeZone {
- timeZoneMinutes :: Int
- timeZoneSummerOnly :: Bool
- timeZoneName :: String
- getCurrentTimeZone :: IO TimeZone
- getTimeZone :: UTCTime -> IO TimeZone
- hoursToTimeZone :: Int -> TimeZone
- minutesToTimeZone :: Int -> TimeZone
- timeZoneOffsetString :: TimeZone -> String
- timeZoneOffsetString' :: Maybe Char -> TimeZone -> String
- utc :: TimeZone
- data ZonedTime = ZonedTime {}
- getZonedTime :: IO ZonedTime
- utcToLocalZonedTime :: UTCTime -> IO ZonedTime
- utcToZonedTime :: TimeZone -> UTCTime -> ZonedTime
- zonedTimeToUTC :: ZonedTime -> UTCTime
- isNothing :: Maybe a -> Bool
- listToMaybe :: [a] -> Maybe a
- makeAbsolute :: FilePath -> IO FilePath
- data AmountFormat = AmountFormat {
- displayCommodity :: Bool
- displayZeroCommodity :: Bool
- displayCommodityOrder :: Maybe [CommoditySymbol]
- displayDigitGroups :: Bool
- displayForceDecimalMark :: Bool
- displayOneLine :: Bool
- displayMinWidth :: Maybe Int
- displayMaxWidth :: Maybe Int
- displayCost :: Bool
- displayColour :: Bool
- displayQuotes :: Bool
- showMixedAmountB :: AmountFormat -> MixedAmount -> WideBuilder
- showMixedAmountLinesPartsB :: AmountFormat -> MixedAmount -> [(WideBuilder, Amount)]
- unifyMixedAmount :: MixedAmount -> Maybe Amount
- data Amount = Amount {
- acommodity :: !CommoditySymbol
- aquantity :: !Quantity
- astyle :: !AmountStyle
- acost :: !(Maybe AmountCost)
- data MixedAmount
- data WideBuilder = WideBuilder {}
- type Total = MixedAmount
- amounts :: MixedAmount -> [Amount]
- nullamt :: Amount
- post :: AccountName -> Amount -> Posting
- data YNA
- ansiFormatError :: String -> String
- ansiFormatWarning :: String -> String
- 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
- colorB :: ColorIntensity -> Color -> WideBuilder -> WideBuilder
- colorOption :: IO YNA
- cyan' :: String -> String
- exitOnError :: IO () -> IO ()
- exitWithErrorMessage :: String -> IO ()
- expandGlob :: FilePath -> FilePath -> IO [FilePath]
- expandHomePath :: FilePath -> IO FilePath
- faint' :: String -> String
- findPager :: IO (Maybe String)
- getCurrentLocalTime :: IO LocalTime
- getCurrentZonedTime :: IO ZonedTime
- getHomeSafe :: IO (Maybe FilePath)
- getOpt :: [String] -> IO (Maybe String)
- getTerminalHeight :: IO (Maybe Int)
- getTerminalHeightWidth :: IO (Maybe (Int, Int))
- getTerminalWidth :: IO (Maybe Int)
- green' :: String -> String
- inputToHandle :: Text -> IO Handle
- magenta' :: String -> String
- openFileOrStdin :: String -> IO Handle
- parseYN :: String -> Either String Bool
- parseYNA :: String -> Either String YNA
- pprint :: Show a => a -> IO ()
- pprint' :: Show a => a -> IO ()
- printError :: String -> IO ()
- progArgs :: [String]
- pshow :: Show a => a -> String
- pshow' :: Show a => a -> String
- readFileOrStdinPortably :: String -> IO Text
- readFileOrStdinPortably' :: Maybe DynEncoding -> String -> IO Text
- readFilePortably :: FilePath -> IO Text
- readFileStrictly :: FilePath -> IO Text
- readHandlePortably :: Handle -> IO Text
- readHandlePortably' :: Maybe DynEncoding -> Handle -> IO Text
- red' :: String -> String
- rgb' :: Float -> Float -> Float -> String -> String
- runPager :: String -> IO ()
- sgrresetall :: String
- sortByModTime :: [FilePath] -> IO [FilePath]
- terminalBgColor :: Maybe (RGB Float)
- terminalFgColor :: Maybe (RGB Float)
- terminalIsLight :: Maybe Bool
- terminalLightness :: Maybe Float
- usageError :: String -> a
- useColorOnStderr :: IO Bool
- useColorOnStderrUnsafe :: Bool
- useColorOnStdout :: IO Bool
- useColorOnStdoutUnsafe :: Bool
- warn :: String -> a -> a
- white' :: String -> String
- yellow' :: String -> String
- isPathSeparator :: Char -> Bool
- combine :: FilePath -> FilePath -> FilePath
- data TextEncoding
- data Handle
- utf8_bom :: TextEncoding
- data IOMode
- stdout :: Handle
- data Newline
- wbFromText :: Text -> WideBuilder
- wbToText :: WideBuilder -> Text
- wbUnpack :: WideBuilder -> String
- escapeBackslash :: Text -> Text
- escapeDoubleQuotes :: Text -> Text
- fitText :: Maybe Int -> Maybe Int -> Bool -> Bool -> Text -> Text
- formatText :: Bool -> Maybe Int -> Maybe Int -> Text -> Text
- linesPrepend :: Text -> Text -> Text
- linesPrepend2 :: Text -> Text -> Text -> Text
- readDecimal :: Text -> Integer
- stripquotes :: Text -> Text
- tests_Text :: TestTree
- textCapitalise :: Text -> Text
- textChomp :: Text -> Text
- textConcatBottomPadded :: [Text] -> Text
- textConcatTopPadded :: [Text] -> Text
- textElideRight :: Int -> Text -> Text
- textQuoteIfNeeded :: Text -> Text
- textTakeWidth :: Int -> Text -> Text
- textUnbracket :: Text -> Text
- unlinesB :: [Builder] -> Builder
- wrap :: Text -> Text -> Text -> Text
- data TestTree
- dateSpanAsPeriod :: DateSpan -> Period
- periodAsDateSpan :: Period -> DateSpan
- showPeriod :: Period -> Text
- showPeriodAbbrev :: Period -> Text
- data Interval
- = NoInterval
- | Days Int
- | Weeks Int
- | Months Int
- | Quarters Int
- | Years Int
- | NthWeekdayOfMonth Int Int
- | MonthDay Int
- | MonthAndDay Int Int
- | DaysOfWeek [Int]
- data EFDay
- type Month = Int
- type MonthDay = Int
- type Quarter = Int
- data SmartDate
- type WeekDay = Int
- fromEFDay :: EFDay -> Day
- modifyEFDay :: (Day -> Day) -> EFDay -> EFDay
- applyN :: Int -> (a -> a) -> a -> a
- type HledgerParseErrors = ParseErrorBundle Text HledgerParseErrorData
- type TextParser (m :: Type -> Type) a = ParsecT HledgerParseErrorData Text m a
- choice' :: forall (m :: Type -> Type) a. [TextParser m a] -> TextParser m a
- customErrorBundlePretty :: HledgerParseErrors -> String
- 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 ()
- 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)
- periodContainsDate :: Period -> Day -> Bool
- periodexprp :: forall (m :: Type -> Type). Day -> TextParser m (Interval, DateSpan)
- prevday :: Day -> Day
- showDateSpanAbbrev :: DateSpan -> Text
- showDateSpanDebug :: DateSpan -> String
- 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
- spanExtend :: DateSpan -> DateSpan -> DateSpan
- 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
- data HledgerParseErrorData
- isNonNewlineSpace :: Char -> Bool
- data SourcePos = SourcePos {
- sourceName :: FilePath
- sourceLine :: !Pos
- sourceColumn :: !Pos
- simplifyPeriod :: Period -> Period
- union :: Eq a => [a] -> [a] -> [a]
- data Regexp
- type Replacement = String
- data AccountAlias
- data AccountDeclarationInfo = AccountDeclarationInfo {
- adicomment :: Text
- aditags :: [Tag]
- adideclarationorder :: Int
- adisourcepos :: SourcePos
- data AccountType
- data Account = Account {
- aname :: AccountName
- adeclarationinfo :: Maybe AccountDeclarationInfo
- asubs :: [Account]
- aparent :: Maybe Account
- aboring :: Bool
- anumpostings :: Int
- aebalance :: MixedAmount
- aibalance :: MixedAmount
- data AmountCost
- data AmountPrecision
- = Precision !Word8
- | NaturalPrecision
- 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 {}
- data DigitGroupStyle = DigitGroups !Char ![Word8]
- 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
- jdeclaredcommodities :: Map CommoditySymbol Commodity
- jinferredcommoditystyles :: Map CommoditySymbol AmountStyle
- jglobalcommoditystyles :: Map CommoditySymbol AmountStyle
- jpricedirectives :: [PriceDirective]
- jinferredmarketprices :: [MarketPrice]
- jtxnmodifiers :: [TransactionModifier]
- jperiodictxns :: [PeriodicTransaction]
- jtxns :: [Transaction]
- jfinalcommentlines :: Text
- jfiles :: [(FilePath, Text)]
- jlastreadtime :: POSIXTime
- data Ledger = Ledger {}
- data MarketPrice = MarketPrice {
- mpdate :: Day
- mpfrom :: CommoditySymbol
- mpto :: CommoditySymbol
- mprate :: Quantity
- pattern MixedAmountKeyNoCost :: !CommoditySymbol -> MixedAmountKey
- pattern MixedAmountKeyTotalCost :: !CommoditySymbol -> !CommoditySymbol -> MixedAmountKey
- pattern MixedAmountKeyUnitCost :: !CommoditySymbol -> !CommoditySymbol -> !Quantity -> MixedAmountKey
- data PayeeDeclarationInfo = PayeeDeclarationInfo {
- pdicomment :: Text
- pditags :: [Tag]
- 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 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 PriceDirective = PriceDirective {}
- data Rounding
- data Status
- data TMPostingRule = TMPostingRule {
- tmprPosting :: Posting
- tmprIsMultiplier :: Bool
- newtype TagDeclarationInfo = TagDeclarationInfo {
- tdicomment :: 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 {}
- data Transaction = Transaction {}
- class HasAmounts a where
- styleAmounts :: Map CommoditySymbol AmountStyle -> a -> a
- data DepthSpec = DepthSpec {
- dsFlatDepth :: Maybe Int
- dsRegexpDepths :: [(Regexp, Int)]
- data NormalSign
- data StorageFormat
- data WhichDate
- isAccountSubtypeOf :: AccountType -> AccountType -> Bool
- isBalanceSheetAccountType :: AccountType -> Bool
- isDecimalMark :: Char -> Bool
- isHiddenTagName :: TagName -> Bool
- isIncomeStatementAccountType :: AccountType -> Bool
- maCompare :: MixedAmount -> MixedAmount -> Ordering
- nullaccountdeclarationinfo :: AccountDeclarationInfo
- nullpayeedeclarationinfo :: PayeeDeclarationInfo
- nullperiodictransaction :: PeriodicTransaction
- nullsourcepos :: SourcePos
- nullsourcepospair :: (SourcePos, SourcePos)
- nulltagdeclarationinfo :: TagDeclarationInfo
- nulltransactionmodifier :: TransactionModifier
- showMarketPrice :: MarketPrice -> String
- showMarketPrices :: [MarketPrice] -> [Char]
- toHiddenTag :: Tag -> HiddenTag
- toHiddenTagName :: TagName -> TagName
- toVisibleTag :: HiddenTag -> Tag
- toVisibleTagName :: TagName -> TagName
- type AccountName = Text
- type CommoditySymbol = Text
- type DateTag = (TagName, Day)
- type DecimalMark = Char
- type HiddenTag = Tag
- type MonthWeek = Int
- type ParsedJournal = Journal
- type Payee = Text
- type Quantity = Decimal
- type Tag = (TagName, TagValue)
- type TagName = Text
- type TagValue = Text
- type YearDay = Int
- type YearWeek = Int
- showLitChar :: Char -> ShowS
- numDigitsInt :: Integral a => Int -> a
- numDigitsInteger :: Integer -> Int
- mixedAmountSetStyles :: Map CommoditySymbol AmountStyle -> MixedAmount -> MixedAmount
- styleMixedAmount :: Map CommoditySymbol AmountStyle -> MixedAmount -> MixedAmount
- canonicaliseMixedAmount :: Map CommoditySymbol AmountStyle -> MixedAmount -> MixedAmount
- amountSetStyles :: Map CommoditySymbol AmountStyle -> Amount -> Amount
- styleAmount :: Map CommoditySymbol AmountStyle -> Amount -> Amount
- canonicaliseAmount :: Map CommoditySymbol AmountStyle -> Amount -> Amount
- ap :: Monad m => m (a -> b) -> m a -> m b
- (@@) :: Amount -> Amount -> Amount
- amountCost :: Amount -> Amount
- amountDisplayPrecision :: Amount -> Word8
- amountInternalPrecision :: Amount -> Word8
- amountIsZero :: Amount -> Bool
- amountLooksZero :: Amount -> Bool
- amountSetFullPrecision :: Amount -> Amount
- amountSetFullPrecisionUpTo :: Maybe Word8 -> Amount -> Amount
- amountSetPrecision :: AmountPrecision -> Amount -> Amount
- amountSetPrecisionMax :: Word8 -> Amount -> Amount
- amountSetPrecisionMin :: Word8 -> Amount -> Amount
- amountStripCost :: Amount -> Amount
- amountStyleSetRounding :: Rounding -> AmountStyle -> AmountStyle
- amountStylesSetRounding :: Rounding -> Map CommoditySymbol AmountStyle -> Map CommoditySymbol AmountStyle
- amountUnstyled :: Amount -> Amount
- amountWithCommodity :: CommoditySymbol -> Amount -> Amount
- amountsPreservingZeros :: MixedAmount -> [Amount]
- amountsRaw :: MixedAmount -> [Amount]
- amountstyle :: AmountStyle
- averageMixedAmounts :: [MixedAmount] -> MixedAmount
- cshowAmount :: Amount -> String
- defaultFmt :: AmountFormat
- defaultMaxPrecision :: Word8
- divideAmount :: Quantity -> Amount -> Amount
- divideMixedAmount :: Quantity -> MixedAmount -> MixedAmount
- eur :: DecimalRaw Integer -> Amount
- filterMixedAmount :: (Amount -> Bool) -> MixedAmount -> MixedAmount
- filterMixedAmountByCommodity :: CommoditySymbol -> MixedAmount -> MixedAmount
- fullZeroFmt :: AmountFormat
- 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
- machineFmt :: AmountFormat
- 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
- mixedAmountSetFullPrecisionUpTo :: Maybe Word8 -> MixedAmount -> MixedAmount
- mixedAmountSetPrecision :: AmountPrecision -> MixedAmount -> MixedAmount
- mixedAmountSetPrecisionMax :: Word8 -> MixedAmount -> MixedAmount
- mixedAmountSetPrecisionMin :: Word8 -> MixedAmount -> MixedAmount
- mixedAmountStripCosts :: MixedAmount -> MixedAmount
- mixedAmountUnstyled :: MixedAmount -> MixedAmount
- multiplyAmount :: Quantity -> Amount -> Amount
- multiplyMixedAmount :: Quantity -> MixedAmount -> MixedAmount
- noCostFmt :: AmountFormat
- nullmixedamt :: MixedAmount
- num :: Quantity -> Amount
- oneLineFmt :: AmountFormat
- oneLineNoCostFmt :: AmountFormat
- quoteCommoditySymbolIfNeeded :: Text -> Text
- setAmountDecimalPoint :: Maybe Char -> Amount -> Amount
- setAmountInternalPrecision :: Word8 -> Amount -> Amount
- showAmount :: Amount -> String
- showAmountB :: AmountFormat -> Amount -> WideBuilder
- showAmountCost :: Amount -> String
- showAmountCostB :: AmountFormat -> Amount -> WideBuilder
- showAmountDebug :: Amount -> String
- showAmountWith :: AmountFormat -> Amount -> String
- showAmountWithZeroCommodity :: Amount -> String
- showAmountWithoutCost :: Amount -> String
- showCommoditySymbol :: Text -> Text
- showMixedAmount :: MixedAmount -> String
- showMixedAmountDebug :: MixedAmount -> String
- showMixedAmountElided :: Int -> Bool -> MixedAmount -> String
- showMixedAmountLinesB :: AmountFormat -> MixedAmount -> [WideBuilder]
- showMixedAmountOneLine :: MixedAmount -> String
- showMixedAmountOneLineWithoutCost :: Bool -> MixedAmount -> String
- showMixedAmountWith :: AmountFormat -> MixedAmount -> String
- showMixedAmountWithZeroCommodity :: MixedAmount -> String
- showMixedAmountWithoutCost :: Bool -> MixedAmount -> String
- tests_Amount :: TestTree
- usd :: DecimalRaw Integer -> Amount
- withDecimalPoint :: Amount -> Maybe Char -> Amount
- withInternalPrecision :: Amount -> Word8 -> Amount
- withPrecision :: Amount -> AmountPrecision -> Amount
- data SeekMode
- genericDrop :: Integral i => i -> [a] -> [a]
- char8 :: TextEncoding
- (<**>) :: 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
- liftM :: Monad m => (a1 -> r) -> m a1 -> m r
- liftM2 :: Monad m => (a1 -> a2 -> r) -> m a1 -> m a2 -> m r
- 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
- ord :: Char -> Int
- intToDigit :: Int -> Char
- clamp :: Ord a => (a, a) -> a -> a
- formatRealFloat :: RealFloat a => a -> FieldFormatter
- newtype Const a (b :: k) = Const {
- getConst :: a
- genericTake :: Integral i => i -> [a] -> [a]
- (!?) :: [a] -> Int -> Maybe a
- 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 ()
- 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])
- delete :: Eq a => a -> [a] -> [a]
- insert :: Ord a => a -> [a] -> [a]
- newtype ZipList a = ZipList {
- getZipList :: [a]
- newtype Down a = Down {
- getDown :: a
- charWidth :: Char -> Int
- chomp :: String -> String
- sourcePosPretty :: SourcePos -> String
- unPos :: Pos -> Int
- fromLeft :: a -> Either a b -> a
- fromRight :: b -> Either a b -> b
- isLeft :: Either a b -> Bool
- lefts :: [Either a b] -> [a]
- rights :: [Either a b] -> [b]
- die :: String -> IO a
- data DependencyType
- after :: DependencyType -> String -> TestTree -> TestTree
- after_ :: DependencyType -> Expr -> TestTree -> TestTree
- sequentialTestGroup :: TestName -> DependencyType -> [TestTree] -> TestTree
- testGroup :: TestName -> [TestTree] -> TestTree
- type TestName = String
- utf8 :: TextEncoding
- isRelative :: FilePath -> Bool
- data InputOpts = InputOpts {
- mformat_ :: Maybe StorageFormat
- mrules_file_ :: Maybe FilePath
- aliases_ :: [String]
- anon_ :: Bool
- new_ :: Bool
- new_save_ :: Bool
- pivot_ :: String
- forecast_ :: Maybe DateSpan
- posting_account_tags_ :: Bool
- verbose_tags_ :: Bool
- reportspan_ :: DateSpan
- auto_ :: Bool
- infer_equity_ :: Bool
- infer_costs_ :: Bool
- balancingopts_ :: BalancingOpts
- strict_ :: Bool
- _defer :: Bool
- _ioDay :: Day
- _oldtimeclock :: Bool
- data Arg a = Arg {
- argValue :: Update a
- argType :: FlagHelp
- argRequire :: Bool
- iterate' :: (a -> a) -> a -> [a]
- asum :: (Foldable t, Alternative f) => t (f a) -> f a
- msum :: (Foldable t, MonadPlus m) => t (m a) -> m a
- txnTieKnot :: Transaction -> Transaction
- accountSetDeclarationInfo :: Journal -> Account -> Account
- accountTree :: AccountName -> [AccountName] -> Account
- accountsFromPostings :: [Posting] -> [Account]
- accountsLevels :: Account -> [[Account]]
- anyAccounts :: (Account -> Bool) -> Account -> Bool
- clipAccounts :: Int -> Account -> Account
- clipAccountsAndAggregate :: DepthSpec -> [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
- accountNameInferTypeExcept :: [AccountType] -> AccountName -> Maybe AccountType
- accountNameLevel :: AccountName -> Int
- accountNamePostingType :: AccountName -> PostingType
- accountNameToAccountOnlyRegex :: AccountName -> Regexp
- accountNameToAccountOnlyRegexCI :: AccountName -> Regexp
- accountNameToAccountRegex :: AccountName -> Regexp
- accountNameToAccountRegexCI :: AccountName -> Regexp
- 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
- cashAccountRegex :: Regexp
- clipAccountName :: DepthSpec -> AccountName -> AccountName
- clipOrEllipsifyAccountName :: DepthSpec -> AccountName -> AccountName
- concatAccountNames :: [AccountName] -> AccountName
- conversionAccountRegex :: Regexp
- defaultBaseConversionAccount :: IsString a => a
- elideAccountName :: Int -> AccountName -> AccountName
- equityAccountRegex :: Regexp
- escapeName :: AccountName -> Text
- expandAccountName :: AccountName -> [AccountName]
- expandAccountNames :: [AccountName] -> [AccountName]
- expenseAccountRegex :: Regexp
- getAccountNameClippedDepth :: DepthSpec -> AccountName -> Maybe Int
- 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
- 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
- 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
- tests_Balancing :: TestTree
- transactionCheckAssertions :: BalancingOpts -> Journal -> Transaction -> Either String Transaction
- currencies :: [([Char], CurrencyCode, CurrencySymbol)]
- currencyCodeToSymbol :: CurrencyCode -> Maybe CurrencySymbol
- currencySymbolToCode :: CurrencySymbol -> Maybe CurrencyCode
- 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)
- makePriceDirectiveErrorExcerpt :: PriceDirective -> Maybe (PriceDirective -> 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
- 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
- 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
- journalBaseConversionAccount :: Journal -> AccountName
- journalCommodities :: Journal -> Set CommoditySymbol
- journalCommoditiesDeclared :: Journal -> [CommoditySymbol]
- journalCommoditiesUsed :: Journal -> [CommoditySymbol]
- journalCommodityStyles :: Journal -> Map CommoditySymbol AmountStyle
- journalCommodityStylesWith :: Rounding -> Journal -> Map CommoditySymbol AmountStyle
- journalConcat :: Journal -> Journal -> Journal
- journalConversionAccounts :: Journal -> [AccountName]
- journalDateSpan :: Bool -> Journal -> DateSpan
- journalDateSpanBothDates :: Journal -> DateSpan
- journalDbg :: Journal -> String
- journalDescriptions :: Journal -> [Text]
- journalEndDate :: Bool -> Journal -> Maybe Day
- journalFilePath :: Journal -> FilePath
- journalFilePaths :: Journal -> [FilePath]
- journalInferCommodityStyles :: 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
- 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
- journalTagCostsAndEquityAndMaybeInferCosts :: Bool -> Bool -> 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 ()
- journalCheckBalanceAssertions :: Journal -> Either String ()
- journalCheckCommodities :: Journal -> Either String ()
- journalCheckPairedConversionPostings :: Journal -> Either String ()
- journalCheckPayees :: Journal -> Either String ()
- journalCheckRecentAssertions :: Journal -> Either String ()
- journalCheckTags :: Journal -> Either String ()
- journalStrictChecks :: Journal -> Either String ()
- journalCheckOrdereddates :: 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
- firstMonthOfQuarter :: Num a => a -> a
- isLastDayOfMonth :: (Eq a1, Eq a2, Num a1, Num a2) => Year -> a1 -> a2 -> Bool
- isStandardPeriod :: Period -> Bool
- mondayBefore :: Day -> Day
- 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
- startOfFirstWeekInMonth :: Year -> MonthOfYear -> Day
- thursdayOfWeekContaining :: Day -> 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
- conversionPostingTagName :: TagName
- costPostingTagName :: TagName
- generatedPostingTagName :: TagName
- generatedTransactionTagName :: TagName
- 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
- modifiedTransactionTagName :: TagName
- nullassertion :: BalanceAssertion
- nullposting :: Posting
- originalPosting :: Posting -> Posting
- post' :: AccountName -> Amount -> Maybe BalanceAssertion -> Posting
- posting :: Posting
- postingAddHiddenAndMaybeVisibleTag :: Bool -> HiddenTag -> 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)
- postingDate :: Posting -> Day
- postingDate2 :: Posting -> Day
- postingDateOrDate2 :: WhichDate -> Posting -> Day
- postingIndent :: Text -> Text
- postingNegate :: Posting -> Posting
- postingNegateMainAmount :: Posting -> Posting
- postingPriceDirectivesFromCost :: Posting -> [PriceDirective]
- postingStatus :: Posting -> Status
- postingStripCosts :: Posting -> Posting
- postingStyleAmounts :: Map CommoditySymbol AmountStyle -> Posting -> Posting
- postingToCost :: ConversionOp -> Posting -> Maybe Posting
- postingTransformAmount :: (MixedAmount -> MixedAmount) -> Posting -> Posting
- postingsAsLines :: Bool -> [Posting] -> [Text]
- relatedPostings :: Posting -> [Posting]
- renderCommentLines :: Text -> [Text]
- showAccountName :: Maybe Int -> PostingType -> 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
- dropRawOpt :: String -> RawOpts -> RawOpts
- 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
- maybeynaopt :: String -> RawOpts -> Maybe YNA
- maybeynopt :: String -> RawOpts -> Maybe Bool
- 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
- data ReportItemField
- data StringFormat
- data StringFormatComponent
- = FormatLiteral Text
- | FormatField Bool (Maybe Int) (Maybe Int) ReportItemField
- defaultBalanceLineFormat :: StringFormat
- defaultStringFormatStyle :: [StringFormatComponent] -> StringFormat
- parseStringFormat :: Text -> Either String StringFormat
- tests_StringFormat :: TestTree
- tests_Timeclock :: TestTree
- timeclockEntriesToTransactions :: LocalTime -> [TimeclockEntry] -> [Transaction]
- timeclockEntriesToTransactionsSingle :: 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]))
- payeeAndNoteFromDescription :: Text -> (Text, Text)
- payeeAndNoteFromDescription' :: Text -> (Text, Text)
- realPostings :: Transaction -> [Posting]
- showTransaction :: Transaction -> Text
- showTransactionLineFirstPart :: Transaction -> Text
- showTransactionOneLineAmounts :: Transaction -> Text
- tests_Transaction :: TestTree
- transaction :: Day -> [Posting] -> Transaction
- transactionAddHiddenAndMaybeVisibleTag :: Bool -> HiddenTag -> Transaction -> Transaction
- transactionAddTags :: Transaction -> [Tag] -> 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
- transactionInferEquityPostings :: Bool -> AccountName -> Transaction -> Transaction
- transactionMapPostingAmounts :: (MixedAmount -> MixedAmount) -> Transaction -> Transaction
- transactionMapPostings :: (Posting -> Posting) -> Transaction -> Transaction
- transactionNegate :: Transaction -> Transaction
- transactionNote :: Transaction -> Text
- transactionPayee :: Transaction -> Text
- transactionTagCostsAndEquityAndMaybeInferCosts :: Bool -> Bool -> [AccountName] -> Transaction -> Either String Transaction
- 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]
- data ValuationType
- data ConversionOp
- type PriceOracle = (Day, CommoditySymbol, Maybe CommoditySymbol) -> Maybe (CommoditySymbol, Quantity)
- 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
- tests_Data :: TestTree
- 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 :: (a -> String) -> a -> a
- dbg4With :: (a -> String) -> a -> a
- dbg5With :: (a -> String) -> a -> a
- dbg7 :: Show a => String -> a -> a
- debugLevel :: Int
- type FinalParseError = FinalParseError' HledgerParseErrorData
- type RegexError = String
- lstrip :: String -> String
- uppercase :: String -> String
- mkPos :: Int -> Pos
- filterQuery :: (Query -> Bool) -> Query -> Query
- queryIsDepth :: Query -> Bool
- queryIsSym :: Query -> Bool
- simplifyQuery :: Query -> Query
- dbg7With :: (a -> String) -> a -> a
- sourcePosPairPretty :: (SourcePos, SourcePos) -> String
- data ThreadId
- ($>) :: Functor f => f a -> b -> f b
- initialPos :: FilePath -> SourcePos
- dbg1Msg :: String -> a -> a
- dbg1 :: Show a => String -> a -> a
- dbg8IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg1IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg8 :: Show a => String -> a -> a
- spacenonewline :: forall s (m :: Type -> Type). (Stream s, Char ~ Token s) => ParsecT HledgerParseErrorData s m Char
- emptyorcommentlinep2 :: forall (m :: Type -> Type). [Char] -> TextParser m ()
- throwTo :: Exception e => ThreadId -> e -> IO ()
- (<$!>) :: Monad m => (a -> b) -> m a -> m b
- (<=<) :: Monad m => (b -> m c) -> (a -> m b) -> a -> m c
- (>=>) :: Monad m => (a -> m b) -> (b -> m c) -> a -> m c
- 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
- replicateM_ :: Applicative m => Int -> m a -> m ()
- 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
- 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
- readEitherSafe :: Read a => String -> Either 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]
- 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
- data Permissions
- data XdgDirectoryList
- 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
- getPermissions :: FilePath -> IO Permissions
- getSymbolicLinkTarget :: FilePath -> IO FilePath
- getTemporaryDirectory :: IO FilePath
- getUserDocumentsDirectory :: IO FilePath
- getXdgDirectoryList :: XdgDirectoryList -> IO [FilePath]
- listDirectory :: 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
- (-<.>) :: FilePath -> String -> FilePath
- (<.>) :: FilePath -> String -> FilePath
- addTrailingPathSeparator :: FilePath -> FilePath
- dropDrive :: 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
- normalise :: 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)
- splitExtension :: FilePath -> (String, String)
- splitExtensions :: FilePath -> (FilePath, String)
- splitPath :: FilePath -> [FilePath]
- splitSearchPath :: String -> [FilePath]
- stripExtension :: String -> FilePath -> Maybe FilePath
- takeDrive :: FilePath -> FilePath
- takeExtensions :: FilePath -> String
- isControl :: Char -> Bool
- isLetter :: Char -> Bool
- isLower :: Char -> Bool
- isMark :: Char -> Bool
- isNumber :: Char -> Bool
- isPrint :: Char -> Bool
- isPunctuation :: Char -> Bool
- isSeparator :: Char -> Bool
- isSymbol :: Char -> Bool
- isUpper :: Char -> Bool
- data QueryOpt
- 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
- parseDepthSpec :: Text -> Either RegexError DepthSpec
- 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 -> DepthSpec
- queryEndDate :: Bool -> Query -> Maybe Day
- queryIsAcct :: Query -> Bool
- queryIsAmt :: Query -> Bool
- queryIsAmtOrSym :: 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]
- tests_Query :: TestTree
- words'' :: [Text] -> Text -> [Text]
- type PrefixedFilePath = FilePath
- defaultJournal :: IO Journal
- defaultJournalPath :: IO String
- defaultJournalSafely :: IO (Either String Journal)
- defaultJournalSafelyWith :: InputOpts -> IO (Either String Journal)
- defaultJournalWith :: InputOpts -> IO Journal
- ensureJournalFileExists :: FilePath -> IO ()
- isWindowsUnsafeDotPath :: FilePath -> Bool
- journalDefaultFilename :: FilePath
- journalEnvVar :: String
- orDieTrying :: MonadIO m => ExceptT String m a -> m a
- readJournal :: InputOpts -> Maybe FilePath -> Handle -> ExceptT String IO Journal
- readJournal' :: Handle -> 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
- data Reader (m :: Type -> Type) = Reader {
- rFormat :: StorageFormat
- rExtensions :: [String]
- rReadFn :: InputOpts -> FilePath -> Handle -> ExceptT String IO Journal
- rParser :: MonadIO m => ErroringJournalParser m ParsedJournal
- 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
- commentlinetagsp :: forall (m :: Type -> Type). TextParser m [Tag]
- commoditysymbolp :: forall (m :: Type -> Type). TextParser m CommoditySymbol
- costp :: forall (m :: Type -> Type). Amount -> JournalParser m AmountCost
- 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)
- handleReadFnToTextReadFn :: (InputOpts -> FilePath -> Text -> ExceptT String IO Journal) -> InputOpts -> FilePath -> Handle -> ExceptT String IO Journal
- 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 ()
- rawOptsToInputOpts :: Day -> Bool -> Bool -> RawOpts -> InputOpts
- 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])
- definputopts :: InputOpts
- 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)
- splitReaderPrefix :: PrefixedFilePath -> (Maybe StorageFormat, FilePath)
- tmpostingrulep :: forall (m :: Type -> Type). Maybe Year -> JournalParser m TMPostingRule
- tests_Reports :: TestTree
- type AccountTransactionsReport = [AccountTransactionsReportItem]
- type AccountTransactionsReportItem = (Transaction, Transaction, Bool, Text, MixedAmount, MixedAmount)
- 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
- type BalanceReport = ([BalanceReportItem], MixedAmount)
- type BalanceReportItem = (AccountName, AccountName, Int, MixedAmount)
- balanceReport :: ReportSpec -> Journal -> BalanceReport
- flatShowsExclusiveBalance :: Bool
- tests_BalanceReport :: TestTree
- 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
- budgetReport :: ReportSpec -> BalancingOpts -> DateSpan -> Journal -> BudgetReport
- combineBudgetAndActual :: ReportOpts -> Journal -> MultiBalanceReport -> MultiBalanceReport -> BudgetReport
- tests_BudgetReport :: TestTree
- type EntriesReport = [EntriesReportItem]
- type EntriesReportItem = Transaction
- entriesReport :: ReportSpec -> Journal -> EntriesReport
- tests_EntriesReport :: TestTree
- type MultiBalanceReport = PeriodicReport DisplayName MixedAmount
- type MultiBalanceReportRow = PeriodicReportRow DisplayName MixedAmount
- 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
- type PostingsReport = [PostingsReportItem]
- type PostingsReportItem = (Maybe Day, Maybe Period, Maybe Text, Posting, MixedAmount)
- mkpostingsReportItem :: Bool -> Bool -> WhichDate -> Maybe Period -> Posting -> MixedAmount -> PostingsReportItem
- postingsReport :: ReportSpec -> Journal -> PostingsReport
- tests_PostingsReport :: TestTree
- data AccountListMode
- data SortField
- = AbsAmount' Bool
- | Account' Bool
- | Amount' Bool
- | Date' Bool
- | Description' Bool
- data BalanceAccumulation
- data BalanceCalculation
- class HasReportOptsNoUpdate a => HasReportOpts a where
- reportOpts :: ReportableLens' a ReportOpts
- period :: ReportableLens' a Period
- statuses :: ReportableLens' a [Status]
- depth :: ReportableLens' a DepthSpec
- date2 :: ReportableLens' a Bool
- real :: ReportableLens' a Bool
- querystring :: ReportableLens' a [Text]
- class HasReportSpec c where
- reportSpec :: Lens' c ReportSpec
- rsDay :: Lens' c Day
- rsQuery :: Lens' c Query
- rsQueryOpts :: Lens' c [QueryOpt]
- rsReportOpts :: Lens' c ReportOpts
- data Layout
- = LayoutWide (Maybe Int)
- | LayoutTall
- | LayoutBare
- | LayoutTidy
- data ReportSpec = ReportSpec {
- _rsReportOpts :: ReportOpts
- _rsDay :: Day
- _rsQuery :: Query
- _rsQueryOpts :: [QueryOpt]
- type SortSpec = [SortField]
- balanceAccumulationOverride :: RawOpts -> Maybe BalanceAccumulation
- defreportopts :: ReportOpts
- defreportspec :: ReportSpec
- defsortspec :: SortSpec
- 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 -> Bool -> RawOpts -> ReportOpts
- rawOptsToReportSpec :: Day -> Bool -> RawOpts -> Either String ReportSpec
- 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]
- sortKeysDescription :: [Char]
- 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
- 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
- displayIndent :: NumberOfIndents
- 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
- 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
- prrDisplayName :: PeriodicReportRow DisplayName a -> AccountName
- prrFullName :: PeriodicReportRow DisplayName a -> AccountName
- prrIndent :: PeriodicReportRow DisplayName a -> Int
- prrShowDebug :: PeriodicReportRow DisplayName MixedAmount -> String
- treeDisplayName :: AccountName -> DisplayName
- curry2 :: ((a, b) -> c) -> a -> b -> c
- curry3 :: ((a, b, c) -> d) -> a -> b -> c -> d
- 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
- uncurry3 :: (a -> b -> c -> d) -> (a, b, c) -> d
- uncurry4 :: (a -> b -> c -> d -> e) -> (a, b, c, d) -> e
- data GhcDebugMode
- dbg :: Show a => Int -> String -> a -> a
- dbg0 :: Show a => String -> a -> a
- dbg0IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg0Msg :: String -> a -> a
- dbg0MsgIO :: MonadIO m => String -> m ()
- dbg0With :: (a -> String) -> a -> a
- dbg1MsgIO :: MonadIO m => String -> m ()
- dbg2 :: Show a => String -> a -> a
- dbg2IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg2Msg :: String -> a -> a
- dbg2MsgIO :: MonadIO m => String -> m ()
- dbg2With :: (a -> String) -> a -> a
- dbg3 :: Show a => String -> a -> a
- dbg3IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg3Msg :: String -> a -> a
- dbg3MsgIO :: MonadIO m => String -> m ()
- dbg3With :: (a -> String) -> a -> a
- dbg4 :: Show a => String -> a -> a
- dbg4IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg4Msg :: String -> a -> a
- dbg4MsgIO :: MonadIO m => String -> m ()
- dbg5 :: Show a => String -> a -> a
- dbg5IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg5Msg :: String -> a -> a
- dbg5MsgIO :: MonadIO m => String -> m ()
- dbg6 :: Show a => String -> a -> a
- dbg6IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg6Msg :: String -> a -> a
- dbg6MsgIO :: MonadIO m => String -> m ()
- dbg6With :: (a -> String) -> a -> a
- dbg7IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg7Msg :: String -> a -> a
- dbg7MsgIO :: MonadIO m => String -> m ()
- dbg8Msg :: String -> a -> a
- dbg8MsgIO :: MonadIO m => String -> m ()
- dbg8With :: (a -> String) -> a -> a
- dbg9 :: Show a => String -> a -> a
- dbg9IO :: (MonadIO m, Show a) => String -> a -> m ()
- dbg9Msg :: String -> a -> a
- dbg9MsgIO :: MonadIO m => String -> m ()
- dbg9With :: (a -> String) -> a -> a
- dbgIO :: (MonadIO m, Show a) => Int -> String -> a -> m ()
- dbgMsg :: Int -> String -> a -> a
- dbgMsgIO :: MonadIO m => Int -> String -> m ()
- dbgWith :: Int -> (a -> String) -> a -> a
- dbg_ :: Show a => Int -> String -> a -> a
- ghcDebugMode :: GhcDebugMode
- ghcDebugPause' :: IO ()
- lbl_ :: String -> String -> String -> String
- progName :: String
- withGhcDebug' :: a -> a
- data FinalParseError' e
- type FinalParseErrorBundle = FinalParseErrorBundle' HledgerParseErrorData
- data FinalParseErrorBundle' e
- type SimpleStringParser a = Parsec HledgerParseErrorData String a
- type SimpleTextParser = Parsec HledgerParseErrorData Text
- data SourceExcerpt
- attachSource :: FilePath -> Text -> FinalParseError' e -> FinalParseErrorBundle' e
- 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 ()
- excerpt_ :: MonadParsec HledgerParseErrorData Text m => m a -> m SourceExcerpt
- finalCustomFailure :: (MonadParsec e s m, MonadError (FinalParseError' e) m) => e -> m a
- finalError :: ParseError Text e -> FinalParseError' e
- finalErrorBundlePretty :: FinalParseErrorBundle' HledgerParseErrorData -> String
- finalFail :: (MonadParsec e s m, MonadError (FinalParseError' e) m) => String -> m a
- finalFancyFailure :: (MonadParsec e s m, MonadError (FinalParseError' e) m) => Set (ErrorFancy e) -> m a
- fromparse :: (Show t, Show (Token t), Show e) => Either (ParseErrorBundle t e) a -> a
- getExcerptText :: SourceExcerpt -> Text
- isNewline :: Char -> Bool
- nonspace :: forall (m :: Type -> Type). TextParser m Char
- parseErrorAt :: Int -> String -> HledgerParseErrorData
- parseErrorAtRegion :: Int -> Int -> String -> HledgerParseErrorData
- parseIncludeFile :: forall (m :: Type -> Type) st a. Monad m => StateT st (ParsecT HledgerParseErrorData Text (ExceptT FinalParseError m)) a -> st -> FilePath -> Text -> StateT st (ParsecT HledgerParseErrorData Text (ExceptT FinalParseError m)) a
- 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
- reparseExcerpt :: forall (m :: Type -> Type) a. Monad m => SourceExcerpt -> ParsecT HledgerParseErrorData Text m a -> ParsecT HledgerParseErrorData Text m 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 ()
- surroundedBy :: Applicative m => m openclose -> m a -> m a
- 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
- chomp1 :: String -> String
- elideLeft :: Int -> String -> String
- elideRight :: Int -> String -> String
- lowercase :: String -> String
- quoteForCommandLine :: String -> String
- quoteIfNeeded :: 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
- 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
- traceIO :: String -> IO ()
- traceShowId :: Show a => a -> a
- tests_Hledger :: TestTree
- 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 ()
- 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
- runExceptT :: ExceptT e m a -> m (Either e a)
- data Timeout
- type Assertion = IO ()
- class AssertionPredicable t where
- assertionPredicate :: t -> IO Bool
- type AssertionPredicate = IO Bool
- data HUnitFailure = HUnitFailure (Maybe SrcLoc) String
- trace :: String -> a -> a
- data Complete
- = CompleteValue String
- | CompleteFile String FilePath
- | CompleteDir String FilePath
- data IOErrorType
- latin1 :: TextEncoding
- mkTextEncoding :: String -> IO TextEncoding
- utf16 :: TextEncoding
- utf16be :: TextEncoding
- utf16le :: TextEncoding
- utf32 :: TextEncoding
- utf32be :: TextEncoding
- utf32le :: TextEncoding
- data HandlePosn
- 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
- hIsReadable :: Handle -> IO Bool
- hIsSeekable :: 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
- hGetContents' :: Handle -> IO String
- hGetLine :: 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
- data BufferMode
- = NoBuffering
- | LineBuffering
- | BlockBuffering (Maybe Int)
- data NewlineMode = NewlineMode {}
- 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
- 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
- newtype WrappedArrow (a :: Type -> Type -> Type) b c = WrapArrow {
- unwrapArrow :: a b c
- newtype WrappedMonad (m :: Type -> Type) a = WrapMonad {
- unwrapMonad :: m a
- 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
- callCommand :: String -> IO ()
- getArgs :: IO [String]
- getEnvironment :: IO [(String, String)]
- getProgName :: IO String
- unsetEnv :: String -> IO ()
- withProgName :: String -> IO a -> IO a
- executablePath :: Maybe (IO (Maybe FilePath))
- getExecutablePath :: IO FilePath
- data FormatAdjustment
- data FormatSign
- data CmdSpec
- = ShellCommand String
- | RawCommand FilePath [String]
- data StdStream
- data ProcessHandle
- 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
- waitForProcess :: ProcessHandle -> IO ExitCode
- withCreateProcess :: CreateProcess -> (Maybe Handle -> Maybe Handle -> Maybe Handle -> ProcessHandle -> IO a) -> IO a
- type Pid = CPid
- class IsChar c where
- class HPrintfType t
- class PrintfType t
- 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
- takeMVar :: MVar a -> IO a
- mkIOError :: IOErrorType -> String -> Maybe Handle -> Maybe FilePath -> IOError
- genericLength :: Num i => [a] -> i
- zipWith7 :: (a -> b -> c -> d -> e -> f -> g -> h) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -> [h]
- deleteBy :: (a -> a -> Bool) -> a -> [a] -> [a]
- deleteFirstsBy :: (a -> a -> Bool) -> [a] -> [a] -> [a]
- genericIndex :: Integral i => [a] -> i -> a
- 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)]
- isEOFError :: IOError -> Bool
- isSubsequenceOf :: Eq a => [a] -> [a] -> Bool
- isHexDigit :: Char -> Bool
- isOctDigit :: Char -> Bool
- lexLitChar :: ReadS String
- readLitChar :: ReadS Char
- data Flag a = Flag {}
- type FlagHelp = String
- flagArg :: Update a -> FlagHelp -> Arg a
- toGroup :: [a] -> Group a
- helpText :: [String] -> HelpFormat -> Mode a -> [Text]
- data HelpFormat
- digitToInt :: Char -> Int
- chr :: Int -> Char
- generalCategory :: Char -> GeneralCategory
- isAlpha :: Char -> Bool
- isAsciiLower :: Char -> Bool
- isAsciiUpper :: Char -> Bool
- isLatin1 :: Char -> Bool
- isLowerCase :: Char -> Bool
- isUpperCase :: Char -> Bool
- modes :: String -> a -> Help -> [Mode a] -> Mode a
- complete :: Mode a -> [String] -> (Int, Int) -> [Complete]
- joinArgs :: [String] -> String
- splitArgs :: String -> [String]
- 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
- 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
- exitFailure :: IO a
- newMVar :: a -> IO (MVar a)
- modifyMVar :: MVar a -> (a -> IO (a, b)) -> IO b
- addMVarFinalizer :: MVar a -> IO () -> IO ()
- mkWeakMVar :: MVar a -> IO () -> IO (Weak (MVar a))
- 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
- isEmptyMVar :: MVar a -> IO Bool
- tryPutMVar :: MVar a -> a -> IO Bool
- tryReadMVar :: MVar a -> IO (Maybe a)
- tryTakeMVar :: MVar a -> IO (Maybe a)
- data Chan a
- 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 ()
- data QSem
- newQSem :: Int -> IO QSem
- signalQSem :: QSem -> IO ()
- waitQSem :: QSem -> IO ()
- data QSemN
- newQSemN :: Int -> IO QSemN
- signalQSemN :: QSemN -> Int -> IO ()
- waitQSemN :: QSemN -> Int -> IO ()
- forkFinally :: IO a -> (Either SomeException a -> IO ()) -> IO ThreadId
- threadWaitRead :: Fd -> IO ()
- threadWaitReadSTM :: Fd -> IO (STM (), IO ())
- threadWaitWrite :: Fd -> IO ()
- threadWaitWriteSTM :: Fd -> IO (STM (), IO ())
- forkOS :: IO () -> IO ThreadId
- forkOSWithUnmask :: ((forall a. IO a -> IO a) -> IO ()) -> IO ThreadId
- isCurrentThreadBound :: IO Bool
- rtsSupportsBoundThreads :: Bool
- runInBoundThread :: IO a -> IO a
- runInUnboundThread :: IO a -> IO a
- 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)
- yield :: IO ()
- 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
- 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
Documentation
module Hledger.Cli.CliOptions
module Hledger.Cli.Commands
module Hledger.Cli.DocFiles
module Hledger.Cli.Utils
module Hledger.Cli.Version
class HasReportOptsNoUpdate c where #
Minimal complete definition
Methods
reportOptsNoUpdate :: Lens' c ReportOpts #
accountlistmode :: Lens' c AccountListMode #
balance_base_url :: Lens' c (Maybe Text) #
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 DepthSpec #
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 #
sortspec :: Lens' c SortSpec #
statusesNoUpdate :: Lens' c [Status] #
summary_only :: Lens' c Bool #
transpose__ :: Lens' c Bool #
value :: Lens' c (Maybe ValuationType) #
Instances
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) #
oldtimeclock :: Lens' c Bool #
posting_account_tags :: Lens' c Bool #
reportspan :: Lens' c DateSpan #
verbose_tags :: Lens' c Bool #
Instances
proc :: FilePath -> [String] -> CreateProcess #
argsToCliOpts :: [String] -> [String] -> IO CliOpts Source #
A helper for addons/scripts: this parses hledger CliOpts from these command line arguments and add-on command names, roughly how hledger main does. If option parsing/validating fails, it exits the program with usageError. Unlike main, this does not read extra args from a config file or search for addons; to do those things, mimic the code in main for now.
data GeneralCategory #
Constructors
Instances
Bounded GeneralCategory | |||||
Defined in GHC.Internal.Unicode | |||||
Enum GeneralCategory | |||||
Defined in GHC.Internal.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.Internal.Generics Associated Types
Methods from :: GeneralCategory -> Rep GeneralCategory x to :: Rep GeneralCategory x -> GeneralCategory | |||||
Ix GeneralCategory | |||||
Defined in GHC.Internal.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.Internal.Read Methods readsPrec :: Int -> ReadS GeneralCategory readList :: ReadS [GeneralCategory] readPrec :: ReadPrec GeneralCategory readListPrec :: ReadPrec [GeneralCategory] | |||||
Show GeneralCategory | |||||
Defined in GHC.Internal.Unicode Methods showsPrec :: Int -> GeneralCategory -> ShowS show :: GeneralCategory -> String showList :: [GeneralCategory] -> ShowS | |||||
Eq GeneralCategory | |||||
Defined in GHC.Internal.Unicode Methods (==) :: GeneralCategory -> GeneralCategory -> Bool (/=) :: GeneralCategory -> GeneralCategory -> Bool | |||||
Ord GeneralCategory | |||||
Defined in GHC.Internal.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.Internal.Generics type Rep GeneralCategory = D1 ('MetaData "GeneralCategory" "GHC.Internal.Unicode" "ghc-internal" '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)))))) |
class Applicative m => Monad (m :: Type -> Type) where #
Minimal complete definition
Instances
Monad IResult | |
Monad Parser | |
Monad Result | |
Monad Complex | |
Monad First | |
Monad Last | |
Monad Max | |
Monad Min | |
Monad Put | |
Monad Seq | |
Monad Tree | |
Monad CryptoFailable | |
Monad DNonEmpty | |
Monad DList | |
Monad PutME | |
Monad StrictSink | |
Monad StrictSinkE | |
Monad StrictSinkExplicit | |
Monad NonEmpty | |
Monad STM | |
Monad Identity | |
Monad Down | |
Monad Dual | |
Monad Product | |
Monad Sum | |
Monad Par1 | |
Monad P | |
Monad ReadP | |
Monad ReadPrec | |
Monad IO | |
Monad Root | |
Monad Array | |
Monad SmallArray | |
Monad Req | |
Monad Parser | |
Monad Q | |
Monad Vector | |
Monad Vector | |
Monad Stream | |
Monad Maybe | |
Monad Solo | |
Monad [] | |
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 # | |
Monad (SetM s) | |
Functor f => Monad (Free f) | |
ArrowApply a => Monad (ArrowMonad a) | |
Monad (Either e) | |
Monad (Proxy :: Type -> Type) | |
Monad (U1 :: Type -> Type) | |
Monad (ST s) | |
Monad m => Monad (InputT m) | |
Monad m => Monad (HtmlT m) | |
Semigroup a => Monad (These a) | |
Monad (IParser t) | |
Monad m => Monad (QuoteToQuasi m) | |
Semigroup a => Monad (These a) | |
Monad m => Monad (MaybeT m) | |
Functor backend => Monad (Wizard backend) | |
Monoid a => Monad ((,) a) | |
(Applicative f, Monad f) => Monad (WhenMissing f x) | |
(Functor f, Monad m) => Monad (FreeT f m) | |
Monad m => Monad (Kleisli m a) | |
Monad m => Monad (StateT s m) | |
Monad f => Monad (Alt f) | |
Monad f => Monad (Rec1 f) | |
Monad m => Monad (StateT s m) | |
Monad (t m) => Monad (LiftingAccum t m) | |
Monad (t m) => Monad (LiftingSelect t m) | |
Monad (Tagged s) | |
(Monoid w, Functor m, Monad m) => Monad (AccumT w m) | |
Monad m => Monad (ExceptT e m) | |
Monad m => Monad (IdentityT m) | |
Monad m => Monad (ReaderT r m) | |
Monad m => Monad (SelectT r m) | |
Monad m => Monad (StateT s m) | |
Monad m => Monad (StateT s m) | |
Monad m => Monad (WriterT w 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 (Product f g) | |
(Monad f, Applicative f) => Monad (WhenMatched f x y) | |
(Applicative f, Monad f) => Monad (WhenMissing f k x) | |
(Monad f, Monad g) => Monad (f :*: g) | |
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, Applicative f) => Monad (WhenMatched f k x y) | |
Monad f => Monad (M1 i c f) | |
Monad m => Monad (RWST r w s m) | |
(Monoid w, Monad m) => Monad (RWST r w s m) | |
(Monoid w, Monad m) => Monad (RWST r w s m) | |
Monad state => Monad (Builder collection mutCollection step state err) | |
Defined in Basement.MutableBuilder Methods (>>=) :: Builder collection mutCollection step state err a -> (a -> Builder collection mutCollection step state err b) -> Builder collection mutCollection step state err b # (>>) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err b # return :: a -> Builder collection mutCollection step state err a # |
when :: Applicative f => Bool -> f () -> f () #
unless :: Applicative f => Bool -> f () -> f () #
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 | |||||
IsChar Char | |||||
PrintfArg Char | |||||
Defined in Text.Printf | |||||
Subtractive Char | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
PrimMemoryComparable Char | |||||
Defined in Basement.PrimType | |||||
PrimType Char | |||||
Defined in Basement.PrimType Associated Types
Methods primSizeInBytes :: Proxy Char -> CountOf Word8 primShiftToBytes :: Proxy Char -> Int primBaUIndex :: ByteArray# -> Offset Char -> Char primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Char -> prim Char primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Char -> Char -> prim () primAddrIndex :: Addr# -> Offset Char -> Char primAddrRead :: PrimMonad prim => Addr# -> Offset Char -> prim Char primAddrWrite :: PrimMonad prim => Addr# -> Offset Char -> Char -> prim () | |||||
FoldCase Char | |||||
Defined in Data.CaseInsensitive.Internal | |||||
Packer Char | |||||
Defined in System.Console.CmdArgs.Helper | |||||
NFData Char | |||||
Defined in Control.DeepSeq | |||||
Bounded Char | |||||
Defined in GHC.Internal.Enum | |||||
Enum Char | |||||
Ix Char | |||||
Read Char | |||||
Defined in GHC.Internal.Read | |||||
Show Char | |||||
Eq Char | |||||
Ord Char | |||||
Hashable Char | |||||
Defined in Data.Hashable.Class | |||||
FromFormKey String | |||||
Defined in Web.Internal.FormUrlEncoded Methods parseFormKey :: Text -> Either Text String | |||||
FromFormKey Char | |||||
Defined in Web.Internal.FormUrlEncoded Methods parseFormKey :: Text -> Either Text Char | |||||
ToFormKey String | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
ToFormKey Char | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
ToHtml String | |||||
Defined in Lucid.Base | |||||
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 | |||||
ToJavascript String | |||||
Defined in Text.Julius Methods toJavascript :: String -> Javascript | |||||
ToMessage String | |||||
Defined in Text.Shakespeare.I18N | |||||
Assertable String | |||||
Defined in Test.Tasty.HUnit.Orig | |||||
Unbox Char | |||||
Defined in Data.Vector.Unboxed.Base | |||||
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) | |||||
KnownSymbol n => Reifies (n :: Symbol) String | |||||
Defined in Data.Reflection Methods reflect :: proxy n -> String | |||||
RegexContext Regexp String String | |||||
Selector s => GFromForm (t :: k) (M1 S s (K1 i String :: Type -> Type)) | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
Selector s => GToForm (t :: k) (M1 S s (K1 i String :: Type -> Type)) | |||||
Defined in Web.Internal.FormUrlEncoded Methods gToForm :: Proxy t -> FormOptions -> M1 S s (K1 i String :: Type -> Type) x -> Form | |||||
Generic1 (URec Char :: k -> Type) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Foldable (UChar :: Type -> Type) | |||||
Defined in GHC.Internal.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 GHC.Internal.Data.Traversable Methods traverse :: Applicative f => (a -> f b) -> UChar a -> f (UChar b) sequenceA :: Applicative f => UChar (f a) -> f (UChar a) | |||||
QueryKeyLike [Char] | |||||
Defined in Network.HTTP.Types.QueryLike Methods toQueryKey :: [Char] -> ByteString | |||||
QueryValueLike [Char] | |||||
Defined in Network.HTTP.Types.QueryLike Methods toQueryValue :: [Char] -> Maybe ByteString | |||||
Uncons (Seq Char) | |||||
Uncons [Char] | |||||
ToAttributes [(String, String)] | |||||
Defined in Text.Hamlet Methods toAttributes :: [(String, String)] -> [(Text, Text)] | |||||
ToCss [Char] | |||||
Defined in Text.Internal.Css | |||||
RawJS [Char] | |||||
Defined in Text.Julius | |||||
ToText [Char] | |||||
Defined in Text.Shakespeare.Text | |||||
Run (State PureState) Pure | |||||
Defined in System.Console.Wizard.Pure Methods runAlgebra :: Pure (State PureState v) -> State PureState v | |||||
(Monad m, Throws EncodingException m) => ByteSink (StateT (Seq Char) m) | |||||
Defined in Data.Encoding.ByteSink Methods pushWord8 :: Word8 -> StateT (Seq Char) m () pushWord16be :: Word16 -> StateT (Seq Char) m () pushWord16le :: Word16 -> StateT (Seq Char) m () pushWord32be :: Word32 -> StateT (Seq Char) m () pushWord32le :: Word32 -> StateT (Seq Char) m () pushWord64be :: Word64 -> StateT (Seq Char) m () pushWord64le :: Word64 -> StateT (Seq Char) m () | |||||
ByteSource (StateT [Char] (Either DecodingException)) | |||||
Defined in Data.Encoding.ByteSource Methods sourceEmpty :: StateT [Char] (Either DecodingException) Bool fetchWord8 :: StateT [Char] (Either DecodingException) Word8 fetchAhead :: StateT [Char] (Either DecodingException) (Maybe a) -> StateT [Char] (Either DecodingException) (Maybe a) fetchWord16be :: StateT [Char] (Either DecodingException) Word16 fetchWord16le :: StateT [Char] (Either DecodingException) Word16 fetchWord32be :: StateT [Char] (Either DecodingException) Word32 fetchWord32le :: StateT [Char] (Either DecodingException) Word32 fetchWord64be :: StateT [Char] (Either DecodingException) Word64 fetchWord64le :: StateT [Char] (Either DecodingException) Word64 | |||||
ByteSource (StateT [Char] Identity) | |||||
Defined in Data.Encoding.ByteSource Methods sourceEmpty :: StateT [Char] Identity Bool fetchWord8 :: StateT [Char] Identity Word8 fetchAhead :: StateT [Char] Identity (Maybe a) -> StateT [Char] Identity (Maybe a) fetchWord16be :: StateT [Char] Identity Word16 fetchWord16le :: StateT [Char] Identity Word16 fetchWord32be :: StateT [Char] Identity Word32 fetchWord32le :: StateT [Char] Identity Word32 fetchWord64be :: StateT [Char] Identity Word64 fetchWord64le :: StateT [Char] Identity Word64 | |||||
Functor (URec Char :: Type -> Type) | |||||
ToAttributes (String, String) | |||||
Defined in Text.Hamlet Methods toAttributes :: (String, String) -> [(Text, Text)] | |||||
Generic (URec Char p) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Show (URec Char p) | |||||
Eq (URec Char p) | |||||
Ord (URec Char p) | |||||
Defined in GHC.Internal.Generics | |||||
type NatNumMaxBound Char | |||||
Defined in Basement.Nat type NatNumMaxBound Char = 1114111 | |||||
type Difference Char | |||||
Defined in Basement.Numerical.Subtractive type Difference Char = Int | |||||
type PrimSize Char | |||||
Defined in Basement.PrimType type PrimSize Char = 4 | |||||
newtype Vector Char | |||||
Defined in Data.Vector.Unboxed.Base | |||||
data URec Char (p :: k) | |||||
Defined in GHC.Internal.Generics | |||||
newtype MVector s Char | |||||
Defined in Data.Vector.Unboxed.Base | |||||
type Rep1 (URec Char :: k -> Type) | |||||
Defined in GHC.Internal.Generics | |||||
type Rep (URec Char p) | |||||
Defined in GHC.Internal.Generics |
Instances
FromJSON2 Either | |||||
Defined in Data.Aeson.Types.FromJSON Methods liftParseJSON2 :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Maybe b -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser (Either a b) liftParseJSONList2 :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Maybe b -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser [Either a b] liftOmittedField2 :: Maybe a -> Maybe b -> Maybe (Either a b) | |||||
ToJSON2 Either | |||||
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON2 :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> (b -> Bool) -> (b -> Value) -> ([b] -> Value) -> Either a b -> Value liftToJSONList2 :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> (b -> Bool) -> (b -> Value) -> ([b] -> Value) -> [Either a b] -> Value liftToEncoding2 :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> (b -> Bool) -> (b -> Encoding) -> ([b] -> Encoding) -> Either a b -> Encoding liftToEncodingList2 :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> (b -> Bool) -> (b -> Encoding) -> ([b] -> Encoding) -> [Either a b] -> Encoding liftOmitField2 :: (a -> Bool) -> (b -> Bool) -> Either a b -> Bool | |||||
Bifoldable Either | |||||
Bifoldable1 Either | |||||
Defined in Data.Bifoldable1 Methods bifold1 :: Semigroup m => Either m m -> m bifoldMap1 :: Semigroup m => (a -> m) -> (b -> m) -> Either a b -> m | |||||
Bifunctor Either | |||||
Bitraversable Either | |||||
Defined in Data.Bitraversable Methods bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Either a b -> f (Either c d) | |||||
Eq2 Either | |||||
Defined in Data.Functor.Classes | |||||
Ord2 Either | |||||
Defined in Data.Functor.Classes | |||||
Read2 Either | |||||
Defined in Data.Functor.Classes Methods liftReadsPrec2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> Int -> ReadS (Either a b) liftReadList2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> ReadS [Either a b] liftReadPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec (Either a b) liftReadListPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec [Either a b] | |||||
Show2 Either | |||||
Defined in Data.Functor.Classes Methods liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> Either a b -> ShowS liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [Either a b] -> ShowS | |||||
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) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
MonadError e (Either e) | |||||
Defined in Control.Monad.Error.Class | |||||
(Lift a, Lift b) => Lift (Either a b :: Type) | |||||
FromJSON a => FromJSON1 (Either a) | |||||
Defined in Data.Aeson.Types.FromJSON Methods liftParseJSON :: Maybe a0 -> (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser (Either a a0) liftParseJSONList :: Maybe a0 -> (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser [Either a a0] liftOmittedField :: Maybe a0 -> Maybe (Either a a0) | |||||
ToJSON a => ToJSON1 (Either a) | |||||
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON :: (a0 -> Bool) -> (a0 -> Value) -> ([a0] -> Value) -> Either a a0 -> Value liftToJSONList :: (a0 -> Bool) -> (a0 -> Value) -> ([a0] -> Value) -> [Either a a0] -> Value liftToEncoding :: (a0 -> Bool) -> (a0 -> Encoding) -> ([a0] -> Encoding) -> Either a a0 -> Encoding liftToEncodingList :: (a0 -> Bool) -> (a0 -> Encoding) -> ([a0] -> Encoding) -> [Either a a0] -> Encoding liftOmitField :: (a0 -> Bool) -> Either a a0 -> Bool | |||||
Eq a => Eq1 (Either a) | |||||
Defined in Data.Functor.Classes | |||||
Ord a => Ord1 (Either a) | |||||
Defined in Data.Functor.Classes Methods liftCompare :: (a0 -> b -> Ordering) -> Either a a0 -> Either a b -> Ordering | |||||
Read a => Read1 (Either a) | |||||
Defined in Data.Functor.Classes Methods liftReadsPrec :: (Int -> ReadS a0) -> ReadS [a0] -> Int -> ReadS (Either a a0) liftReadList :: (Int -> ReadS a0) -> ReadS [a0] -> ReadS [Either a a0] liftReadPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec (Either a a0) liftReadListPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec [Either a a0] | |||||
Show a => Show1 (Either a) | |||||
Defined in Data.Functor.Classes Methods liftShowsPrec :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> Int -> Either a a0 -> ShowS liftShowList :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> [Either a a0] -> ShowS | |||||
MonadFailure (Either a) | |||||
Defined in Basement.Monad Associated Types
| |||||
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 | |||||
Applicative (Either e) | |||||
Functor (Either a) | |||||
Monad (Either e) | |||||
Foldable (Either a) | |||||
Defined in GHC.Internal.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) | |||||
Defined in GHC.Internal.Data.Traversable | |||||
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 | |||||
MonadBaseControl (Either e) (Either e) | |||||
Defined in Control.Monad.Trans.Control | |||||
(FromJSON a, FromJSON b) => FromJSON (Either a b) | |||||
Defined in Data.Aeson.Types.FromJSON Methods parseJSON :: Value -> Parser (Either a b) parseJSONList :: Value -> Parser [Either a b] omittedField :: Maybe (Either a b) | |||||
(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 | |||||
(Packer a, Packer b) => Packer (Either a b) | |||||
Defined in System.Console.CmdArgs.Helper | |||||
(NFData a, NFData b) => NFData (Either a b) | |||||
Defined in Control.DeepSeq | |||||
ByteSource (StateT ByteString (Either DecodingException)) | |||||
Defined in Data.Encoding.ByteSource Methods sourceEmpty :: StateT ByteString (Either DecodingException) Bool fetchWord8 :: StateT ByteString (Either DecodingException) Word8 fetchAhead :: StateT ByteString (Either DecodingException) (Maybe a) -> StateT ByteString (Either DecodingException) (Maybe a) fetchWord16be :: StateT ByteString (Either DecodingException) Word16 fetchWord16le :: StateT ByteString (Either DecodingException) Word16 fetchWord32be :: StateT ByteString (Either DecodingException) Word32 fetchWord32le :: StateT ByteString (Either DecodingException) Word32 fetchWord64be :: StateT ByteString (Either DecodingException) Word64 fetchWord64le :: StateT ByteString (Either DecodingException) Word64 | |||||
ByteSource (StateT [Char] (Either DecodingException)) | |||||
Defined in Data.Encoding.ByteSource Methods sourceEmpty :: StateT [Char] (Either DecodingException) Bool fetchWord8 :: StateT [Char] (Either DecodingException) Word8 fetchAhead :: StateT [Char] (Either DecodingException) (Maybe a) -> StateT [Char] (Either DecodingException) (Maybe a) fetchWord16be :: StateT [Char] (Either DecodingException) Word16 fetchWord16le :: StateT [Char] (Either DecodingException) Word16 fetchWord32be :: StateT [Char] (Either DecodingException) Word32 fetchWord32le :: StateT [Char] (Either DecodingException) Word32 fetchWord64be :: StateT [Char] (Either DecodingException) Word64 fetchWord64le :: StateT [Char] (Either DecodingException) Word64 | |||||
Semigroup (Either a b) | |||||
Generic (Either a b) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
(Read a, Read b) => Read (Either a b) | |||||
Defined in GHC.Internal.Data.Either | |||||
(Show a, Show b) => Show (Either a b) | |||||
(Eq a, Eq b) => Eq (Either a b) | |||||
(Ord a, Ord b) => Ord (Either a b) | |||||
Defined in GHC.Internal.Data.Either | |||||
(Hashable a, Hashable b) => Hashable (Either a b) | |||||
Defined in Data.Hashable.Class | |||||
(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.Internal.Generics type Rep1 (Either a :: Type -> Type) = D1 ('MetaData "Either" "GHC.Internal.Data.Either" "ghc-internal" '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 Failure (Either a) | |||||
Defined in Basement.Monad type Failure (Either a) = a | |||||
type StM (Either e) a | |||||
Defined in Control.Monad.Trans.Control type StM (Either e) a = a | |||||
type Rep (Either a b) | |||||
Defined in GHC.Internal.Generics type Rep (Either a b) = D1 ('MetaData "Either" "GHC.Internal.Data.Either" "ghc-internal" '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))) |
class Functor (f :: Type -> Type) where #
Minimal complete definition
Instances
Instances
FromJSON1 [] | |||||||||
Defined in Data.Aeson.Types.FromJSON Methods liftParseJSON :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [a] liftParseJSONList :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [[a]] liftOmittedField :: Maybe a -> Maybe [a] | |||||||||
ToJSON1 [] | |||||||||
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [a] -> Value liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [[a]] -> Value liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [a] -> Encoding liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [[a]] -> Encoding liftOmitField :: (a -> Bool) -> [a] -> Bool | |||||||||
MonadZip [] | |||||||||
Defined in Control.Monad.Zip | |||||||||
Eq1 [] | |||||||||
Defined in Data.Functor.Classes Methods liftEq :: (a -> b -> Bool) -> [a] -> [b] -> Bool | |||||||||
Ord1 [] | |||||||||
Defined in Data.Functor.Classes Methods liftCompare :: (a -> b -> Ordering) -> [a] -> [b] -> Ordering | |||||||||
Read1 [] | |||||||||
Defined in Data.Functor.Classes Methods liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS [a] liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [[a]] liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [a] liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [[a]] | |||||||||
Show1 [] | |||||||||
Defined in Data.Functor.Classes Methods liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> [a] -> ShowS liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [[a]] -> ShowS | |||||||||
NFData1 [] | |||||||||
Defined in Control.DeepSeq Methods liftRnf :: (a -> ()) -> [a] -> () | |||||||||
MonadThrow [] | |||||||||
Defined in Control.Monad.Catch Methods throwM :: (HasCallStack, Exception e) => e -> [a] | |||||||||
Alternative [] | |||||||||
Applicative [] | |||||||||
Functor [] | |||||||||
Defined in GHC.Internal.Base | |||||||||
Monad [] | |||||||||
MonadPlus [] | |||||||||
Defined in GHC.Internal.Base | |||||||||
MonadFail [] | |||||||||
Defined in GHC.Internal.Control.Monad.Fail | |||||||||
Foldable [] | |||||||||
Defined in GHC.Internal.Data.Foldable Methods fold :: Monoid m => [m] -> m foldMap :: Monoid m => (a -> m) -> [a] -> m foldMap' :: Monoid m => (a -> m) -> [a] -> m foldr :: (a -> b -> b) -> b -> [a] -> b # foldr' :: (a -> b -> b) -> b -> [a] -> b foldl :: (b -> a -> b) -> b -> [a] -> b # foldl' :: (b -> a -> b) -> b -> [a] -> b # foldr1 :: (a -> a -> a) -> [a] -> a # foldl1 :: (a -> a -> a) -> [a] -> a # toList :: [a] -> [a] elem :: Eq a => a -> [a] -> Bool # maximum :: Ord a => [a] -> a # | |||||||||
Traversable [] | |||||||||
Defined in GHC.Internal.Data.Traversable Methods traverse :: Applicative f => (a -> f b) -> [a] -> f [b] sequenceA :: Applicative f => [f a] -> f [a] | |||||||||
Show CsvRules | |||||||||
Defined in Hledger.Read.RulesReader | |||||||||
Eq CsvRules | |||||||||
Defined in Hledger.Read.RulesReader | |||||||||
Hashable1 [] | |||||||||
Defined in Data.Hashable.Class Methods liftHashWithSalt :: (Int -> a -> Int) -> Int -> [a] -> Int | |||||||||
FromFormKey String | |||||||||
Defined in Web.Internal.FormUrlEncoded Methods parseFormKey :: Text -> Either Text String | |||||||||
ToFormKey String | |||||||||
Defined in Web.Internal.FormUrlEncoded | |||||||||
ToHtml String | |||||||||
Defined in Lucid.Base | |||||||||
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 | |||||||||
GetAddrInfo [] | |||||||||
Defined in Network.Socket.Info Methods getAddrInfo :: Maybe AddrInfo -> Maybe HostName -> Maybe ServiceName -> IO [AddrInfo] | |||||||||
Extract String | |||||||||
Defined in Text.Regex.Base.RegexLike | |||||||||
ToJavascript String | |||||||||
Defined in Text.Julius Methods toJavascript :: String -> Javascript | |||||||||
ToMessage String | |||||||||
Defined in Text.Shakespeare.I18N | |||||||||
Assertable String | |||||||||
Defined in Test.Tasty.HUnit.Orig | |||||||||
Generic1 [] | |||||||||
Defined in GHC.Internal.Generics Associated Types
| |||||||||
MonadBaseControl [] [] | |||||||||
Defined in Control.Monad.Trans.Control Associated Types
| |||||||||
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) | |||||||||
KnownSymbol n => Reifies (n :: Symbol) String | |||||||||
Defined in Data.Reflection Methods reflect :: proxy n -> String | |||||||||
RegexContext Regexp String String | |||||||||
Selector s => GFromForm (t :: k) (M1 S s (K1 i String :: Type -> Type)) | |||||||||
Defined in Web.Internal.FormUrlEncoded | |||||||||
(Selector s, FromHttpApiData c) => GFromForm (t :: k) (M1 S s (K1 i [c] :: Type -> Type)) | |||||||||
Defined in Web.Internal.FormUrlEncoded | |||||||||
Selector s => GToForm (t :: k) (M1 S s (K1 i String :: Type -> Type)) | |||||||||
Defined in Web.Internal.FormUrlEncoded Methods gToForm :: Proxy t -> FormOptions -> M1 S s (K1 i String :: Type -> Type) x -> Form | |||||||||
(Selector s, ToHttpApiData c) => GToForm (t :: k) (M1 S s (K1 i [c] :: Type -> Type)) | |||||||||
Defined in Web.Internal.FormUrlEncoded Methods gToForm :: Proxy t -> FormOptions -> M1 S s (K1 i [c] :: Type -> Type) x -> Form | |||||||||
Lift a => Lift ([a] :: Type) | |||||||||
Defined in Language.Haskell.TH.Syntax | |||||||||
FromJSON a => FromJSON [a] | |||||||||
Defined in Data.Aeson.Types.FromJSON Methods parseJSON :: Value -> Parser [a] parseJSONList :: Value -> Parser [[a]] omittedField :: Maybe [a] | |||||||||
(FromJSONKey a, FromJSON a) => FromJSONKey [a] | |||||||||
Defined in Data.Aeson.Types.FromJSON | |||||||||
ToJSON a => ToJSON [a] | |||||||||
Defined in Data.Aeson.Types.ToJSON Methods toJSON :: [a] -> Value toEncoding :: [a] -> Encoding toJSONList :: [[a]] -> Value toEncodingList :: [[a]] -> Encoding omitField :: [a] -> Bool | |||||||||
(ToJSONKey a, ToJSON a) => ToJSONKey [a] | |||||||||
Defined in Data.Aeson.Types.ToJSON | |||||||||
IsChar c => PrintfArg [c] | |||||||||
Defined in Text.Printf | |||||||||
IsChar c => PrintfType [c] | |||||||||
Defined in Text.Printf Methods spr :: String -> [UPrintf] -> [c] | |||||||||
FoldCase a => FoldCase [a] | |||||||||
Defined in Data.CaseInsensitive.Internal | |||||||||
Default [a] | |||||||||
Defined in System.Console.CmdArgs.Default Methods def :: [a] | |||||||||
Packer a => Packer [a] | |||||||||
Defined in System.Console.CmdArgs.Helper | |||||||||
Default [a] | |||||||||
Defined in Data.Default.Internal Methods def :: [a] | |||||||||
NFData a => NFData [a] | |||||||||
Defined in Control.DeepSeq Methods rnf :: [a] -> () | |||||||||
Monoid [a] | |||||||||
Defined in GHC.Internal.Base | |||||||||
Semigroup [a] | |||||||||
Defined in GHC.Internal.Base | |||||||||
a ~ Char => IsString [a] | |||||||||
Defined in GHC.Internal.Data.String Methods fromString :: String -> [a] | |||||||||
Generic [a] | |||||||||
Defined in GHC.Internal.Generics Associated Types
| |||||||||
IsList [a] | |||||||||
Defined in GHC.Internal.IsList Associated Types
| |||||||||
Read a => Read [a] | |||||||||
Defined in GHC.Internal.Read Methods readsPrec :: Int -> ReadS [a] readList :: ReadS [[a]] readPrec :: ReadPrec [a] readListPrec :: ReadPrec [[a]] | |||||||||
Show a => Show [a] | |||||||||
Defined in GHC.Internal.Show | |||||||||
Eq a => Eq [a] | |||||||||
Defined in GHC.Classes | |||||||||
Ord a => Ord [a] | |||||||||
Hashable a => Hashable [a] | |||||||||
Defined in Data.Hashable.Class | |||||||||
(MonadIO m, MonadMask m) => CommandMonad (InputCmdT m) | |||||||||
Defined in System.Console.Haskeline.InputT Methods runCompletion :: (String, String) -> InputCmdT m (String, [Completion]) | |||||||||
HasAmounts a => HasAmounts [a] | |||||||||
Defined in Hledger.Data.Types Methods styleAmounts :: Map CommoditySymbol AmountStyle -> [a] -> [a] # | |||||||||
FromHttpApiData v => FromForm (IntMap [v]) | |||||||||
Defined in Web.Internal.FormUrlEncoded | |||||||||
(FromFormKey k, FromHttpApiData v) => FromForm [(k, v)] | |||||||||
Defined in Web.Internal.FormUrlEncoded | |||||||||
ToHttpApiData v => ToForm (IntMap [v]) | |||||||||
Defined in Web.Internal.FormUrlEncoded Methods toForm :: IntMap [v] -> Form | |||||||||
(ToFormKey k, ToHttpApiData v) => ToForm [(k, v)] | |||||||||
Defined in Web.Internal.FormUrlEncoded Methods toForm :: [(k, v)] -> Form | |||||||||
QueryKeyLike [Char] | |||||||||
Defined in Network.HTTP.Types.QueryLike Methods toQueryKey :: [Char] -> ByteString | |||||||||
(QueryKeyLike k, QueryValueLike v) => QueryLike [Maybe (k, v)] | |||||||||
Defined in Network.HTTP.Types.QueryLike | |||||||||
(QueryKeyLike k, QueryValueLike v) => QueryLike [(k, v)] | |||||||||
Defined in Network.HTTP.Types.QueryLike Methods toQuery :: [(k, v)] -> Query | |||||||||
QueryValueLike [Char] | |||||||||
Defined in Network.HTTP.Types.QueryLike Methods toQueryValue :: [Char] -> Maybe ByteString | |||||||||
Ord a => Stream [a] | |||||||||
Defined in Text.Megaparsec.Stream Associated Types
Methods tokenToChunk :: Proxy [a] -> Token [a] -> Tokens [a] tokensToChunk :: Proxy [a] -> [Token [a]] -> Tokens [a] chunkToTokens :: Proxy [a] -> Tokens [a] -> [Token [a]] chunkLength :: Proxy [a] -> Tokens [a] -> Int chunkEmpty :: Proxy [a] -> Tokens [a] -> Bool take1_ :: [a] -> Maybe (Token [a], [a]) takeN_ :: Int -> [a] -> Maybe (Tokens [a], [a]) takeWhile_ :: (Token [a] -> Bool) -> [a] -> (Tokens [a], [a]) | |||||||||
Ixed [a] | |||||||||
Defined in Lens.Micro.Internal Methods ix :: Index [a] -> Traversal' [a] (IxValue [a]) | |||||||||
Pretty a => Pretty [a] | |||||||||
Defined in Prettyprinter.Internal | |||||||||
Uncons [Char] | |||||||||
ToAttributes [(Text, Text)] | |||||||||
Defined in Text.Hamlet Methods toAttributes :: [(Text, Text)] -> [(Text, Text)] | |||||||||
ToAttributes [(String, String)] | |||||||||
Defined in Text.Hamlet Methods toAttributes :: [(String, String)] -> [(Text, Text)] | |||||||||
a ~ HamletData => ToHamletData [a] | |||||||||
Defined in Text.Hamlet.Runtime Methods toHamletData :: [a] -> HamletData | |||||||||
ToCss [Char] | |||||||||
Defined in Text.Internal.Css | |||||||||
RawJS [Char] | |||||||||
Defined in Text.Julius | |||||||||
ToText [Char] | |||||||||
Defined in Text.Shakespeare.Text | |||||||||
TypeSubstitution a => TypeSubstitution [a] | |||||||||
Defined in Language.Haskell.TH.Datatype | |||||||||
UTF8Bytes [Word8] Int | |||||||||
Defined in Codec.Binary.UTF8.Generic | |||||||||
Run (State PureState) Pure | |||||||||
Defined in System.Console.Wizard.Pure Methods runAlgebra :: Pure (State PureState v) -> State PureState v | |||||||||
Cons [a] [b] a b | |||||||||
Defined in Lens.Micro.Internal Methods _Cons :: Traversal [a] [b] (a, [a]) (b, [b]) | |||||||||
Each [a] [b] a b | |||||||||
Defined in Lens.Micro.Internal Methods each :: Traversal [a] [b] a b | |||||||||
Snoc [a] [b] a b | |||||||||
Defined in Lens.Micro.Internal Methods _Snoc :: Traversal [a] [b] ([a], a) ([b], b) | |||||||||
(Applicative m, f ~ HtmlT m a) => Term [Attribute] (f -> HtmlT m a) | |||||||||
Defined in Lucid.Base | |||||||||
(Monad m, ToHtml f, a ~ ()) => TermRaw [Attribute] (f -> HtmlT m a) | |||||||||
Defined in Lucid.Base Methods termRaw :: Text -> [Attribute] -> f -> HtmlT m a termRawWith :: Text -> [Attribute] -> [Attribute] -> f -> HtmlT m a | |||||||||
ByteSource (StateT [Char] (Either DecodingException)) | |||||||||
Defined in Data.Encoding.ByteSource Methods sourceEmpty :: StateT [Char] (Either DecodingException) Bool fetchWord8 :: StateT [Char] (Either DecodingException) Word8 fetchAhead :: StateT [Char] (Either DecodingException) (Maybe a) -> StateT [Char] (Either DecodingException) (Maybe a) fetchWord16be :: StateT [Char] (Either DecodingException) Word16 fetchWord16le :: StateT [Char] (Either DecodingException) Word16 fetchWord32be :: StateT [Char] (Either DecodingException) Word32 fetchWord32le :: StateT [Char] (Either DecodingException) Word32 fetchWord64be :: StateT [Char] (Either DecodingException) Word64 fetchWord64le :: StateT [Char] (Either DecodingException) Word64 | |||||||||
ByteSource (StateT [Char] Identity) | |||||||||
Defined in Data.Encoding.ByteSource Methods sourceEmpty :: StateT [Char] Identity Bool fetchWord8 :: StateT [Char] Identity Word8 fetchAhead :: StateT [Char] Identity (Maybe a) -> StateT [Char] Identity (Maybe a) fetchWord16be :: StateT [Char] Identity Word16 fetchWord16le :: StateT [Char] Identity Word16 fetchWord32be :: StateT [Char] Identity Word32 fetchWord32le :: StateT [Char] Identity Word32 fetchWord64be :: StateT [Char] Identity Word64 fetchWord64le :: StateT [Char] Identity Word64 | |||||||||
(Ord k, FromFormKey k, FromHttpApiData v) => FromForm (Map k [v]) | |||||||||
Defined in Web.Internal.FormUrlEncoded | |||||||||
(Eq k, Hashable k, FromFormKey k, FromHttpApiData v) => FromForm (HashMap k [v]) | |||||||||
Defined in Web.Internal.FormUrlEncoded | |||||||||
(ToFormKey k, ToHttpApiData v) => ToForm (Map k [v]) | |||||||||
Defined in Web.Internal.FormUrlEncoded Methods toForm :: Map k [v] -> Form | |||||||||
(ToFormKey k, ToHttpApiData v) => ToForm (HashMap k [v]) | |||||||||
Defined in Web.Internal.FormUrlEncoded Methods toForm :: HashMap k [v] -> Form | |||||||||
ToAttributes (String, String) | |||||||||
Defined in Text.Hamlet Methods toAttributes :: (String, String) -> [(Text, Text)] | |||||||||
type Rep1 [] | |||||||||
Defined in GHC.Internal.Generics type Rep1 [] = D1 ('MetaData "List" "GHC.Types" "ghc-prim" 'False) (C1 ('MetaCons "[]" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons ":" ('InfixI 'RightAssociative 5) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 []))) | |||||||||
type StM [] a | |||||||||
Defined in Control.Monad.Trans.Control type StM [] a = a | |||||||||
type Rep [a] | |||||||||
Defined in GHC.Internal.Generics type Rep [a] = D1 ('MetaData "List" "GHC.Types" "ghc-prim" 'False) (C1 ('MetaCons "[]" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons ":" ('InfixI 'RightAssociative 5) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a]))) | |||||||||
type Item [a] | |||||||||
Defined in GHC.Internal.IsList type Item [a] = a | |||||||||
type Token [a] | |||||||||
Defined in Text.Megaparsec.Stream type Token [a] = a | |||||||||
type Tokens [a] | |||||||||
Defined in Text.Megaparsec.Stream type Tokens [a] = [a] | |||||||||
type Index [a] | |||||||||
Defined in Lens.Micro.Internal type Index [a] = Int | |||||||||
type IxValue [a] | |||||||||
Defined in Lens.Micro.Internal type IxValue [a] = a |
Instances
FromJSON1 Maybe | |||||
Defined in Data.Aeson.Types.FromJSON Methods liftParseJSON :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Maybe a) liftParseJSONList :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Maybe a] liftOmittedField :: Maybe a -> Maybe (Maybe a) | |||||
ToJSON1 Maybe | |||||
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> Maybe a -> Value liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [Maybe a] -> Value liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> Maybe a -> Encoding liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [Maybe a] -> Encoding liftOmitField :: (a -> Bool) -> Maybe a -> Bool | |||||
MonadZip Maybe | |||||
Eq1 Maybe | |||||
Defined in Data.Functor.Classes | |||||
Ord1 Maybe | |||||
Defined in Data.Functor.Classes Methods liftCompare :: (a -> b -> Ordering) -> Maybe a -> Maybe b -> Ordering | |||||
Read1 Maybe | |||||
Defined in Data.Functor.Classes Methods liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Maybe a) liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Maybe a] liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Maybe a) liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Maybe a] | |||||
Show1 Maybe | |||||
Defined in Data.Functor.Classes Methods liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Maybe a -> ShowS liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Maybe a] -> ShowS | |||||
MonadFailure Maybe | |||||
Defined in Basement.Monad Associated Types
| |||||
NFData1 Maybe | |||||
Defined in Control.DeepSeq | |||||
MonadThrow Maybe | |||||
Defined in Control.Monad.Catch Methods throwM :: (HasCallStack, Exception e) => e -> Maybe a | |||||
Alternative Maybe | |||||
Applicative Maybe | |||||
Functor Maybe | |||||
Monad Maybe | |||||
MonadPlus Maybe | |||||
MonadFail Maybe | |||||
Defined in GHC.Internal.Control.Monad.Fail | |||||
Foldable Maybe | |||||
Defined in GHC.Internal.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 | |||||
Hashable1 Maybe | |||||
Defined in Data.Hashable.Class Methods liftHashWithSalt :: (Int -> a -> Int) -> Int -> Maybe a -> Int | |||||
Generic1 Maybe | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Reportable Maybe e | |||||
Defined in Hledger.Reports.ReportOptions | |||||
MonadBaseControl Maybe Maybe | |||||
Defined in Control.Monad.Trans.Control Associated Types
| |||||
MonadError () Maybe | |||||
Defined in Control.Monad.Error.Class | |||||
(Selector s, FromHttpApiData c) => GFromForm (t :: k) (M1 S s (K1 i (Maybe c) :: Type -> Type)) | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
(Selector s, ToHttpApiData c) => GToForm (t :: k) (M1 S s (K1 i (Maybe c) :: Type -> Type)) | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
Lift a => Lift (Maybe a :: Type) | |||||
FromJSON a => FromJSON (Maybe a) | |||||
Defined in Data.Aeson.Types.FromJSON Methods parseJSON :: Value -> Parser (Maybe a) parseJSONList :: Value -> Parser [Maybe a] omittedField :: Maybe (Maybe a) | |||||
ToJSON a => ToJSON (Maybe a) | |||||
Defined in Data.Aeson.Types.ToJSON Methods toEncoding :: Maybe a -> Encoding toJSONList :: [Maybe a] -> Value toEncodingList :: [Maybe a] -> Encoding | |||||
Default (Maybe a) | |||||
Defined in System.Console.CmdArgs.Default | |||||
Packer a => Packer (Maybe a) | |||||
Defined in System.Console.CmdArgs.Helper | |||||
Default (Maybe a) | |||||
Defined in Data.Default.Internal | |||||
NFData a => NFData (Maybe a) | |||||
Defined in Control.DeepSeq | |||||
Semigroup a => Monoid (Maybe a) | |||||
Semigroup a => Semigroup (Maybe a) | |||||
Generic (Maybe a) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
SingKind a => SingKind (Maybe a) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Read a => Read (Maybe a) | |||||
Defined in GHC.Internal.Read | |||||
Show a => Show (Maybe a) | |||||
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 # | |||||
(QueryKeyLike k, QueryValueLike v) => QueryLike [Maybe (k, v)] | |||||
Defined in Network.HTTP.Types.QueryLike | |||||
QueryValueLike a => QueryValueLike (Maybe a) | |||||
Defined in Network.HTTP.Types.QueryLike Methods toQueryValue :: Maybe a -> Maybe ByteString | |||||
Pretty a => Pretty (Maybe a) | |||||
Defined in Prettyprinter.Internal | |||||
a ~ HamletData => ToHamletData (Maybe a) | |||||
Defined in Text.Hamlet.Runtime Methods toHamletData :: Maybe a -> HamletData | |||||
SingI ('Nothing :: Maybe a) | |||||
Defined in GHC.Internal.Generics | |||||
Each (Maybe a) (Maybe b) a b | |||||
Defined in Lens.Micro.Internal | |||||
SingI a2 => SingI ('Just a2 :: Maybe a1) | |||||
Defined in GHC.Internal.Generics | |||||
type Failure Maybe | |||||
Defined in Basement.Monad type Failure Maybe = () | |||||
type Rep1 Maybe | |||||
Defined in GHC.Internal.Generics | |||||
type StM Maybe a | |||||
Defined in Control.Monad.Trans.Control type StM Maybe a = a | |||||
type DemoteRep (Maybe a) | |||||
Defined in GHC.Internal.Generics | |||||
type Rep (Maybe a) | |||||
Defined in GHC.Internal.Generics | |||||
data Sing (b :: Maybe a) | |||||
fromJust :: HasCallStack => Maybe a -> a #
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
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 | |||||||||
FoldCase Text | |||||||||
Defined in Data.CaseInsensitive.Internal | |||||||||
Show CsvRules | |||||||||
Defined in Hledger.Read.RulesReader | |||||||||
Eq CsvRules | |||||||||
Defined in Hledger.Read.RulesReader | |||||||||
Hashable Text | |||||||||
Defined in Data.Hashable.Class | |||||||||
Anon Text Source # | |||||||||
FromFormKey Text | |||||||||
Defined in Web.Internal.FormUrlEncoded Methods parseFormKey :: Text -> Either Text Text | |||||||||
ToFormKey Text | |||||||||
Defined in Web.Internal.FormUrlEncoded | |||||||||
QueryKeyLike Text | |||||||||
Defined in Network.HTTP.Types.QueryLike Methods toQueryKey :: Text -> ByteString | |||||||||
QueryValueLike Text | |||||||||
Defined in Network.HTTP.Types.QueryLike Methods toQueryValue :: Text -> Maybe ByteString | |||||||||
ToHtml Text | |||||||||
Stream Text | |||||||||
Defined in Text.Megaparsec.Stream Associated Types
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 | |||||||||
Pretty Text | |||||||||
Defined in Prettyprinter.Internal | |||||||||
Extract Text | |||||||||
Uncons Text | |||||||||
ToHamletData Text | |||||||||
Defined in Text.Hamlet.Runtime Methods toHamletData :: Text -> HamletData | |||||||||
ToCss Text | |||||||||
Defined in Text.Internal.Css | |||||||||
RawJS Text | |||||||||
Defined in Text.Julius | |||||||||
ToJavascript Text | |||||||||
Defined in Text.Julius Methods toJavascript :: Text -> Javascript | |||||||||
ToMessage Text | |||||||||
Defined in Text.Shakespeare.I18N | |||||||||
ToText Text | |||||||||
Defined in Text.Shakespeare.Text | |||||||||
Term Text Attribute | |||||||||
TermRaw Text Attribute | |||||||||
Defined in Lucid.Base | |||||||||
RenderMessage master Text | |||||||||
Defined in Text.Shakespeare.I18N Methods renderMessage :: master -> [Lang] -> Text -> Text | |||||||||
(Monad m, a ~ ()) => TermRaw Text (HtmlT m a) | |||||||||
Defined in Lucid.Base | |||||||||
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) | |||||||||
ToAttributes [(Text, Text)] | |||||||||
Defined in Text.Hamlet Methods toAttributes :: [(Text, Text)] -> [(Text, Text)] | |||||||||
Ord (ParseError Text HledgerParseErrorData) | |||||||||
Defined in Hledger.Utils.Parse 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 # | |||||||||
ToAttributes (Text, Text) | |||||||||
Defined in Text.Hamlet Methods toAttributes :: (Text, Text) -> [(Text, Text)] | |||||||||
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 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 |
optional :: Alternative f => f a -> f (Maybe a) #
Constructors
ModifiedJulianDay | |
Fields
|
Instances
FromJSON Day | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON :: Value -> Parser Day parseJSONList :: Value -> Parser [Day] omittedField :: Maybe Day | |
FromJSONKey Day | |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON Day | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSONKey Day | |
Defined in Data.Aeson.Types.ToJSON | |
NFData Day | |
Defined in Data.Time.Calendar.Days | |
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 | |
Eq Day | |
Ord Day | |
FromFormKey Day | |
Defined in Web.Internal.FormUrlEncoded Methods parseFormKey :: Text -> Either Text Day | |
ToFormKey Day | |
Defined in Web.Internal.FormUrlEncoded | |
DayPeriod Day | |
Defined in Data.Time.Calendar.Days | |
ISO8601 Day | |
Defined in Data.Time.Format.ISO8601 Methods iso8601Format :: Format Day | |
type Rep Day | |
Defined in Data.Time.Orphans |
data SmartInterval #
Instances
Show SmartInterval | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> SmartInterval -> ShowS show :: SmartInterval -> String showList :: [SmartInterval] -> ShowS |
quoteIfSpaced :: Text -> Text #
showDateSpan :: DateSpan -> Text #
Instances
Default DateSpan | |||||
Defined in Hledger.Data.Types | |||||
NFData DateSpan | |||||
Defined in Hledger.Data.Types | |||||
Generic DateSpan | |||||
Defined in Hledger.Data.Types Associated 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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "DateSpan" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe EFDay)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe EFDay)))) |
Instances
MonadIO IO | |||||||||
Defined in Control.Monad.IO.Class | |||||||||
PrimMonad IO | |||||||||
Defined in Basement.Monad Associated Types
Methods primitive :: (State# (PrimState IO) -> (# State# (PrimState IO), a #)) -> IO a primThrow :: Exception e => e -> IO a unPrimMonad :: IO a -> State# (PrimState IO) -> (# State# (PrimState IO), a #) primVarNew :: a -> IO (PrimVar IO a) primVarRead :: PrimVar IO a -> IO a primVarWrite :: PrimVar IO a -> a -> 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 | |||||||||
Alternative IO | |||||||||
Applicative IO | |||||||||
Functor IO | |||||||||
Monad IO | |||||||||
MonadPlus IO | |||||||||
MonadFail IO | |||||||||
Defined in GHC.Internal.Control.Monad.Fail | |||||||||
PrimBase IO | |||||||||
Defined in Control.Monad.Primitive | |||||||||
PrimMonad IO | |||||||||
Defined in Control.Monad.Primitive Associated Types
| |||||||||
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 | |||||||||
MonadBaseControl IO IO | |||||||||
Defined in Control.Monad.Trans.Control Associated Types
| |||||||||
MonadBaseControl IO Req | |||||||||
Defined in Network.HTTP.Req Associated Types
| |||||||||
MonadError IOException IO | |||||||||
Defined in Control.Monad.Error.Class | |||||||||
MonadBase IO Req | |||||||||
Defined in Network.HTTP.Req | |||||||||
Run IO BasicIO | |||||||||
Defined in System.Console.Wizard.BasicIO Methods runAlgebra :: BasicIO (IO v) -> IO v | |||||||||
a ~ () => HPrintfType (IO a) | |||||||||
Defined in Text.Printf | |||||||||
a ~ () => PrintfType (IO a) | |||||||||
Defined in Text.Printf | |||||||||
Monoid a => Monoid (IO a) | |||||||||
Semigroup a => Semigroup (IO a) | |||||||||
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 | |||||||||
ByteSink (ReaderT Handle IO) | |||||||||
Defined in Data.Encoding.ByteSink Methods pushWord8 :: Word8 -> ReaderT Handle IO () pushWord16be :: Word16 -> ReaderT Handle IO () pushWord16le :: Word16 -> ReaderT Handle IO () pushWord32be :: Word32 -> ReaderT Handle IO () pushWord32le :: Word32 -> ReaderT Handle IO () pushWord64be :: Word64 -> ReaderT Handle IO () pushWord64le :: Word64 -> ReaderT Handle IO () | |||||||||
ByteSource (ReaderT Handle IO) | |||||||||
Defined in Data.Encoding.ByteSource Methods sourceEmpty :: ReaderT Handle IO Bool fetchWord8 :: ReaderT Handle IO Word8 fetchAhead :: ReaderT Handle IO (Maybe a) -> ReaderT Handle IO (Maybe a) fetchWord16be :: ReaderT Handle IO Word16 fetchWord16le :: ReaderT Handle IO Word16 fetchWord32be :: ReaderT Handle IO Word32 fetchWord32le :: ReaderT Handle IO Word32 fetchWord64be :: ReaderT Handle IO Word64 fetchWord64le :: ReaderT Handle IO Word64 | |||||||||
type PrimState IO | |||||||||
Defined in Basement.Monad type PrimState IO = RealWorld | |||||||||
type PrimVar IO | |||||||||
Defined in Basement.Monad type PrimVar IO = IORef | |||||||||
type PrimState IO | |||||||||
Defined in Control.Monad.Primitive type PrimState IO = RealWorld | |||||||||
type StM IO a | |||||||||
Defined in Control.Monad.Trans.Control type StM IO a = a |
intercalate :: [a] -> [[a]] -> [a] #
exitSuccess :: IO a #
isPrefixOf :: Eq a => [a] -> [a] -> Bool #
isSuffixOf :: Eq a => [a] -> [a] -> Bool #
isAlphaNum :: Char -> Bool #
dropExtension :: FilePath -> FilePath #
takeBaseName :: FilePath -> String #
takeExtension :: FilePath -> String #
type Balance = MixedAmount #
printf :: PrintfType r => String -> r #
toGregorian :: Day -> (Year, MonthOfYear, DayOfMonth) #
formatTime :: FormatTime t => TimeLocale -> String -> t -> String #
Instances
NFData Side | |||||
Defined in Hledger.Data.Types | |||||
Generic Side | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "L" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "R" 'PrefixI 'False) (U1 :: Type -> Type)) |
Instances
Show SepFormat | |
Eq SepFormat | |
Ord SepFormat | |
guard :: Alternative f => Bool -> f () #
fromGregorian :: Year -> MonthOfYear -> DayOfMonth -> Day #
maximumMay :: Ord a => [a] -> Maybe a #
partitionEithers :: [Either a b] -> ([a], [b]) #
threadDelay :: Int -> IO () #
callProcess :: FilePath -> [String] -> IO () #
dropWhileEnd :: (a -> Bool) -> [a] -> [a] #
class Functor f => Applicative (f :: Type -> Type) where #
Instances
Applicative IResult | |
Applicative Parser | |
Applicative Result | |
Applicative Complex | |
Applicative First | |
Applicative Last | |
Applicative Max | |
Applicative Min | |
Applicative Put | |
Applicative RGB | |
Applicative Seq | |
Applicative Tree | |
Applicative CryptoFailable | |
Defined in Crypto.Error.Types Methods pure :: a -> CryptoFailable a # (<*>) :: CryptoFailable (a -> b) -> CryptoFailable a -> CryptoFailable b # liftA2 :: (a -> b -> c) -> CryptoFailable a -> CryptoFailable b -> CryptoFailable c # (*>) :: CryptoFailable a -> CryptoFailable b -> CryptoFailable b # (<*) :: CryptoFailable a -> CryptoFailable b -> CryptoFailable a # | |
Applicative DNonEmpty | |
Defined in Data.DList.DNonEmpty.Internal | |
Applicative DList | |
Applicative PutME | |
Applicative StrictSink | |
Defined in Data.Encoding.ByteSink | |
Applicative StrictSinkE | |
Defined in Data.Encoding.ByteSink | |
Applicative StrictSinkExplicit | |
Defined in Data.Encoding.ByteSink Methods pure :: a -> StrictSinkExplicit a # (<*>) :: StrictSinkExplicit (a -> b) -> StrictSinkExplicit a -> StrictSinkExplicit b # liftA2 :: (a -> b -> c) -> StrictSinkExplicit a -> StrictSinkExplicit b -> StrictSinkExplicit c # (*>) :: StrictSinkExplicit a -> StrictSinkExplicit b -> StrictSinkExplicit b # (<*) :: StrictSinkExplicit a -> StrictSinkExplicit b -> StrictSinkExplicit a # | |
Applicative NonEmpty | |
Applicative STM | |
Applicative Identity | |
Applicative Down | |
Applicative Dual | |
Applicative Product | |
Applicative Sum | |
Applicative ZipList | |
Applicative Par1 | |
Applicative P | |
Applicative ReadP | |
Applicative ReadPrec | |
Defined in GHC.Internal.Text.ParserCombinators.ReadPrec | |
Applicative IO | |
Applicative Border | |
Applicative Root | |
Applicative Sequence | |
Applicative Array | |
Applicative SmallArray | |
Defined in Data.Primitive.SmallArray | |
Applicative Req | |
Applicative Parser | |
Applicative Q | |
Applicative Vector | |
Applicative Vector | |
Applicative Stream | |
Applicative Maybe | |
Applicative Solo | |
Applicative [] | |
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 # | |
Applicative (SetM s) | |
Functor f => Applicative (Free f) | |
Arrow a => Applicative (ArrowMonad a) | |
Defined in GHC.Internal.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 (Proxy :: Type -> Type) | |
Applicative (U1 :: Type -> Type) | |
Applicative (ST s) | |
Applicative m => Applicative (InputT m) | |
Applicative m => Applicative (HtmlT m) | |
Semigroup a => Applicative (These a) | |
Applicative (IParser t) | |
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 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 m => Applicative (Kleisli m a) | |
Defined in GHC.Internal.Control.Arrow | |
Monoid m => Applicative (Const m :: Type -> Type) | |
Monad m => Applicative (StateT s m) | |
Defined in GHC.Internal.Data.Functor.Utils | |
Applicative f => Applicative (Alt f) | |
(Generic1 f, Applicative (Rep1 f)) => Applicative (Generically1 f) | |
Defined in GHC.Internal.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) | |
Applicative (Bazaar a b) | |
Defined in Lens.Micro | |
(Functor m, Monad m) => Applicative (StateT s m) | |
Applicative (t m) => Applicative (LiftingAccum t m) | |
Defined in Control.Monad.Accum Methods pure :: a -> LiftingAccum t m a # (<*>) :: LiftingAccum t m (a -> b) -> LiftingAccum t m a -> LiftingAccum t m b # liftA2 :: (a -> b -> c) -> LiftingAccum t m a -> LiftingAccum t m b -> LiftingAccum t m c # (*>) :: LiftingAccum t m a -> LiftingAccum t m b -> LiftingAccum t m b # (<*) :: LiftingAccum t m a -> LiftingAccum t m b -> LiftingAccum t m a # | |
Applicative (t m) => Applicative (LiftingSelect t m) | |
Defined in Control.Monad.Select Methods pure :: a -> LiftingSelect t m a # (<*>) :: LiftingSelect t m (a -> b) -> LiftingSelect t m a -> LiftingSelect t m b # liftA2 :: (a -> b -> c) -> LiftingSelect t m a -> LiftingSelect t m b -> LiftingSelect t m c # (*>) :: LiftingSelect t m a -> LiftingSelect t m b -> LiftingSelect t m b # (<*) :: LiftingSelect t m a -> LiftingSelect t m b -> LiftingSelect t m a # | |
Applicative (Tagged s) | |
Applicative f => Applicative (Backwards f) | |
Defined in Control.Applicative.Backwards | |
(Monoid w, Functor m, Monad m) => Applicative (AccumT w m) | |
Defined in Control.Monad.Trans.Accum | |
(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 (SelectT r m) | |
Defined in Control.Monad.Trans.Select | |
(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 | |
(Functor m, Monad m) => Applicative (WriterT w m) | |
Defined in Control.Monad.Trans.Writer.CPS | |
(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 (Product f g) | |
Defined in Data.Functor.Product | |
(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 # | |
(Applicative f, Applicative g) => Applicative (f :*: g) | |
Monoid c => Applicative (K1 i c :: Type -> Type) | |
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.Internal.Base | |
Applicative ((->) r) | |
(Applicative f, Applicative g) => Applicative (Compose f g) | |
Defined in Data.Functor.Compose | |
(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 # | |
(Applicative f, Applicative g) => Applicative (f :.: g) | |
Applicative f => Applicative (M1 i c f) | |
Reifies s (ReifiedApplicative f) => Applicative (ReflectedApplicative f s) | |
Defined in Data.Reflection Methods pure :: a -> ReflectedApplicative f s a # (<*>) :: ReflectedApplicative f s (a -> b) -> ReflectedApplicative f s a -> ReflectedApplicative f s b # liftA2 :: (a -> b -> c) -> ReflectedApplicative f s a -> ReflectedApplicative f s b -> ReflectedApplicative f s c # (*>) :: ReflectedApplicative f s a -> ReflectedApplicative f s b -> ReflectedApplicative f s b # (<*) :: ReflectedApplicative f s a -> ReflectedApplicative f s b -> ReflectedApplicative f s a # | |
(Functor m, Monad m) => Applicative (RWST r w s m) | |
Defined in Control.Monad.Trans.RWS.CPS | |
(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 state => Applicative (Builder collection mutCollection step state err) | |
Defined in Basement.MutableBuilder Methods pure :: a -> Builder collection mutCollection step state err a # (<*>) :: Builder collection mutCollection step state err (a -> b) -> Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b # liftA2 :: (a -> b -> c) -> Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err c # (*>) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err b # (<*) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err a # |
class Applicative f => Alternative (f :: Type -> Type) where #
Instances
Instances
Ord DL | |
Ord LineRange | |
Ord Key | |
Ord Arity | |
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 Encoding | |
Defined in Basement.String | |
Ord UTF32_Invalid | |
Defined in Basement.String.Encoding.UTF32 Methods compare :: UTF32_Invalid -> UTF32_Invalid -> Ordering # (<) :: UTF32_Invalid -> UTF32_Invalid -> Bool # (<=) :: UTF32_Invalid -> UTF32_Invalid -> Bool # (>) :: UTF32_Invalid -> UTF32_Invalid -> Bool # (>=) :: UTF32_Invalid -> UTF32_Invalid -> Bool # | |
Ord FileSize | |
Defined in Basement.Types.OffsetSize | |
Ord String | |
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 ByteArray | |
Ord SlicedByteArray | |
Defined in Codec.CBOR.ByteArray.Sliced Methods compare :: SlicedByteArray -> SlicedByteArray -> Ordering # (<) :: SlicedByteArray -> SlicedByteArray -> Bool # (<=) :: SlicedByteArray -> SlicedByteArray -> Bool # (>) :: SlicedByteArray -> SlicedByteArray -> Bool # (>=) :: SlicedByteArray -> SlicedByteArray -> Bool # max :: SlicedByteArray -> SlicedByteArray -> SlicedByteArray # min :: SlicedByteArray -> SlicedByteArray -> SlicedByteArray # | |
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 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 Background | |
Defined in Text.DocLayout.ANSIFont | |
Ord Color8 | |
Ord Font | |
Ord Foreground | |
Defined in Text.DocLayout.ANSIFont | |
Ord Shape | |
Ord Strikeout | |
Ord StyleReq | |
Defined in Text.DocLayout.ANSIFont | |
Ord Underline | |
Ord Weight | |
Ord BigNat | |
Ord Extension | |
Ord Void | |
Ord ByteOrder | |
Ord ClosureType | |
Defined in GHC.Internal.ClosureTypes | |
Ord BlockReason | |
Defined in GHC.Internal.Conc.Sync | |
Ord ThreadId | |
Defined in GHC.Internal.Conc.Sync | |
Ord ThreadStatus | |
Defined in GHC.Internal.Conc.Sync | |
Ord All | |
Ord Any | |
Ord SomeTypeRep | |
Defined in GHC.Internal.Data.Typeable.Internal | |
Ord Version | |
Defined in GHC.Internal.Data.Version | |
Ord ErrorCall | |
Ord ArithException | |
Defined in GHC.Internal.Exception.Type Methods compare :: ArithException -> ArithException -> Ordering # (<) :: ArithException -> ArithException -> Bool # (<=) :: ArithException -> ArithException -> Bool # (>) :: ArithException -> ArithException -> Bool # (>=) :: ArithException -> ArithException -> Bool # | |
Ord CBool | |
Ord CChar | |
Ord CClock | |
Ord CDouble | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CFloat | |
Ord CInt | |
Ord CIntMax | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CIntPtr | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CLLong | |
Ord CLong | |
Ord CPtrdiff | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CSChar | |
Ord CSUSeconds | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CShort | |
Ord CSigAtomic | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CSize | |
Ord CTime | |
Ord CUChar | |
Ord CUInt | |
Ord CUIntMax | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CUIntPtr | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CULLong | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CULong | |
Ord CUSeconds | |
Ord CUShort | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CWchar | |
Ord Associativity | |
Defined in GHC.Internal.Generics Methods compare :: Associativity -> Associativity -> Ordering # (<) :: Associativity -> Associativity -> Bool # (<=) :: Associativity -> Associativity -> Bool # (>) :: Associativity -> Associativity -> Bool # (>=) :: Associativity -> Associativity -> Bool # | |
Ord DecidedStrictness | |
Defined in GHC.Internal.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.Internal.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.Internal.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.Internal.IO.Device | |
Ord ArrayException | |
Defined in GHC.Internal.IO.Exception Methods compare :: ArrayException -> ArrayException -> Ordering # (<) :: ArrayException -> ArrayException -> Bool # (<=) :: ArrayException -> ArrayException -> Bool # (>) :: ArrayException -> ArrayException -> Bool # (>=) :: ArrayException -> ArrayException -> Bool # | |
Ord AsyncException | |
Defined in GHC.Internal.IO.Exception Methods compare :: AsyncException -> AsyncException -> Ordering # (<) :: AsyncException -> AsyncException -> Bool # (<=) :: AsyncException -> AsyncException -> Bool # (>) :: AsyncException -> AsyncException -> Bool # (>=) :: AsyncException -> AsyncException -> Bool # | |
Ord ExitCode | |
Defined in GHC.Internal.IO.Exception | |
Ord BufferMode | |
Defined in GHC.Internal.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 | |
Defined in GHC.Internal.IO.Handle.Types | |
Ord NewlineMode | |
Defined in GHC.Internal.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 Int16 | |
Ord Int32 | |
Ord Int64 | |
Ord Int8 | |
Ord CBlkCnt | |
Defined in GHC.Internal.System.Posix.Types | |
Ord CBlkSize | |
Defined in GHC.Internal.System.Posix.Types | |
Ord CCc | |
Ord CClockId | |
Defined in GHC.Internal.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 GHC.Internal.System.Posix.Types | |
Ord CSpeed | |
Ord CSsize | |
Ord CTcflag | |
Defined in GHC.Internal.System.Posix.Types | |
Ord CTimer | |
Ord CUid | |
Ord Fd | |
Ord SomeNat | |
Defined in GHC.Internal.TypeNats | |
Ord GeneralCategory | |
Defined in GHC.Internal.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 Ordering | |
Defined in GHC.Classes | |
Ord TyCon | |
Ord Half | |
Ord Completion | |
Defined in System.Console.Haskeline.Completion | |
Ord RowClass Source # | |
Defined in Hledger.Cli.Commands.Balance | |
Ord BalancingOpts | |
Defined in Hledger.Data.Balancing Methods compare :: BalancingOpts -> BalancingOpts -> Ordering # (<) :: BalancingOpts -> BalancingOpts -> Bool # (<=) :: BalancingOpts -> BalancingOpts -> Bool # (>) :: BalancingOpts -> BalancingOpts -> Bool # (>=) :: BalancingOpts -> BalancingOpts -> Bool # max :: BalancingOpts -> BalancingOpts -> BalancingOpts # min :: BalancingOpts -> BalancingOpts -> BalancingOpts # | |
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 AmountCost | |
Defined in Hledger.Data.Types Methods compare :: AmountCost -> AmountCost -> Ordering # (<) :: AmountCost -> AmountCost -> Bool # (<=) :: AmountCost -> AmountCost -> Bool # (>) :: AmountCost -> AmountCost -> Bool # (>=) :: AmountCost -> AmountCost -> Bool # max :: AmountCost -> AmountCost -> AmountCost # min :: AmountCost -> AmountCost -> AmountCost # | |
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 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 SepFormat | |
Ord Side | |
Ord Status | |
Ord StorageFormat | |
Defined in Hledger.Data.Types Methods compare :: StorageFormat -> StorageFormat -> Ordering # (<) :: StorageFormat -> StorageFormat -> Bool # (<=) :: StorageFormat -> StorageFormat -> Bool # (>) :: StorageFormat -> StorageFormat -> Bool # (>=) :: StorageFormat -> StorageFormat -> Bool # max :: StorageFormat -> StorageFormat -> StorageFormat # min :: StorageFormat -> StorageFormat -> StorageFormat # | |
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 InputOpts | |
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 GhcDebugMode | |
Defined in Hledger.Utils.Debug Methods compare :: GhcDebugMode -> GhcDebugMode -> Ordering # (<) :: GhcDebugMode -> GhcDebugMode -> Bool # (<=) :: GhcDebugMode -> GhcDebugMode -> Bool # (>) :: GhcDebugMode -> GhcDebugMode -> Bool # (>=) :: GhcDebugMode -> GhcDebugMode -> Bool # max :: GhcDebugMode -> GhcDebugMode -> GhcDebugMode # min :: GhcDebugMode -> GhcDebugMode -> GhcDebugMode # | |
Ord HledgerParseErrorData | |
Defined in Hledger.Utils.Parse 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 Regexp | |
Ord DataStyle | |
Ord Emphasis | |
Defined in Hledger.Write.Spreadsheet | |
Ord NumLines | |
Defined in Hledger.Write.Spreadsheet | |
Ord Style | |
Ord Type | |
Ord ConnHost | |
Defined in Network.HTTP.Client.Types | |
Ord ConnKey | |
Defined in Network.HTTP.Client.Types | |
Ord MaxHeaderLength | |
Defined in Network.HTTP.Client.Types Methods compare :: MaxHeaderLength -> MaxHeaderLength -> Ordering # (<) :: MaxHeaderLength -> MaxHeaderLength -> Bool # (<=) :: MaxHeaderLength -> MaxHeaderLength -> Bool # (>) :: MaxHeaderLength -> MaxHeaderLength -> Bool # (>=) :: MaxHeaderLength -> MaxHeaderLength -> Bool # max :: MaxHeaderLength -> MaxHeaderLength -> MaxHeaderLength # min :: MaxHeaderLength -> MaxHeaderLength -> MaxHeaderLength # | |
Ord MaxNumberHeaders | |
Defined in Network.HTTP.Client.Types Methods compare :: MaxNumberHeaders -> MaxNumberHeaders -> Ordering # (<) :: MaxNumberHeaders -> MaxNumberHeaders -> Bool # (<=) :: MaxNumberHeaders -> MaxNumberHeaders -> Bool # (>) :: MaxNumberHeaders -> MaxNumberHeaders -> Bool # (>=) :: MaxNumberHeaders -> MaxNumberHeaders -> Bool # max :: MaxNumberHeaders -> MaxNumberHeaders -> MaxNumberHeaders # min :: MaxNumberHeaders -> MaxNumberHeaders -> MaxNumberHeaders # | |
Ord Proxy | |
Ord ProxySecureMode | |
Defined in Network.HTTP.Client.Types Methods compare :: ProxySecureMode -> ProxySecureMode -> Ordering # (<) :: ProxySecureMode -> ProxySecureMode -> Bool # (<=) :: ProxySecureMode -> ProxySecureMode -> Bool # (>) :: ProxySecureMode -> ProxySecureMode -> Bool # (>=) :: ProxySecureMode -> ProxySecureMode -> Bool # max :: ProxySecureMode -> ProxySecureMode -> ProxySecureMode # min :: ProxySecureMode -> ProxySecureMode -> ProxySecureMode # | |
Ord StatusHeaders | |
Defined in Network.HTTP.Client.Types Methods compare :: StatusHeaders -> StatusHeaders -> Ordering # (<) :: StatusHeaders -> StatusHeaders -> Bool # (<=) :: StatusHeaders -> StatusHeaders -> Bool # (>) :: StatusHeaders -> StatusHeaders -> Bool # (>=) :: StatusHeaders -> StatusHeaders -> Bool # | |
Ord StreamFileStatus | |
Defined in Network.HTTP.Client.Types Methods compare :: StreamFileStatus -> StreamFileStatus -> Ordering # (<) :: StreamFileStatus -> StreamFileStatus -> Bool # (<=) :: StreamFileStatus -> StreamFileStatus -> Bool # (>) :: StreamFileStatus -> StreamFileStatus -> Bool # (>=) :: StreamFileStatus -> StreamFileStatus -> Bool # max :: StreamFileStatus -> StreamFileStatus -> StreamFileStatus # min :: StreamFileStatus -> StreamFileStatus -> StreamFileStatus # | |
Ord ByteRange | |
Ord StdMethod | |
Ord Status | |
Ord EscapeItem | |
Defined in Network.HTTP.Types.URI | |
Ord HttpVersion | |
Defined in Network.HTTP.Types.Version | |
Ord IP | |
Ord IPv4 | |
Ord IPv6 | |
Ord IPRange | |
Ord Pos | |
Ord SourcePos | |
Ord Authority | |
Ord QueryParam | |
Ord RTextException | |
Defined in Text.URI.Types Methods compare :: RTextException -> RTextException -> Ordering # (<) :: RTextException -> RTextException -> Bool # (<=) :: RTextException -> RTextException -> Bool # (>) :: RTextException -> RTextException -> Bool # (>=) :: RTextException -> RTextException -> Bool # | |
Ord RTextLabel | |
Ord URI | |
Ord UserInfo | |
Defined in Text.URI.Types | |
Ord URI | |
Ord URIAuth | |
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 CommunicationHandle | |
Defined in System.Process.CommunicationHandle.Internal Methods compare :: CommunicationHandle -> CommunicationHandle -> Ordering # (<) :: CommunicationHandle -> CommunicationHandle -> Bool # (<=) :: CommunicationHandle -> CommunicationHandle -> Bool # (>) :: CommunicationHandle -> CommunicationHandle -> Bool # (>=) :: CommunicationHandle -> CommunicationHandle -> Bool # max :: CommunicationHandle -> CommunicationHandle -> CommunicationHandle # min :: CommunicationHandle -> CommunicationHandle -> CommunicationHandle # | |
Ord DoPa | |
Ord WhichTest | |
Ord PatternSetCharacterClass | |
Defined in Text.Regex.TDFA.Pattern Methods compare :: PatternSetCharacterClass -> PatternSetCharacterClass -> Ordering # (<) :: PatternSetCharacterClass -> PatternSetCharacterClass -> Bool # (<=) :: PatternSetCharacterClass -> PatternSetCharacterClass -> Bool # (>) :: PatternSetCharacterClass -> PatternSetCharacterClass -> Bool # (>=) :: PatternSetCharacterClass -> PatternSetCharacterClass -> Bool # max :: PatternSetCharacterClass -> PatternSetCharacterClass -> PatternSetCharacterClass # min :: PatternSetCharacterClass -> PatternSetCharacterClass -> PatternSetCharacterClass # | |
Ord PatternSetCollatingElement | |
Defined in Text.Regex.TDFA.Pattern Methods compare :: PatternSetCollatingElement -> PatternSetCollatingElement -> Ordering # (<) :: PatternSetCollatingElement -> PatternSetCollatingElement -> Bool # (<=) :: PatternSetCollatingElement -> PatternSetCollatingElement -> Bool # (>) :: PatternSetCollatingElement -> PatternSetCollatingElement -> Bool # (>=) :: PatternSetCollatingElement -> PatternSetCollatingElement -> Bool # max :: PatternSetCollatingElement -> PatternSetCollatingElement -> PatternSetCollatingElement # min :: PatternSetCollatingElement -> PatternSetCollatingElement -> PatternSetCollatingElement # | |
Ord PatternSetEquivalenceClass | |
Defined in Text.Regex.TDFA.Pattern Methods compare :: PatternSetEquivalenceClass -> PatternSetEquivalenceClass -> Ordering # (<) :: PatternSetEquivalenceClass -> PatternSetEquivalenceClass -> Bool # (<=) :: PatternSetEquivalenceClass -> PatternSetEquivalenceClass -> Bool # (>) :: PatternSetEquivalenceClass -> PatternSetEquivalenceClass -> Bool # (>=) :: PatternSetEquivalenceClass -> PatternSetEquivalenceClass -> Bool # max :: PatternSetEquivalenceClass -> PatternSetEquivalenceClass -> PatternSetEquivalenceClass # min :: PatternSetEquivalenceClass -> PatternSetEquivalenceClass -> PatternSetEquivalenceClass # | |
Ord Scheme | |
Ord Scientific | |
Ord AbsoluteSize | |
Defined in Text.Internal.CssCommon | |
Ord EmSize | |
Ord ExSize | |
Ord PercentageSize | |
Defined in Text.Internal.CssCommon Methods compare :: PercentageSize -> PercentageSize -> Ordering # (<) :: PercentageSize -> PercentageSize -> Bool # (<=) :: PercentageSize -> PercentageSize -> Bool # (>) :: PercentageSize -> PercentageSize -> Bool # (>=) :: PercentageSize -> PercentageSize -> Bool # | |
Ord PixelSize | |
Ord VarType | |
Ord Deref | |
Ord Ident | |
Ord HideSuccesses | |
Defined in Test.Tasty.Ingredients.ConsoleReporter Methods compare :: HideSuccesses -> HideSuccesses -> Ordering # (<) :: HideSuccesses -> HideSuccesses -> Bool # (<=) :: HideSuccesses -> HideSuccesses -> Bool # (>) :: HideSuccesses -> HideSuccesses -> Bool # (>=) :: HideSuccesses -> HideSuccesses -> Bool # | |
Ord MinDurationToReport | |
Defined in Test.Tasty.Ingredients.ConsoleReporter Methods compare :: MinDurationToReport -> MinDurationToReport -> Ordering # (<) :: MinDurationToReport -> MinDurationToReport -> Bool # (<=) :: MinDurationToReport -> MinDurationToReport -> Bool # (>) :: MinDurationToReport -> MinDurationToReport -> Bool # (>=) :: MinDurationToReport -> MinDurationToReport -> Bool # max :: MinDurationToReport -> MinDurationToReport -> MinDurationToReport # min :: MinDurationToReport -> MinDurationToReport -> MinDurationToReport # | |
Ord Quiet | |
Ord UseColor | |
Defined in Test.Tasty.Ingredients.ConsoleReporter | |
Ord HideProgress | |
Defined in Test.Tasty.Options.Core | |
Ord NumThreads | |
Defined in Test.Tasty.Options.Core | |
Ord Timeout | |
Defined in Test.Tasty.Options.Core | |
Ord AnnLookup | |
Ord AnnTarget | |
Ord Bang | |
Ord BndrVis | |
Defined in Language.Haskell.TH.Syntax | |
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 NamespaceSpecifier | |
Defined in Language.Haskell.TH.Syntax Methods compare :: NamespaceSpecifier -> NamespaceSpecifier -> Ordering # (<) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # (<=) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # (>) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # (>=) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # max :: NamespaceSpecifier -> NamespaceSpecifier -> NamespaceSpecifier # min :: NamespaceSpecifier -> NamespaceSpecifier -> NamespaceSpecifier # | |
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 I8 | |
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 Month | |
Ord Quarter | |
Defined in Data.Time.Calendar.Quarter | |
Ord QuarterOfYear | |
Defined in Data.Time.Calendar.Quarter Methods compare :: QuarterOfYear -> QuarterOfYear -> Ordering # (<) :: QuarterOfYear -> QuarterOfYear -> Bool # (<=) :: QuarterOfYear -> QuarterOfYear -> Bool # (>) :: QuarterOfYear -> QuarterOfYear -> Bool # (>=) :: QuarterOfYear -> QuarterOfYear -> Bool # | |
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 CipherId | |
Defined in Network.TLS.Types.Cipher | |
Ord Version | |
Defined in Network.TLS.Types.Version | |
Ord UnixDiffTime | |
Defined in Data.UnixTime.Types | |
Ord UnixTime | |
Defined in Data.UnixTime.Types | |
Ord UUID | |
Ord UnpackedUUID | |
Defined in Data.UUID.Types.Internal | |
Ord CompressParams | |
Defined in Codec.Compression.Zlib.Internal Methods compare :: CompressParams -> CompressParams -> Ordering # (<) :: CompressParams -> CompressParams -> Bool # (<=) :: CompressParams -> CompressParams -> Bool # (>) :: CompressParams -> CompressParams -> Bool # (>=) :: CompressParams -> CompressParams -> Bool # | |
Ord DecompressError | |
Defined in Codec.Compression.Zlib.Internal Methods compare :: DecompressError -> DecompressError -> Ordering # (<) :: DecompressError -> DecompressError -> Bool # (<=) :: DecompressError -> DecompressError -> Bool # (>) :: DecompressError -> DecompressError -> Bool # (>=) :: DecompressError -> DecompressError -> Bool # max :: DecompressError -> DecompressError -> DecompressError # min :: DecompressError -> DecompressError -> DecompressError # | |
Ord DecompressParams | |
Defined in Codec.Compression.Zlib.Internal Methods compare :: DecompressParams -> DecompressParams -> Ordering # (<) :: DecompressParams -> DecompressParams -> Bool # (<=) :: DecompressParams -> DecompressParams -> Bool # (>) :: DecompressParams -> DecompressParams -> Bool # (>=) :: DecompressParams -> DecompressParams -> Bool # max :: DecompressParams -> DecompressParams -> DecompressParams # min :: DecompressParams -> DecompressParams -> DecompressParams # | |
Ord CompressionLevel | |
Defined in Codec.Compression.Zlib.Stream Methods compare :: CompressionLevel -> CompressionLevel -> Ordering # (<) :: CompressionLevel -> CompressionLevel -> Bool # (<=) :: CompressionLevel -> CompressionLevel -> Bool # (>) :: CompressionLevel -> CompressionLevel -> Bool # (>=) :: CompressionLevel -> CompressionLevel -> Bool # max :: CompressionLevel -> CompressionLevel -> CompressionLevel # min :: CompressionLevel -> CompressionLevel -> CompressionLevel # | |
Ord CompressionStrategy | |
Defined in Codec.Compression.Zlib.Stream Methods compare :: CompressionStrategy -> CompressionStrategy -> Ordering # (<) :: CompressionStrategy -> CompressionStrategy -> Bool # (<=) :: CompressionStrategy -> CompressionStrategy -> Bool # (>) :: CompressionStrategy -> CompressionStrategy -> Bool # (>=) :: CompressionStrategy -> CompressionStrategy -> Bool # max :: CompressionStrategy -> CompressionStrategy -> CompressionStrategy # min :: CompressionStrategy -> CompressionStrategy -> CompressionStrategy # | |
Ord DictionaryHash | |
Defined in Codec.Compression.Zlib.Stream Methods compare :: DictionaryHash -> DictionaryHash -> Ordering # (<) :: DictionaryHash -> DictionaryHash -> Bool # (<=) :: DictionaryHash -> DictionaryHash -> Bool # (>) :: DictionaryHash -> DictionaryHash -> Bool # (>=) :: DictionaryHash -> DictionaryHash -> Bool # | |
Ord Format | |
Ord MemoryLevel | |
Defined in Codec.Compression.Zlib.Stream | |
Ord Method | |
Ord WindowBits | |
Defined in Codec.Compression.Zlib.Stream | |
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 (Numbered a) | |
Defined in Data.Algorithm.DiffContext | |
Ord a => Ord (DiffOperation a) | |
Defined in Data.Algorithm.DiffOutput Methods compare :: DiffOperation a -> DiffOperation a -> Ordering # (<) :: DiffOperation a -> DiffOperation a -> Bool # (<=) :: DiffOperation a -> DiffOperation a -> Bool # (>) :: DiffOperation a -> DiffOperation a -> Bool # (>=) :: DiffOperation a -> DiffOperation a -> Bool # max :: DiffOperation a -> DiffOperation a -> DiffOperation a # min :: DiffOperation a -> DiffOperation a -> DiffOperation a # | |
Ord a => Ord (Only a) | |
Ord (Encoding' a) | |
Defined in Data.Aeson.Encoding.Internal | |
Ord v => Ord (KeyMap v) | |
Defined in Data.Aeson.KeyMap | |
Ord a => Ord (First a) | |
Ord a => Ord (Last a) | |
Ord a => Ord (Max a) | |
Ord a => Ord (Min a) | |
Ord m => Ord (WrappedMonoid m) | |
Defined in Data.Semigroup Methods compare :: WrappedMonoid m -> WrappedMonoid m -> Ordering # (<) :: WrappedMonoid m -> WrappedMonoid m -> Bool # (<=) :: WrappedMonoid m -> WrappedMonoid m -> Bool # (>) :: WrappedMonoid m -> WrappedMonoid m -> Bool # (>=) :: WrappedMonoid m -> WrappedMonoid m -> Bool # max :: WrappedMonoid m -> WrappedMonoid m -> WrappedMonoid m # min :: WrappedMonoid m -> WrappedMonoid m -> WrappedMonoid m # | |
Ord (Bits n) | |
(PrimType ty, Ord ty) => Ord (Block ty) | |
Defined in Basement.Block.Base | |
Ord (Zn n) | |
Ord (Zn64 n) | |
Ord (CountOf ty) | |
Defined in Basement.Types.OffsetSize | |
Ord (Offset ty) | |
(PrimType ty, Ord ty) => Ord (UArray ty) | |
Ord s => Ord (CI s) | |
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) | |
Ord (Digest a) | |
Defined in Crypto.Hash.Types | |
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 (FlatDoc a) | |
Ord a => Ord (Attr a) | |
Ord a => Ord (Attributed a) | |
Defined in Text.DocLayout.Attributed | |
Ord a => Ord (NonEmpty a) | |
Ord a => Ord (Identity a) | |
Defined in GHC.Internal.Data.Functor.Identity | |
Ord a => Ord (Down a) | |
Ord a => Ord (Dual a) | |
Defined in GHC.Internal.Data.Semigroup.Internal | |
Ord a => Ord (Product a) | |
Defined in GHC.Internal.Data.Semigroup.Internal | |
Ord a => Ord (Sum a) | |
Ord (ForeignPtr a) | |
Defined in GHC.Internal.ForeignPtr | |
Ord a => Ord (ZipList a) | |
Ord p => Ord (Par1 p) | |
Ord (FunPtr a) | |
Defined in GHC.Internal.Ptr | |
Ord (Ptr a) | |
Integral a => Ord (Ratio a) | |
Ord (SNat n) | |
Ord a => Ord (Hashed a) | |
Defined in Data.Hashable.Class | |
Ord a => Ord (FastTree a) | |
Defined in Hledger.Data.Account | |
Ord lines => Ord (Border lines) | |
Defined in Hledger.Write.Spreadsheet | |
Ord a => Ord (AddrRange a) | |
Defined in Data.IP.Range | |
Ord e => Ord (ErrorFancy e) | |
Defined in Text.Megaparsec.Error | |
Ord t => Ord (ErrorItem t) | |
Defined in Text.Megaparsec.Error | |
Ord e => Ord (EF e) | |
Ord (Token s) => Ord (ET s) | |
Ord (RText l) | |
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 (CharMap a) | |
Ord (EnumSet e) | |
Ord (Url scheme) | |
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 (Stream a) | |
Defined in Data.Text.Internal.Fusion.Types | |
Ord a => Ord (HashSet a) | |
Ord string => Ord (UTF8 string) | |
Defined in Data.String.UTF8 | |
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 (Vector a) | |
Defined in Data.Vector.Strict | |
Ord a => Ord (Maybe a) | |
Ord a => Ord (Solo a) | |
Ord a => Ord [a] | |
Ord (Fixed a) | |
Ord a => Ord (Arg a b) | |
(Ord k, Ord v) => Ord (Map k v) | |
(Ord a, Ord1 f) => Ord (Free f a) | |
Defined in Control.Monad.Free | |
(Ord a, Ord b) => Ord (Either a b) | |
Defined in GHC.Internal.Data.Either | |
Ord (Proxy s) | |
Defined in GHC.Internal.Data.Proxy | |
Ord (TypeRep a) | |
Defined in GHC.Internal.Data.Typeable.Internal | |
Ord (U1 p) | |
Ord (V1 p) | |
Ord (ParseError Text HledgerParseErrorData) | |
Defined in Hledger.Utils.Parse 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 (EnumMap k a) | |
Defined in Data.IntMap.EnumMap2 | |
(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 GHC.Internal.Data.Semigroup.Internal | |
Ord (a :~: b) | |
Defined in GHC.Internal.Data.Type.Equality | |
(Generic1 f, Ord (Rep1 f a)) => Ord (Generically1 f a) | |
Defined in GHC.Internal.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.Internal.Generics | |
Ord (URec (Ptr ()) p) | |
Defined in GHC.Internal.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.Internal.Generics | |
Ord (URec Double p) | |
Defined in GHC.Internal.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.Internal.Generics | |
Ord (URec Int p) | |
Defined in GHC.Internal.Generics | |
Ord (URec Word p) | |
Defined in GHC.Internal.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 (f a), Ord (g a)) => Ord (Product f g a) | |
Defined in Data.Functor.Product Methods compare :: Product f g a -> Product f g a -> Ordering # (<) :: Product f g a -> Product f g a -> Bool # (<=) :: Product f g a -> Product f g a -> Bool # (>) :: Product f g a -> Product f g a -> Bool # (>=) :: Product f g a -> Product f g a -> Bool # | |
(Ord (f a), Ord (g a)) => Ord (Sum f g a) | |
Ord (a :~~: b) | |
Defined in GHC.Internal.Data.Type.Equality | |
(Ord (f p), Ord (g p)) => Ord ((f :*: g) p) | |
Defined in GHC.Internal.Generics | |
(Ord (f p), Ord (g p)) => Ord ((f :+: g) p) | |
Defined in GHC.Internal.Generics | |
Ord c => Ord (K1 i c p) | |
Defined in GHC.Internal.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.Internal.Generics | |
Ord (f p) => Ord (M1 i c f p) | |
Defined in GHC.Internal.Generics | |
(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) # |
embedFileRelative :: FilePath -> Q Exp #
intersperse :: a -> [a] -> [a] #
minimumDef :: Ord a => a -> [a] -> a #
Constructors
Group | |
Fields
|
Constructors
Mode | |
Fields
|
Constructors
ExitSuccess | |
ExitFailure Int |
Instances
NFData ExitCode | |||||
Defined in Control.DeepSeq | |||||
Exception ExitCode | |||||
Defined in GHC.Internal.IO.Exception Methods toException :: ExitCode -> SomeException fromException :: SomeException -> Maybe ExitCode displayException :: ExitCode -> String backtraceDesired :: ExitCode -> Bool | |||||
Generic ExitCode | |||||
Defined in GHC.Internal.IO.Exception Associated Types
| |||||
Read ExitCode | |||||
Defined in GHC.Internal.IO.Exception | |||||
Show ExitCode | |||||
Eq ExitCode | |||||
Ord ExitCode | |||||
Defined in GHC.Internal.IO.Exception | |||||
type Rep ExitCode | |||||
Defined in GHC.Internal.IO.Exception type Rep ExitCode = D1 ('MetaData "ExitCode" "GHC.Internal.IO.Exception" "ghc-internal" 'False) (C1 ('MetaCons "ExitSuccess" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ExitFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) |
expandArgsAt :: [String] -> IO [String] #
hIsTerminalDevice :: Handle -> IO Bool #
setupPager :: IO () #
takeFileName :: FilePath -> FilePath #
maybeToList :: Maybe a -> [a] #
data ReportOpts #
Constructors
ReportOpts | |
Fields
|
Instances
getXdgDirectory :: XdgDirectory -> FilePath -> IO FilePath #
data XdgDirectory #
Instances
doesFileExist :: FilePath -> IO Bool #
takeDirectory :: FilePath -> FilePath #
collectopts :: ((String, String) -> Maybe a) -> RawOpts -> [a] #
formatString :: Bool -> Maybe Int -> Maybe Int -> String -> String #
getModificationTime :: FilePath -> IO UTCTime #
getDirectoryContents :: FilePath -> IO [FilePath] #
splitFileName :: FilePath -> (String, String) #
readProcessWithExitCode :: FilePath -> [String] -> String -> IO (ExitCode, String, String) #
ghcDebugSupportedInLib :: Bool #
splitAtElement :: Eq a => a -> [a] -> [[a]] #
(!!) :: HasCallStack => [a] -> Int -> a #
cycle :: HasCallStack => [a] -> [a] #
head :: HasCallStack => [a] -> a #
init :: HasCallStack => [a] -> [a] #
last :: HasCallStack => [a] -> a #
tail :: HasCallStack => [a] -> [a] #
appendFile :: FilePath -> String -> IO () #
getContents :: IO String #
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 | |||||
Default Ordering | |||||
Defined in Data.Default.Internal | |||||
NFData Ordering | |||||
Defined in Control.DeepSeq | |||||
Monoid Ordering | |||||
Semigroup Ordering | |||||
Bounded Ordering | |||||
Defined in GHC.Internal.Enum | |||||
Enum Ordering | |||||
Defined in GHC.Internal.Enum | |||||
Generic Ordering | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Ix Ordering | |||||
Defined in GHC.Internal.Ix | |||||
Read Ordering | |||||
Defined in GHC.Internal.Read | |||||
Show Ordering | |||||
Eq Ordering | |||||
Ord Ordering | |||||
Defined in GHC.Classes | |||||
Hashable Ordering | |||||
Defined in Data.Hashable.Class | |||||
FromFormKey Ordering | |||||
Defined in Web.Internal.FormUrlEncoded Methods parseFormKey :: Text -> Either Text Ordering | |||||
ToFormKey Ordering | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
type Rep Ordering | |||||
Defined in GHC.Internal.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))) |
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 |
foldl1' :: HasCallStack => (a -> a -> a) -> [a] -> a #
class Monad m => MonadFail (m :: Type -> Type) where #
Instances
stripPrefix :: Eq a => [a] -> [a] -> Maybe [a] #
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 #
errorShortFormat :: a #
data FormatParse #
Constructors
FormatParse | |
Fields
|
type HasCallStack = ?callStack :: CallStack #
data CalendarDiffDays #
Constructors
CalendarDiffDays | |
Instances
FromJSON CalendarDiffDays | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON :: Value -> Parser CalendarDiffDays parseJSONList :: Value -> Parser [CalendarDiffDays] | |
ToJSON CalendarDiffDays | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON :: CalendarDiffDays -> Value toEncoding :: CalendarDiffDays -> Encoding toJSONList :: [CalendarDiffDays] -> Value toEncodingList :: [CalendarDiffDays] -> Encoding omitField :: CalendarDiffDays -> Bool | |
NFData CalendarDiffDays | |
Defined in Data.Time.Calendar.CalendarDiffDays Methods rnf :: CalendarDiffDays -> () | |
Monoid CalendarDiffDays | |
Defined in Data.Time.Calendar.CalendarDiffDays Methods mappend :: CalendarDiffDays -> CalendarDiffDays -> CalendarDiffDays mconcat :: [CalendarDiffDays] -> CalendarDiffDays | |
Semigroup CalendarDiffDays | |
Defined in Data.Time.Calendar.CalendarDiffDays Methods (<>) :: CalendarDiffDays -> CalendarDiffDays -> CalendarDiffDays sconcat :: NonEmpty CalendarDiffDays -> CalendarDiffDays stimes :: Integral b => b -> CalendarDiffDays -> CalendarDiffDays | |
Data CalendarDiffDays | |
Defined in Data.Time.Calendar.CalendarDiffDays Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CalendarDiffDays -> c CalendarDiffDays gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CalendarDiffDays toConstr :: CalendarDiffDays -> Constr dataTypeOf :: CalendarDiffDays -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CalendarDiffDays) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CalendarDiffDays) gmapT :: (forall b. Data b => b -> b) -> CalendarDiffDays -> CalendarDiffDays gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffDays -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffDays -> r gmapQ :: (forall d. Data d => d -> u) -> CalendarDiffDays -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> CalendarDiffDays -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays | |
Show CalendarDiffDays | |
Defined in Data.Time.Calendar.CalendarDiffDays Methods showsPrec :: Int -> CalendarDiffDays -> ShowS show :: CalendarDiffDays -> String showList :: [CalendarDiffDays] -> ShowS | |
Eq CalendarDiffDays | |
Defined in Data.Time.Calendar.CalendarDiffDays Methods (==) :: CalendarDiffDays -> CalendarDiffDays -> Bool (/=) :: CalendarDiffDays -> CalendarDiffDays -> Bool | |
ISO8601 CalendarDiffDays | |
Defined in Data.Time.Format.ISO8601 Methods iso8601Format :: Format CalendarDiffDays | |
type Rep CalendarDiffDays | |
Defined in Data.Time.Orphans type Rep CalendarDiffDays = D1 ('MetaData "CalendarDiffDays" "Data.Time.Calendar.CalendarDiffDays" "time-1.12.2-f6eb" 'False) (C1 ('MetaCons "CalendarDiffDays" 'PrefixI 'True) (S1 ('MetaSel ('Just "cdMonths") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer) :*: S1 ('MetaSel ('Just "cdDays") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer))) |
scaleCalendarDiffDays :: Integer -> CalendarDiffDays -> CalendarDiffDays #
class Ord p => DayPeriod p where #
Instances
DayPeriod Day | |
Defined in Data.Time.Calendar.Days | |
DayPeriod Month | |
Defined in Data.Time.Calendar.Month | |
DayPeriod Quarter | |
Defined in Data.Time.Calendar.Quarter |
Constructors
DayPeriod Day | |
WeekPeriod Day | |
MonthPeriod Year Month | |
QuarterPeriod Year Quarter | |
YearPeriod Year | |
PeriodBetween Day Day | |
PeriodFrom Day | |
PeriodTo Day | |
PeriodAll |
Instances
Default Period | |||||
Defined in Hledger.Data.Types | |||||
Generic Period | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
Show Period | |||||
Eq Period | |||||
Ord Period | |||||
type Rep Period | |||||
Defined in Hledger.Data.Types type Rep Period = D1 ('MetaData "Period" "Hledger.Data.Types" "hledger-lib-1.43.1-15iVJWaizG8awuHeVEPAe" 'False) (((C1 ('MetaCons "DayPeriod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Day)) :+: C1 ('MetaCons "WeekPeriod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Day))) :+: (C1 ('MetaCons "MonthPeriod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Year) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Month)) :+: C1 ('MetaCons "QuarterPeriod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Year) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Quarter)))) :+: ((C1 ('MetaCons "YearPeriod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Year)) :+: C1 ('MetaCons "PeriodBetween" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Day) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Day))) :+: (C1 ('MetaCons "PeriodFrom" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Day)) :+: (C1 ('MetaCons "PeriodTo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Day)) :+: C1 ('MetaCons "PeriodAll" 'PrefixI 'False) (U1 :: Type -> Type))))) |
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 #
pattern YearMonthDay :: Year -> MonthOfYear -> DayOfMonth -> Day #
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 #
showGregorian :: Day -> String #
isLeapYear :: Year -> Bool #
pattern April :: MonthOfYear #
pattern August :: MonthOfYear #
pattern BeforeCommonEra :: Integer -> Year #
type DayOfMonth = Int #
pattern December :: MonthOfYear #
pattern February :: MonthOfYear #
pattern January :: MonthOfYear #
pattern July :: MonthOfYear #
pattern June :: MonthOfYear #
pattern March :: MonthOfYear #
pattern May :: MonthOfYear #
type MonthOfYear = Int #
pattern November :: MonthOfYear #
pattern October :: MonthOfYear #
pattern September :: MonthOfYear #
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 | |
NFData DayOfWeek | |
Defined in Data.Time.Calendar.Week | |
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 | |
Eq DayOfWeek | |
Ord DayOfWeek | |
dayOfWeekDiff :: DayOfWeek -> DayOfWeek -> Int #
firstDayOfWeekOnAfter :: DayOfWeek -> Day -> Day #
weekAllDays :: DayOfWeek -> Day -> [Day] #
weekFirstDay :: DayOfWeek -> Day -> Day #
weekLastDay :: DayOfWeek -> Day -> Day #
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 | |
NFData DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime | |
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 | |
Eq DiffTime | |
Ord DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime |
diffTimeToPicoseconds :: DiffTime -> Integer #
picosecondsToDiffTime :: Integer -> DiffTime #
secondsToDiffTime :: Integer -> DiffTime #
data NominalDiffTime #
Instances
nominalDiffTimeToSeconds :: NominalDiffTime -> Pico #
secondsToNominalDiffTime :: Pico -> NominalDiffTime #
addUTCTime :: NominalDiffTime -> UTCTime -> UTCTime #
diffUTCTime :: UTCTime -> UTCTime -> NominalDiffTime #
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 | |
NFData UTCTime | |
Defined in Data.Time.Clock.Internal.UTCTime | |
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 | |
Eq UTCTime | |
Ord UTCTime | |
Defined in Data.Time.Clock.Internal.UTCTime | |
FromFormKey UTCTime | |
Defined in Web.Internal.FormUrlEncoded Methods parseFormKey :: Text -> Either Text UTCTime | |
ToFormKey UTCTime | |
Defined in Web.Internal.FormUrlEncoded | |
ISO8601 UTCTime | |
Defined in Data.Time.Format.ISO8601 Methods iso8601Format :: Format UTCTime | |
type Rep UTCTime | |
Defined in Data.Time.Orphans type Rep UTCTime = D1 ('MetaData "UTCTime" "Data.Time.Clock.Internal.UTCTime" "time-1.12.2-f6eb" 'False) (C1 ('MetaCons "UTCTime" 'PrefixI 'True) (S1 ('MetaSel ('Just "utctDay") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day) :*: S1 ('MetaSel ('Just "utctDayTime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DiffTime))) |
newtype UniversalTime #
Constructors
ModJulianDate | |
Fields
|
Instances
NFData UniversalTime | |
Defined in Data.Time.Clock.Internal.UniversalTime Methods rnf :: UniversalTime -> () | |
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 | |
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 # | |
type Rep UniversalTime | |
Defined in Data.Time.Orphans type Rep UniversalTime = D1 ('MetaData "UniversalTime" "Data.Time.Clock.Internal.UniversalTime" "time-1.12.2-f6eb" 'True) (C1 ('MetaCons "ModJulianDate" 'PrefixI 'True) (S1 ('MetaSel ('Just "getModJulianDate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Rational))) |
getCurrentTime :: IO UTCTime #
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 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 # |
iso8601DateFormat :: Maybe String -> String #
rfc822DateFormat :: String #
parseTimeM :: (MonadFail m, ParseTime t) => Bool -> TimeLocale -> String -> String -> m t #
parseTimeMultipleM :: (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 #
data CalendarDiffTime #
Constructors
CalendarDiffTime | |
Fields
|
Instances
FromJSON CalendarDiffTime | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON :: Value -> Parser CalendarDiffTime parseJSONList :: Value -> Parser [CalendarDiffTime] | |
ToJSON CalendarDiffTime | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON :: CalendarDiffTime -> Value toEncoding :: CalendarDiffTime -> Encoding toJSONList :: [CalendarDiffTime] -> Value toEncodingList :: [CalendarDiffTime] -> Encoding omitField :: CalendarDiffTime -> Bool | |
NFData CalendarDiffTime | |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime Methods rnf :: CalendarDiffTime -> () | |
Monoid CalendarDiffTime | |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime Methods mappend :: CalendarDiffTime -> CalendarDiffTime -> CalendarDiffTime mconcat :: [CalendarDiffTime] -> CalendarDiffTime | |
Semigroup CalendarDiffTime | |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime Methods (<>) :: CalendarDiffTime -> CalendarDiffTime -> CalendarDiffTime sconcat :: NonEmpty CalendarDiffTime -> CalendarDiffTime stimes :: Integral b => b -> CalendarDiffTime -> CalendarDiffTime | |
Data CalendarDiffTime | |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CalendarDiffTime -> c CalendarDiffTime gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CalendarDiffTime toConstr :: CalendarDiffTime -> Constr dataTypeOf :: CalendarDiffTime -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CalendarDiffTime) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CalendarDiffTime) gmapT :: (forall b. Data b => b -> b) -> CalendarDiffTime -> CalendarDiffTime gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffTime -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffTime -> r gmapQ :: (forall d. Data d => d -> u) -> CalendarDiffTime -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> CalendarDiffTime -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime | |
Show CalendarDiffTime | |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime Methods showsPrec :: Int -> CalendarDiffTime -> ShowS show :: CalendarDiffTime -> String showList :: [CalendarDiffTime] -> ShowS | |
Eq CalendarDiffTime | |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime Methods (==) :: CalendarDiffTime -> CalendarDiffTime -> Bool (/=) :: CalendarDiffTime -> CalendarDiffTime -> Bool | |
ISO8601 CalendarDiffTime | |
Defined in Data.Time.Format.ISO8601 Methods iso8601Format :: Format CalendarDiffTime | |
type Rep CalendarDiffTime | |
Defined in Data.Time.Orphans type Rep CalendarDiffTime = D1 ('MetaData "CalendarDiffTime" "Data.Time.LocalTime.Internal.CalendarDiffTime" "time-1.12.2-f6eb" 'False) (C1 ('MetaCons "CalendarDiffTime" 'PrefixI 'True) (S1 ('MetaSel ('Just "ctMonths") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer) :*: S1 ('MetaSel ('Just "ctTime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NominalDiffTime))) |
scaleCalendarDiffTime :: Integer -> CalendarDiffTime -> CalendarDiffTime #
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 | |
NFData LocalTime | |
Defined in Data.Time.LocalTime.Internal.LocalTime | |
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 | |
Eq LocalTime | |
Ord LocalTime | |
Defined in Data.Time.LocalTime.Internal.LocalTime | |
FromFormKey LocalTime | |
Defined in Web.Internal.FormUrlEncoded Methods parseFormKey :: Text -> Either Text LocalTime | |
ToFormKey LocalTime | |
Defined in Web.Internal.FormUrlEncoded | |
ISO8601 LocalTime | |
Defined in Data.Time.Format.ISO8601 Methods iso8601Format :: Format LocalTime | |
type Rep LocalTime | |
Defined in Data.Time.Orphans type Rep LocalTime = D1 ('MetaData "LocalTime" "Data.Time.LocalTime.Internal.LocalTime" "time-1.12.2-f6eb" 'False) (C1 ('MetaCons "LocalTime" 'PrefixI 'True) (S1 ('MetaSel ('Just "localDay") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day) :*: S1 ('MetaSel ('Just "localTimeOfDay") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TimeOfDay))) |
addLocalTime :: NominalDiffTime -> LocalTime -> LocalTime #
diffLocalTime :: LocalTime -> LocalTime -> NominalDiffTime #
localTimeToUT1 :: Rational -> LocalTime -> UniversalTime #
localTimeToUTC :: TimeZone -> LocalTime -> UTCTime #
ut1ToLocalTime :: Rational -> UniversalTime -> LocalTime #
utcToLocalTime :: TimeZone -> UTCTime -> LocalTime #
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 | |
NFData TimeOfDay | |
Defined in Data.Time.LocalTime.Internal.TimeOfDay | |
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 | |
Eq TimeOfDay | |
Ord TimeOfDay | |
Defined in Data.Time.LocalTime.Internal.TimeOfDay | |
ISO8601 TimeOfDay | |
Defined in Data.Time.Format.ISO8601 Methods iso8601Format :: Format TimeOfDay | |
type Rep TimeOfDay | |
Defined in Data.Time.Orphans type Rep TimeOfDay = D1 ('MetaData "TimeOfDay" "Data.Time.LocalTime.Internal.TimeOfDay" "time-1.12.2-f6eb" 'False) (C1 ('MetaCons "TimeOfDay" 'PrefixI 'True) (S1 ('MetaSel ('Just "todHour") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: (S1 ('MetaSel ('Just "todMin") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "todSec") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pico)))) |
dayFractionToTimeOfDay :: Rational -> TimeOfDay #
daysAndTimeOfDayToTime :: Integer -> TimeOfDay -> NominalDiffTime #
localToUTCTimeOfDay :: TimeZone -> TimeOfDay -> (Integer, TimeOfDay) #
makeTimeOfDayValid :: Int -> Int -> Pico -> Maybe TimeOfDay #
pastMidnight :: DiffTime -> TimeOfDay #
sinceMidnight :: TimeOfDay -> DiffTime #
timeOfDayToDayFraction :: TimeOfDay -> Rational #
timeOfDayToTime :: TimeOfDay -> DiffTime #
timeToDaysAndTimeOfDay :: NominalDiffTime -> (Integer, TimeOfDay) #
timeToTimeOfDay :: DiffTime -> TimeOfDay #
utcToLocalTimeOfDay :: TimeZone -> TimeOfDay -> (Integer, TimeOfDay) #
Constructors
TimeZone | |
Fields
|
Instances
NFData TimeZone | |
Defined in Data.Time.LocalTime.Internal.TimeZone | |
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 | |
Eq TimeZone | |
Ord TimeZone | |
Defined in Data.Time.LocalTime.Internal.TimeZone | |
ISO8601 TimeZone | |
Defined in Data.Time.Format.ISO8601 Methods iso8601Format :: Format TimeZone | |
type Rep TimeZone | |
Defined in Data.Time.Orphans type Rep TimeZone = D1 ('MetaData "TimeZone" "Data.Time.LocalTime.Internal.TimeZone" "time-1.12.2-f6eb" 'False) (C1 ('MetaCons "TimeZone" 'PrefixI 'True) (S1 ('MetaSel ('Just "timeZoneMinutes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: (S1 ('MetaSel ('Just "timeZoneSummerOnly") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "timeZoneName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))) |
getTimeZone :: UTCTime -> IO TimeZone #
hoursToTimeZone :: Int -> TimeZone #
minutesToTimeZone :: Int -> TimeZone #
timeZoneOffsetString :: TimeZone -> String #
timeZoneOffsetString' :: Maybe Char -> TimeZone -> String #
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 | |
NFData ZonedTime | |
Defined in Data.Time.LocalTime.Internal.ZonedTime | |
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 | |
FromFormKey ZonedTime | |
Defined in Web.Internal.FormUrlEncoded Methods parseFormKey :: Text -> Either Text ZonedTime | |
ToFormKey ZonedTime | |
Defined in Web.Internal.FormUrlEncoded | |
ISO8601 ZonedTime | |
Defined in Data.Time.Format.ISO8601 Methods iso8601Format :: Format ZonedTime | |
type Rep ZonedTime | |
Defined in Data.Time.Orphans type Rep ZonedTime = D1 ('MetaData "ZonedTime" "Data.Time.LocalTime.Internal.ZonedTime" "time-1.12.2-f6eb" 'False) (C1 ('MetaCons "ZonedTime" 'PrefixI 'True) (S1 ('MetaSel ('Just "zonedTimeToLocalTime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LocalTime) :*: S1 ('MetaSel ('Just "zonedTimeZone") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TimeZone))) |
getZonedTime :: IO ZonedTime #
utcToLocalZonedTime :: UTCTime -> IO ZonedTime #
utcToZonedTime :: TimeZone -> UTCTime -> ZonedTime #
zonedTimeToUTC :: ZonedTime -> UTCTime #
listToMaybe :: [a] -> Maybe a #
makeAbsolute :: FilePath -> IO FilePath #
data AmountFormat #
Constructors
AmountFormat | |
Fields
|
Instances
Default AmountFormat | |
Defined in Hledger.Data.Amount Methods def :: AmountFormat | |
Show AmountFormat | |
Defined in Hledger.Data.Amount Methods showsPrec :: Int -> AmountFormat -> ShowS show :: AmountFormat -> String showList :: [AmountFormat] -> ShowS |
showMixedAmountB :: AmountFormat -> MixedAmount -> WideBuilder #
showMixedAmountLinesPartsB :: AmountFormat -> MixedAmount -> [(WideBuilder, Amount)] #
unifyMixedAmount :: MixedAmount -> Maybe Amount #
Constructors
Amount | |
Fields
|
Instances
NFData Amount | |||||
Defined in Hledger.Data.Types | |||||
Generic Amount | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" '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 "acost") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe AmountCost))))) |
data MixedAmount #
Instances
NFData MixedAmount | |||||
Defined in Hledger.Data.Types Methods rnf :: MixedAmount -> () | |||||
Generic MixedAmount | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" 'True) (C1 ('MetaCons "Mixed" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map MixedAmountKey Amount)))) |
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 Total = MixedAmount #
amounts :: MixedAmount -> [Amount] #
post :: AccountName -> Amount -> Posting #
ansiFormatError :: String -> String #
ansiFormatWarning :: String -> String #
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 #
colorB :: ColorIntensity -> Color -> WideBuilder -> WideBuilder #
colorOption :: IO YNA #
exitOnError :: IO () -> IO () #
exitWithErrorMessage :: String -> IO () #
expandHomePath :: FilePath -> IO FilePath #
getHomeSafe :: IO (Maybe FilePath) #
getTerminalHeight :: IO (Maybe Int) #
getTerminalHeightWidth :: IO (Maybe (Int, Int)) #
getTerminalWidth :: IO (Maybe Int) #
inputToHandle :: Text -> IO Handle #
openFileOrStdin :: String -> IO Handle #
printError :: String -> IO () #
readFileOrStdinPortably :: String -> IO Text #
readFileOrStdinPortably' :: Maybe DynEncoding -> String -> IO Text #
readFilePortably :: FilePath -> IO Text #
readFileStrictly :: FilePath -> IO Text #
readHandlePortably :: Handle -> IO Text #
sgrresetall :: String #
sortByModTime :: [FilePath] -> IO [FilePath] #
terminalBgColor :: Maybe (RGB Float) #
terminalFgColor :: Maybe (RGB Float) #
terminalIsLight :: Maybe Bool #
terminalLightness :: Maybe Float #
usageError :: String -> a #
useColorOnStderr :: IO Bool #
useColorOnStderrUnsafe :: Bool #
useColorOnStdout :: IO Bool #
useColorOnStdoutUnsafe :: Bool #
isPathSeparator :: Char -> Bool #
data TextEncoding #
Instances
Show TextEncoding | |
Defined in GHC.Internal.IO.Encoding.Types Methods showsPrec :: Int -> TextEncoding -> ShowS show :: TextEncoding -> String showList :: [TextEncoding] -> ShowS |
Instances
Show Handle | |
Eq Handle | |
ByteSink (ReaderT Handle IO) | |
Defined in Data.Encoding.ByteSink Methods pushWord8 :: Word8 -> ReaderT Handle IO () pushWord16be :: Word16 -> ReaderT Handle IO () pushWord16le :: Word16 -> ReaderT Handle IO () pushWord32be :: Word32 -> ReaderT Handle IO () pushWord32le :: Word32 -> ReaderT Handle IO () pushWord64be :: Word64 -> ReaderT Handle IO () pushWord64le :: Word64 -> ReaderT Handle IO () | |
ByteSource (ReaderT Handle IO) | |
Defined in Data.Encoding.ByteSource Methods sourceEmpty :: ReaderT Handle IO Bool fetchWord8 :: ReaderT Handle IO Word8 fetchAhead :: ReaderT Handle IO (Maybe a) -> ReaderT Handle IO (Maybe a) fetchWord16be :: ReaderT Handle IO Word16 fetchWord16le :: ReaderT Handle IO Word16 fetchWord32be :: ReaderT Handle IO Word32 fetchWord32le :: ReaderT Handle IO Word32 fetchWord64be :: ReaderT Handle IO Word64 fetchWord64le :: ReaderT Handle IO Word64 |
Constructors
ReadMode | |
WriteMode | |
AppendMode | |
ReadWriteMode |
Instances
Enum IOMode | |
Defined in GHC.Internal.IO.IOMode | |
Ix IOMode | |
Read IOMode | |
Defined in GHC.Internal.IO.IOMode | |
Show IOMode | |
Eq IOMode | |
Ord IOMode | |
Instances
Read Newline | |
Defined in GHC.Internal.IO.Handle.Types | |
Show Newline | |
Eq Newline | |
Ord Newline | |
Defined in GHC.Internal.IO.Handle.Types |
wbFromText :: Text -> WideBuilder #
wbToText :: WideBuilder -> Text #
wbUnpack :: WideBuilder -> String #
escapeBackslash :: Text -> Text #
escapeDoubleQuotes :: Text -> Text #
linesPrepend :: Text -> Text -> Text #
readDecimal :: Text -> Integer #
stripquotes :: Text -> Text #
tests_Text :: TestTree #
textCapitalise :: Text -> Text #
textConcatBottomPadded :: [Text] -> Text #
textConcatTopPadded :: [Text] -> Text #
textElideRight :: Int -> Text -> Text #
textQuoteIfNeeded :: Text -> Text #
textTakeWidth :: Int -> Text -> Text #
textUnbracket :: Text -> Text #
dateSpanAsPeriod :: DateSpan -> Period #
periodAsDateSpan :: Period -> DateSpan #
showPeriod :: Period -> Text #
showPeriodAbbrev :: Period -> Text #
Constructors
NoInterval | |
Days Int | |
Weeks Int | |
Months Int | |
Quarters Int | |
Years Int | |
NthWeekdayOfMonth Int Int | |
MonthDay Int | |
MonthAndDay Int Int | |
DaysOfWeek [Int] |
Instances
Default Interval | |||||
Defined in Hledger.Data.Types | |||||
NFData Interval | |||||
Defined in Hledger.Data.Types | |||||
Generic Interval | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
Show Interval | |||||
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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (((C1 ('MetaCons "NoInterval" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Days" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int))) :+: (C1 ('MetaCons "Weeks" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int)) :+: (C1 ('MetaCons "Months" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int)) :+: C1 ('MetaCons "Quarters" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int))))) :+: ((C1 ('MetaCons "Years" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int)) :+: C1 ('MetaCons "NthWeekdayOfMonth" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int))) :+: (C1 ('MetaCons "MonthDay" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int)) :+: (C1 ('MetaCons "MonthAndDay" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int)) :+: C1 ('MetaCons "DaysOfWeek" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Int])))))) |
Instances
NFData EFDay | |||||
Defined in Hledger.Data.Types | |||||
Generic EFDay | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "Exact" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Day)) :+: C1 ('MetaCons "Flex" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Day))) |
Constructors
SmartCompleteDate Day | |
SmartAssumeStart Year (Maybe Month) | |
SmartFromReference (Maybe Month) MonthDay | |
SmartMonth Month | |
SmartRelative Integer SmartInterval |
type HledgerParseErrors = ParseErrorBundle Text HledgerParseErrorData #
type TextParser (m :: Type -> Type) a = ParsecT HledgerParseErrorData Text m a #
choice' :: forall (m :: Type -> Type) a. [TextParser m a] -> TextParser m a #
customErrorBundlePretty :: HledgerParseErrors -> String #
skipNonNewlineSpaces :: forall s (m :: Type -> Type). (Stream s, Token s ~ Char) => ParsecT HledgerParseErrorData s m () #
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) #
periodContainsDate :: Period -> Day -> Bool #
periodexprp :: forall (m :: Type -> Type). Day -> TextParser m (Interval, DateSpan) #
showDateSpanAbbrev :: DateSpan -> Text #
showDateSpanDebug :: DateSpan -> String #
showEFDate :: EFDay -> Text #
smartdate :: forall (m :: Type -> Type). TextParser m SmartDate #
spanContainsDate :: DateSpan -> Day -> Bool #
spanDefaultsFrom :: DateSpan -> DateSpan -> DateSpan #
spanEndYear :: DateSpan -> Maybe Year #
spanExtend :: DateSpan -> DateSpan -> DateSpan #
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 #
data HledgerParseErrorData #
Instances
isNonNewlineSpace :: Char -> Bool #
Constructors
SourcePos | |
Fields
|
Instances
NFData SourcePos | |||||
Defined in Text.Megaparsec.Pos | |||||
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 | |||||
Defined in Text.Megaparsec.Pos Associated Types
| |||||
Read SourcePos | |||||
Defined in Text.Megaparsec.Pos | |||||
Show SourcePos | |||||
Eq SourcePos | |||||
Ord SourcePos | |||||
type Rep SourcePos | |||||
Defined in Text.Megaparsec.Pos type Rep SourcePos = D1 ('MetaData "SourcePos" "Text.Megaparsec.Pos" "megaparsec-9.6.1-EHPJd9j25WwAfWQlTkpKQ5" '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)))) |
simplifyPeriod :: Period -> Period #
Instances
ToJSON Regexp | |
Defined in Hledger.Utils.Regex Methods toEncoding :: Regexp -> Encoding toJSONList :: [Regexp] -> Value toEncodingList :: [Regexp] -> Encoding | |
NFData Regexp | |
Defined in Hledger.Utils.Regex | |
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 #
data AccountAlias #
Constructors
BasicAlias AccountName AccountName | |
RegexAlias Regexp Replacement |
Instances
NFData AccountAlias | |||||
Defined in Hledger.Data.Types Methods rnf :: AccountAlias -> () | |||||
Generic AccountAlias | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "BasicAlias" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 AccountName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 AccountName)) :+: C1 ('MetaCons "RegexAlias" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Regexp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Replacement))) |
data AccountDeclarationInfo #
Constructors
AccountDeclarationInfo | |
Fields
|
Instances
NFData AccountDeclarationInfo | |||||
Defined in Hledger.Data.Types Methods rnf :: AccountDeclarationInfo -> () | |||||
Generic AccountDeclarationInfo | |||||
Defined in Hledger.Data.Types Associated Types
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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "AccountDeclarationInfo" 'PrefixI 'True) ((S1 ('MetaSel ('Just "adicomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "aditags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Tag])) :*: (S1 ('MetaSel ('Just "adideclarationorder") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Just "adisourcepos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 SourcePos)))) |
data AccountType #
Instances
NFData AccountType | |||||
Defined in Hledger.Data.Types Methods rnf :: AccountType -> () | |||||
Generic AccountType | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" '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
Account | |
Fields
|
Instances
Generic Account | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
type Rep Account | |||||
Defined in Hledger.Data.Types type Rep Account = D1 ('MetaData "Account" "Hledger.Data.Types" "hledger-lib-1.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "Account" 'PrefixI 'True) (((S1 ('MetaSel ('Just "aname") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 AccountName) :*: S1 ('MetaSel ('Just "adeclarationinfo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe AccountDeclarationInfo))) :*: (S1 ('MetaSel ('Just "asubs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Account]) :*: S1 ('MetaSel ('Just "aparent") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe Account)))) :*: ((S1 ('MetaSel ('Just "aboring") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Bool) :*: S1 ('MetaSel ('Just "anumpostings") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int)) :*: (S1 ('MetaSel ('Just "aebalance") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 MixedAmount) :*: S1 ('MetaSel ('Just "aibalance") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 MixedAmount))))) |
data AmountCost #
Instances
NFData AmountCost | |||||
Defined in Hledger.Data.Types Methods rnf :: AmountCost -> () | |||||
Generic AmountCost | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
Show AmountCost | |||||
Defined in Hledger.Data.Types Methods showsPrec :: Int -> AmountCost -> ShowS show :: AmountCost -> String showList :: [AmountCost] -> ShowS | |||||
Eq AmountCost | |||||
Defined in Hledger.Data.Types | |||||
Ord AmountCost | |||||
Defined in Hledger.Data.Types Methods compare :: AmountCost -> AmountCost -> Ordering # (<) :: AmountCost -> AmountCost -> Bool # (<=) :: AmountCost -> AmountCost -> Bool # (>) :: AmountCost -> AmountCost -> Bool # (>=) :: AmountCost -> AmountCost -> Bool # max :: AmountCost -> AmountCost -> AmountCost # min :: AmountCost -> AmountCost -> AmountCost # | |||||
type Rep AmountCost | |||||
Defined in Hledger.Data.Types type Rep AmountCost = D1 ('MetaData "AmountCost" "Hledger.Data.Types" "hledger-lib-1.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "UnitCost" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Amount)) :+: C1 ('MetaCons "TotalCost" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Amount))) |
data AmountPrecision #
Constructors
Precision !Word8 | |
NaturalPrecision |
Instances
NFData AmountPrecision | |||||
Defined in Hledger.Data.Types Methods rnf :: AmountPrecision -> () | |||||
Generic AmountPrecision | |||||
Defined in Hledger.Data.Types Associated Types
Methods from :: AmountPrecision -> Rep AmountPrecision x to :: Rep AmountPrecision x -> AmountPrecision | |||||
Read AmountPrecision | |||||
Defined in Hledger.Data.Types Methods readsPrec :: Int -> ReadS AmountPrecision readList :: ReadS [AmountPrecision] readPrec :: ReadPrec AmountPrecision readListPrec :: ReadPrec [AmountPrecision] | |||||
Show AmountPrecision | |||||
Defined in Hledger.Data.Types Methods showsPrec :: Int -> AmountPrecision -> ShowS show :: AmountPrecision -> String showList :: [AmountPrecision] -> ShowS | |||||
Eq AmountPrecision | |||||
Defined in Hledger.Data.Types Methods (==) :: AmountPrecision -> AmountPrecision -> Bool (/=) :: AmountPrecision -> AmountPrecision -> Bool | |||||
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 # | |||||
type Rep AmountPrecision | |||||
Defined in Hledger.Data.Types type Rep AmountPrecision = D1 ('MetaData "AmountPrecision" "Hledger.Data.Types" "hledger-lib-1.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "Precision" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Word8)) :+: C1 ('MetaCons "NaturalPrecision" 'PrefixI 'False) (U1 :: Type -> Type)) |
data AmountStyle #
Constructors
AmountStyle | |
Fields
|
Instances
NFData AmountStyle | |||||
Defined in Hledger.Data.Types Methods rnf :: AmountStyle -> () | |||||
Generic AmountStyle | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" '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
NFData BalanceAssertion | |||||
Defined in Hledger.Data.Types Methods rnf :: BalanceAssertion -> () | |||||
Generic BalanceAssertion | |||||
Defined in Hledger.Data.Types Associated Types
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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "BalanceAssertion" 'PrefixI 'True) ((S1 ('MetaSel ('Just "baamount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Amount) :*: S1 ('MetaSel ('Just "batotal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "bainclusive") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Bool) :*: S1 ('MetaSel ('Just "baposition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 SourcePos)))) |
Constructors
Commodity | |
Fields |
Instances
NFData Commodity | |||||
Defined in Hledger.Data.Types | |||||
Generic Commodity | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
Show Commodity | |||||
Eq Commodity | |||||
type Rep Commodity | |||||
Defined in Hledger.Data.Types type Rep Commodity = D1 ('MetaData "Commodity" "Hledger.Data.Types" "hledger-lib-1.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "Commodity" 'PrefixI 'True) (S1 ('MetaSel ('Just "csymbol") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 CommoditySymbol) :*: S1 ('MetaSel ('Just "cformat") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe AmountStyle)))) |
data DigitGroupStyle #
Constructors
DigitGroups !Char ![Word8] |
Instances
NFData DigitGroupStyle | |||||
Defined in Hledger.Data.Types Methods rnf :: DigitGroupStyle -> () | |||||
Generic DigitGroupStyle | |||||
Defined in Hledger.Data.Types Associated Types
Methods from :: DigitGroupStyle -> Rep DigitGroupStyle x to :: Rep DigitGroupStyle x -> DigitGroupStyle | |||||
Read DigitGroupStyle | |||||
Defined in Hledger.Data.Types Methods readsPrec :: Int -> ReadS DigitGroupStyle readList :: ReadS [DigitGroupStyle] readPrec :: ReadPrec DigitGroupStyle readListPrec :: ReadPrec [DigitGroupStyle] | |||||
Show DigitGroupStyle | |||||
Defined in Hledger.Data.Types Methods showsPrec :: Int -> DigitGroupStyle -> ShowS show :: DigitGroupStyle -> String showList :: [DigitGroupStyle] -> ShowS | |||||
Eq DigitGroupStyle | |||||
Defined in Hledger.Data.Types Methods (==) :: DigitGroupStyle -> DigitGroupStyle -> Bool (/=) :: DigitGroupStyle -> DigitGroupStyle -> Bool | |||||
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 # | |||||
type Rep DigitGroupStyle | |||||
Defined in Hledger.Data.Types type Rep DigitGroupStyle = D1 ('MetaData "DigitGroupStyle" "Hledger.Data.Types" "hledger-lib-1.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "DigitGroups" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Char) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Word8]))) |
Constructors
Instances
NFData Journal | |||||
Defined in Hledger.Data.Types | |||||
Generic Journal | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "Journal" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "jparsedefaultyear") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe Year)) :*: (S1 ('MetaSel ('Just "jparsedefaultcommodity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe (CommoditySymbol, AmountStyle))) :*: S1 ('MetaSel ('Just "jparsedecimalmark") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe DecimalMark)))) :*: (S1 ('MetaSel ('Just "jparseparentaccounts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [AccountName]) :*: (S1 ('MetaSel ('Just "jparsealiases") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [AccountAlias]) :*: S1 ('MetaSel ('Just "jparsetimeclockentries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [TimeclockEntry])))) :*: ((S1 ('MetaSel ('Just "jincludefilestack") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [FilePath]) :*: (S1 ('MetaSel ('Just "jdeclaredpayees") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [(Payee, PayeeDeclarationInfo)]) :*: S1 ('MetaSel ('Just "jdeclaredtags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [(TagName, TagDeclarationInfo)]))) :*: (S1 ('MetaSel ('Just "jdeclaredaccounts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [(AccountName, AccountDeclarationInfo)]) :*: (S1 ('MetaSel ('Just "jdeclaredaccounttags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Map AccountName [Tag])) :*: S1 ('MetaSel ('Just "jdeclaredaccounttypes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Map AccountType [AccountName])))))) :*: (((S1 ('MetaSel ('Just "jaccounttypes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Map AccountName AccountType)) :*: (S1 ('MetaSel ('Just "jdeclaredcommodities") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Map CommoditySymbol Commodity)) :*: S1 ('MetaSel ('Just "jinferredcommoditystyles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Map CommoditySymbol AmountStyle)))) :*: (S1 ('MetaSel ('Just "jglobalcommoditystyles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Map CommoditySymbol AmountStyle)) :*: (S1 ('MetaSel ('Just "jpricedirectives") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [PriceDirective]) :*: S1 ('MetaSel ('Just "jinferredmarketprices") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [MarketPrice])))) :*: ((S1 ('MetaSel ('Just "jtxnmodifiers") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [TransactionModifier]) :*: (S1 ('MetaSel ('Just "jperiodictxns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [PeriodicTransaction]) :*: S1 ('MetaSel ('Just "jtxns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Transaction]))) :*: (S1 ('MetaSel ('Just "jfinalcommentlines") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: (S1 ('MetaSel ('Just "jfiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [(FilePath, Text)]) :*: S1 ('MetaSel ('Just "jlastreadtime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 POSIXTime))))))) |
Instances
Generic Ledger | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
type Rep Ledger | |||||
Defined in Hledger.Data.Types type Rep Ledger = D1 ('MetaData "Ledger" "Hledger.Data.Types" "hledger-lib-1.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "Ledger" 'PrefixI 'True) (S1 ('MetaSel ('Just "ljournal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Journal) :*: S1 ('MetaSel ('Just "laccounts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Account]))) |
data MarketPrice #
Constructors
MarketPrice | |
Fields
|
Instances
NFData MarketPrice | |||||
Defined in Hledger.Data.Types Methods rnf :: MarketPrice -> () | |||||
Generic MarketPrice | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "MarketPrice" 'PrefixI 'True) ((S1 ('MetaSel ('Just "mpdate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Day) :*: S1 ('MetaSel ('Just "mpfrom") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 CommoditySymbol)) :*: (S1 ('MetaSel ('Just "mpto") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 CommoditySymbol) :*: S1 ('MetaSel ('Just "mprate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Quantity)))) |
pattern MixedAmountKeyNoCost :: !CommoditySymbol -> MixedAmountKey #
pattern MixedAmountKeyTotalCost :: !CommoditySymbol -> !CommoditySymbol -> MixedAmountKey #
pattern MixedAmountKeyUnitCost :: !CommoditySymbol -> !CommoditySymbol -> !Quantity -> MixedAmountKey #
data PayeeDeclarationInfo #
Constructors
PayeeDeclarationInfo | |
Fields
|
Instances
NFData PayeeDeclarationInfo | |||||
Defined in Hledger.Data.Types Methods rnf :: PayeeDeclarationInfo -> () | |||||
Generic PayeeDeclarationInfo | |||||
Defined in Hledger.Data.Types Associated Types
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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "PayeeDeclarationInfo" 'PrefixI 'True) (S1 ('MetaSel ('Just "pdicomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "pditags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Tag]))) |
data PeriodicTransaction #
Constructors
PeriodicTransaction | |
Fields
|
Instances
NFData PeriodicTransaction | |||||
Defined in Hledger.Data.Types Methods rnf :: PeriodicTransaction -> () | |||||
Generic PeriodicTransaction | |||||
Defined in Hledger.Data.Types Associated Types
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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "PeriodicTransaction" 'PrefixI 'True) (((S1 ('MetaSel ('Just "ptperiodexpr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "ptinterval") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Interval)) :*: (S1 ('MetaSel ('Just "ptspan") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 DateSpan) :*: (S1 ('MetaSel ('Just "ptsourcepos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (SourcePos, SourcePos)) :*: S1 ('MetaSel ('Just "ptstatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Status)))) :*: ((S1 ('MetaSel ('Just "ptcode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "ptdescription") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "ptcomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: (S1 ('MetaSel ('Just "pttags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Tag]) :*: S1 ('MetaSel ('Just "ptpostings") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Posting])))))) |
data PostingType #
Constructors
RegularPosting | |
VirtualPosting | |
BalancedVirtualPosting |
Instances
NFData PostingType | |||||
Defined in Hledger.Data.Types Methods rnf :: PostingType -> () | |||||
Generic PostingType | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" '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))) |
Constructors
Posting | |
Fields
|
Instances
NFData Posting | |||||
Defined in Hledger.Data.Types | |||||
Generic Posting | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "Posting" 'PrefixI 'True) (((S1 ('MetaSel ('Just "pdate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe Day)) :*: S1 ('MetaSel ('Just "pdate2") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe Day))) :*: (S1 ('MetaSel ('Just "pstatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Status) :*: (S1 ('MetaSel ('Just "paccount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 AccountName) :*: S1 ('MetaSel ('Just "pamount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 MixedAmount)))) :*: ((S1 ('MetaSel ('Just "pcomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: (S1 ('MetaSel ('Just "ptype") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 PostingType) :*: S1 ('MetaSel ('Just "ptags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Tag]))) :*: (S1 ('MetaSel ('Just "pbalanceassertion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe BalanceAssertion)) :*: (S1 ('MetaSel ('Just "ptransaction") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe Transaction)) :*: S1 ('MetaSel ('Just "poriginal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe Posting))))))) |
data PriceDirective #
Constructors
PriceDirective | |
Fields
|
Instances
NFData PriceDirective | |||||
Defined in Hledger.Data.Types Methods rnf :: PriceDirective -> () | |||||
Generic PriceDirective | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "PriceDirective" 'PrefixI 'True) ((S1 ('MetaSel ('Just "pdsourcepos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 SourcePos) :*: S1 ('MetaSel ('Just "pddate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Day)) :*: (S1 ('MetaSel ('Just "pdcommodity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 CommoditySymbol) :*: S1 ('MetaSel ('Just "pdamount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Amount)))) |
Constructors
NoRounding | |
SoftRounding | |
HardRounding | |
AllRounding |
Instances
NFData Rounding | |||||
Defined in Hledger.Data.Types | |||||
Generic Rounding | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" '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
NFData Status | |||||
Defined in Hledger.Data.Types | |||||
Bounded Status | |||||
Defined in Hledger.Data.Types | |||||
Enum Status | |||||
Defined in Hledger.Data.Types | |||||
Generic Status | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" '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))) |
data TMPostingRule #
Constructors
TMPostingRule | |
Fields
|
Instances
NFData TMPostingRule | |||||
Defined in Hledger.Data.Types Methods rnf :: TMPostingRule -> () | |||||
Generic TMPostingRule | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "TMPostingRule" 'PrefixI 'True) (S1 ('MetaSel ('Just "tmprPosting") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Posting) :*: S1 ('MetaSel ('Just "tmprIsMultiplier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Bool))) |
newtype TagDeclarationInfo #
Constructors
TagDeclarationInfo | |
Fields
|
Instances
NFData TagDeclarationInfo | |||||
Defined in Hledger.Data.Types Methods rnf :: TagDeclarationInfo -> () | |||||
Generic TagDeclarationInfo | |||||
Defined in Hledger.Data.Types Associated Types
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.43.1-15iVJWaizG8awuHeVEPAe" 'True) (C1 ('MetaCons "TagDeclarationInfo" 'PrefixI 'True) (S1 ('MetaSel ('Just "tdicomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))) |
data TimeclockCode #
Constructors
SetBalance | |
SetRequiredHours | |
In | |
Out | |
FinalOut |
Instances
NFData TimeclockCode | |||||
Defined in Hledger.Data.Types Methods rnf :: TimeclockCode -> () | |||||
Generic TimeclockCode | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" '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
NFData TimeclockEntry | |||||
Defined in Hledger.Data.Types Methods rnf :: TimeclockEntry -> () | |||||
Generic TimeclockEntry | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "TimeclockEntry" 'PrefixI 'True) ((S1 ('MetaSel ('Just "tlsourcepos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 SourcePos) :*: (S1 ('MetaSel ('Just "tlcode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 TimeclockCode) :*: S1 ('MetaSel ('Just "tldatetime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 LocalTime))) :*: ((S1 ('MetaSel ('Just "tlaccount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 AccountName) :*: S1 ('MetaSel ('Just "tldescription") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "tlcomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "tltags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Tag]))))) |
data TransactionModifier #
Constructors
TransactionModifier | |
Fields
|
Instances
NFData TransactionModifier | |||||
Defined in Hledger.Data.Types Methods rnf :: TransactionModifier -> () | |||||
Generic TransactionModifier | |||||
Defined in Hledger.Data.Types Associated Types
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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "TransactionModifier" 'PrefixI 'True) (S1 ('MetaSel ('Just "tmquerytxt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "tmpostingrules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [TMPostingRule]))) |
data Transaction #
Constructors
Transaction | |
Instances
NFData Transaction | |||||
Defined in Hledger.Data.Types Methods rnf :: Transaction -> () | |||||
Generic Transaction | |||||
Defined in Hledger.Data.Types Associated Types
| |||||
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.43.1-15iVJWaizG8awuHeVEPAe" 'False) (C1 ('MetaCons "Transaction" 'PrefixI 'True) (((S1 ('MetaSel ('Just "tindex") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Integer) :*: S1 ('MetaSel ('Just "tprecedingcomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "tsourcepos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (SourcePos, SourcePos)) :*: (S1 ('MetaSel ('Just "tdate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Day) :*: S1 ('MetaSel ('Just "tdate2") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe Day))))) :*: ((S1 ('MetaSel ('Just "tstatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Status) :*: (S1 ('MetaSel ('Just "tcode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "tdescription") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text))) :*: (S1 ('MetaSel ('Just "tcomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: (S1 ('MetaSel ('Just "ttags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Tag]) :*: S1 ('MetaSel ('Just "tpostings") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Posting])))))) |
class HasAmounts a where #
Methods
styleAmounts :: Map CommoditySymbol AmountStyle -> a -> a #
Instances
Constructors
DepthSpec | |
Fields
|
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 |
data StorageFormat #
Instances
Show StorageFormat | |
Defined in Hledger.Data.Types Methods showsPrec :: Int -> StorageFormat -> ShowS show :: StorageFormat -> String showList :: [StorageFormat] -> ShowS | |
Eq StorageFormat | |
Defined in Hledger.Data.Types | |
Ord StorageFormat | |
Defined in Hledger.Data.Types Methods compare :: StorageFormat -> StorageFormat -> Ordering # (<) :: StorageFormat -> StorageFormat -> Bool # (<=) :: StorageFormat -> StorageFormat -> Bool # (>) :: StorageFormat -> StorageFormat -> Bool # (>=) :: StorageFormat -> StorageFormat -> Bool # max :: StorageFormat -> StorageFormat -> StorageFormat # min :: StorageFormat -> StorageFormat -> StorageFormat # |
Constructors
PrimaryDate | |
SecondaryDate |
isAccountSubtypeOf :: AccountType -> AccountType -> Bool #
isBalanceSheetAccountType :: AccountType -> Bool #
isDecimalMark :: Char -> Bool #
isHiddenTagName :: TagName -> Bool #
isIncomeStatementAccountType :: AccountType -> Bool #
maCompare :: MixedAmount -> MixedAmount -> Ordering #
nullsourcepospair :: (SourcePos, SourcePos) #
showMarketPrice :: MarketPrice -> String #
showMarketPrices :: [MarketPrice] -> [Char] #
toHiddenTag :: Tag -> HiddenTag #
toHiddenTagName :: TagName -> TagName #
toVisibleTag :: HiddenTag -> Tag #
toVisibleTagName :: TagName -> TagName #
type AccountName = Text #
type CommoditySymbol = Text #
type DecimalMark = Char #
type ParsedJournal = Journal #
showLitChar :: Char -> ShowS #
numDigitsInt :: Integral a => Int -> a #
numDigitsInteger :: Integer -> Int #
mixedAmountSetStyles :: Map CommoditySymbol AmountStyle -> MixedAmount -> MixedAmount #
styleMixedAmount :: Map CommoditySymbol AmountStyle -> MixedAmount -> MixedAmount #
canonicaliseMixedAmount :: Map CommoditySymbol AmountStyle -> MixedAmount -> MixedAmount #
amountSetStyles :: Map CommoditySymbol AmountStyle -> Amount -> Amount #
styleAmount :: Map CommoditySymbol AmountStyle -> Amount -> Amount #
canonicaliseAmount :: Map CommoditySymbol AmountStyle -> Amount -> Amount #
amountCost :: Amount -> Amount #
amountDisplayPrecision :: Amount -> Word8 #
amountInternalPrecision :: Amount -> Word8 #
amountIsZero :: Amount -> Bool #
amountLooksZero :: Amount -> Bool #
amountSetFullPrecision :: Amount -> Amount #
amountSetFullPrecisionUpTo :: Maybe Word8 -> Amount -> Amount #
amountSetPrecision :: AmountPrecision -> Amount -> Amount #
amountSetPrecisionMax :: Word8 -> Amount -> Amount #
amountSetPrecisionMin :: Word8 -> Amount -> Amount #
amountStripCost :: Amount -> Amount #
amountStylesSetRounding :: Rounding -> Map CommoditySymbol AmountStyle -> Map CommoditySymbol AmountStyle #
amountUnstyled :: Amount -> Amount #
amountWithCommodity :: CommoditySymbol -> Amount -> Amount #
amountsPreservingZeros :: MixedAmount -> [Amount] #
amountsRaw :: MixedAmount -> [Amount] #
averageMixedAmounts :: [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 #
mixedAmountSetFullPrecisionUpTo :: Maybe Word8 -> MixedAmount -> MixedAmount #
mixedAmountSetPrecisionMax :: Word8 -> MixedAmount -> MixedAmount #
mixedAmountSetPrecisionMin :: Word8 -> MixedAmount -> MixedAmount #
multiplyAmount :: Quantity -> Amount -> Amount #
multiplyMixedAmount :: Quantity -> MixedAmount -> MixedAmount #
setAmountInternalPrecision :: Word8 -> Amount -> Amount #
showAmount :: Amount -> String #
showAmountB :: AmountFormat -> Amount -> WideBuilder #
showAmountCost :: Amount -> String #
showAmountCostB :: AmountFormat -> Amount -> WideBuilder #
showAmountDebug :: Amount -> String #
showAmountWith :: AmountFormat -> Amount -> String #
showAmountWithZeroCommodity :: Amount -> String #
showAmountWithoutCost :: Amount -> String #
showCommoditySymbol :: Text -> Text #
showMixedAmount :: MixedAmount -> String #
showMixedAmountDebug :: MixedAmount -> String #
showMixedAmountElided :: Int -> Bool -> MixedAmount -> String #
showMixedAmountLinesB :: AmountFormat -> MixedAmount -> [WideBuilder] #
showMixedAmountOneLine :: MixedAmount -> String #
showMixedAmountOneLineWithoutCost :: Bool -> MixedAmount -> String #
showMixedAmountWith :: AmountFormat -> MixedAmount -> String #
showMixedAmountWithZeroCommodity :: MixedAmount -> String #
showMixedAmountWithoutCost :: Bool -> MixedAmount -> String #
withInternalPrecision :: Amount -> Word8 -> Amount #
withPrecision :: Amount -> AmountPrecision -> Amount #
Constructors
AbsoluteSeek | |
RelativeSeek | |
SeekFromEnd |
Instances
Enum SeekMode | |
Defined in GHC.Internal.IO.Device | |
Ix SeekMode | |
Defined in GHC.Internal.IO.Device | |
Read SeekMode | |
Defined in GHC.Internal.IO.Device | |
Show SeekMode | |
Eq SeekMode | |
Ord SeekMode | |
Defined in GHC.Internal.IO.Device |
genericDrop :: Integral i => i -> [a] -> [a] #
char8 :: TextEncoding #
(<**>) :: 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 #
intToDigit :: Int -> Char #
formatRealFloat :: RealFloat a => a -> FieldFormatter #
Instances
Generic1 (Const a :: k -> Type) | |||||
Defined in GHC.Internal.Data.Functor.Const Associated Types
| |||||
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 :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Maybe b -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser (Const a b) liftParseJSONList2 :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Maybe b -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser [Const a b] liftOmittedField2 :: Maybe a -> Maybe b -> Maybe (Const a b) | |||||
ToJSON2 (Const :: Type -> Type -> Type) | |||||
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON2 :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> (b -> Bool) -> (b -> Value) -> ([b] -> Value) -> Const a b -> Value liftToJSONList2 :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> (b -> Bool) -> (b -> Value) -> ([b] -> Value) -> [Const a b] -> Value liftToEncoding2 :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> (b -> Bool) -> (b -> Encoding) -> ([b] -> Encoding) -> Const a b -> Encoding liftToEncodingList2 :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> (b -> Bool) -> (b -> Encoding) -> ([b] -> Encoding) -> [Const a b] -> Encoding liftOmitField2 :: (a -> Bool) -> (b -> Bool) -> Const a b -> Bool | |||||
Bifoldable (Const :: Type -> Type -> Type) | |||||
Bifoldable1 (Const :: Type -> Type -> Type) | |||||
Defined in Data.Bifoldable1 Methods bifold1 :: Semigroup m => Const m m -> m bifoldMap1 :: Semigroup m => (a -> m) -> (b -> m) -> Const a b -> m | |||||
Bifunctor (Const :: Type -> Type -> Type) | |||||
Bitraversable (Const :: Type -> Type -> Type) | |||||
Defined in Data.Bitraversable Methods bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Const a b -> f (Const c d) | |||||
Eq2 (Const :: Type -> Type -> Type) | |||||
Defined in Data.Functor.Classes | |||||
Ord2 (Const :: Type -> Type -> Type) | |||||
Defined in Data.Functor.Classes | |||||
Read2 (Const :: Type -> Type -> Type) | |||||
Defined in Data.Functor.Classes Methods liftReadsPrec2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> Int -> ReadS (Const a b) liftReadList2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> ReadS [Const a b] liftReadPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec (Const a b) liftReadListPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec [Const a b] | |||||
Show2 (Const :: Type -> Type -> Type) | |||||
Defined in Data.Functor.Classes Methods liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> Const a b -> ShowS liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [Const a b] -> ShowS | |||||
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 :: Maybe a0 -> (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser (Const a a0) liftParseJSONList :: Maybe a0 -> (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser [Const a a0] liftOmittedField :: Maybe a0 -> Maybe (Const a a0) | |||||
ToJSON a => ToJSON1 (Const a :: Type -> Type) | |||||
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON :: (a0 -> Bool) -> (a0 -> Value) -> ([a0] -> Value) -> Const a a0 -> Value liftToJSONList :: (a0 -> Bool) -> (a0 -> Value) -> ([a0] -> Value) -> [Const a a0] -> Value liftToEncoding :: (a0 -> Bool) -> (a0 -> Encoding) -> ([a0] -> Encoding) -> Const a a0 -> Encoding liftToEncodingList :: (a0 -> Bool) -> (a0 -> Encoding) -> ([a0] -> Encoding) -> [Const a a0] -> Encoding liftOmitField :: (a0 -> Bool) -> Const a a0 -> Bool | |||||
Eq a => Eq1 (Const a :: Type -> Type) | |||||
Defined in Data.Functor.Classes | |||||
Ord a => Ord1 (Const a :: Type -> Type) | |||||
Defined in Data.Functor.Classes Methods liftCompare :: (a0 -> b -> Ordering) -> Const a a0 -> Const a b -> Ordering | |||||
Read a => Read1 (Const a :: Type -> Type) | |||||
Defined in Data.Functor.Classes Methods liftReadsPrec :: (Int -> ReadS a0) -> ReadS [a0] -> Int -> ReadS (Const a a0) liftReadList :: (Int -> ReadS a0) -> ReadS [a0] -> ReadS [Const a a0] liftReadPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec (Const a a0) liftReadListPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec [Const a a0] | |||||
Show a => Show1 (Const a :: Type -> Type) | |||||
Defined in Data.Functor.Classes Methods liftShowsPrec :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> Int -> Const a a0 -> ShowS liftShowList :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> [Const a a0] -> ShowS | |||||
Contravariant (Const a :: Type -> Type) | |||||
NFData a => NFData1 (Const a :: Type -> Type) | |||||
Defined in Control.DeepSeq | |||||
Monoid m => Applicative (Const m :: Type -> Type) | |||||
Functor (Const m :: Type -> Type) | |||||
Foldable (Const m :: Type -> Type) | |||||
Defined in GHC.Internal.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) | |||||
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 Methods parseJSON :: Value -> Parser (Const a b) parseJSONList :: Value -> Parser [Const a b] omittedField :: Maybe (Const a b) | |||||
(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 | |||||
Default a => Default (Const a b) | |||||
Defined in Data.Default.Internal | |||||
NFData a => NFData (Const a b) | |||||
Defined in Control.DeepSeq | |||||
Monoid a => Monoid (Const a b) | |||||
Semigroup a => Semigroup (Const a b) | |||||
Bits a => Bits (Const a b) | |||||
Defined in GHC.Internal.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 GHC.Internal.Data.Functor.Const Methods finiteBitSize :: Const a b -> Int countLeadingZeros :: Const a b -> Int countTrailingZeros :: Const a b -> Int | |||||
IsString a => IsString (Const a b) | |||||
Defined in GHC.Internal.Data.String Methods fromString :: String -> Const a b | |||||
Bounded a => Bounded (Const a b) | |||||
Defined in GHC.Internal.Data.Functor.Const | |||||
Enum a => Enum (Const a b) | |||||
Defined in GHC.Internal.Data.Functor.Const | |||||
Floating a => Floating (Const a b) | |||||
Defined in GHC.Internal.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 GHC.Internal.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 | |||||
Storable a => Storable (Const a b) | |||||
Defined in GHC.Internal.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 () | |||||
Generic (Const a b) | |||||
Defined in GHC.Internal.Data.Functor.Const Associated Types
| |||||
Ix a => Ix (Const a b) | |||||
Defined in GHC.Internal.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) | |||||
Defined in GHC.Internal.Data.Functor.Const | |||||
Read a => Read (Const a b) | |||||
Defined in GHC.Internal.Data.Functor.Const | |||||
Fractional a => Fractional (Const a b) | |||||
Defined in GHC.Internal.Data.Functor.Const | |||||
Integral a => Integral (Const a b) | |||||
Defined in GHC.Internal.Data.Functor.Const | |||||
Real a => Real (Const a b) | |||||
Defined in GHC.Internal.Data.Functor.Const Methods toRational :: Const a b -> Rational | |||||
RealFrac a => RealFrac (Const a b) | |||||
Show a => Show (Const a b) | |||||
Eq a => Eq (Const a b) | |||||
Ord a => Ord (Const a b) | |||||
Hashable a => Hashable (Const a b) | |||||
Defined in Data.Hashable.Class | |||||
FromFormKey a => FromFormKey (Const a b) | |||||
Defined in Web.Internal.FormUrlEncoded Methods parseFormKey :: Text -> Either Text (Const a b) | |||||
ToFormKey a => ToFormKey (Const a b) | |||||
Defined in Web.Internal.FormUrlEncoded | |||||
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 GHC.Internal.Data.Functor.Const | |||||
newtype MVector s (Const a b) | |||||
Defined in Data.Vector.Unboxed.Base | |||||
type Rep (Const a b) | |||||
Defined in GHC.Internal.Data.Functor.Const | |||||
newtype Vector (Const a b) | |||||
Defined in Data.Vector.Unboxed.Base |
genericTake :: Integral i => i -> [a] -> [a] #
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] #
Constructors
ZipList | |
Fields
|
Instances
NFData1 ZipList | |||||
Defined in Control.DeepSeq | |||||
Alternative ZipList | |||||
Applicative ZipList | |||||
Functor ZipList | |||||
Foldable ZipList | |||||
Defined in GHC.Internal.Functor.ZipList 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 | |||||
Generic1 ZipList | |||||
Defined in GHC.Internal.Functor.ZipList Associated Types
| |||||
NFData a => NFData (ZipList a) | |||||
Defined in Control.DeepSeq | |||||
Data a => Data (ZipList a) | |||||
Defined in GHC.Internal.Functor.ZipList 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) | |||||
Defined in GHC.Internal.Functor.ZipList Associated Types
| |||||
IsList (ZipList a) | |||||
Read a => Read (ZipList a) | |||||
Defined in GHC.Internal.Functor.ZipList | |||||
Show a => Show (ZipList a) | |||||
Eq a => Eq (ZipList a) | |||||
Ord a => Ord (ZipList a) | |||||
type Rep1 ZipList | |||||
Defined in GHC.Internal.Functor.ZipList | |||||
type Rep (ZipList a) | |||||
Defined in GHC.Internal.Functor.ZipList | |||||
type Item (ZipList a) | |||||
Defined in GHC.Internal.IsList type Item (ZipList a) = a |
Instances
FromJSON1 Down | |||||
Defined in Data.Aeson.Types.FromJSON Methods liftParseJSON :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Down a) liftParseJSONList :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Down a] liftOmittedField :: Maybe a -> Maybe (Down a) | |||||
ToJSON1 Down | |||||
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> Down a -> Value liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [Down a] -> Value liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> Down a -> Encoding liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [Down a] -> Encoding liftOmitField :: (a -> Bool) -> Down a -> Bool | |||||
MonadZip Down | |||||
Foldable1 Down | |||||
Defined in Data.Foldable1 Methods fold1 :: Semigroup m => Down m -> m foldMap1 :: Semigroup m => (a -> m) -> Down a -> m foldMap1' :: Semigroup m => (a -> m) -> Down a -> m toNonEmpty :: Down a -> NonEmpty a maximum :: Ord a => Down a -> a minimum :: Ord a => Down a -> a foldrMap1 :: (a -> b) -> (a -> b -> b) -> Down a -> b foldlMap1' :: (a -> b) -> (b -> a -> b) -> Down a -> b foldlMap1 :: (a -> b) -> (b -> a -> b) -> Down a -> b foldrMap1' :: (a -> b) -> (a -> b -> b) -> Down a -> b | |||||
Eq1 Down | |||||
Defined in Data.Functor.Classes | |||||
Ord1 Down | |||||
Defined in Data.Functor.Classes Methods liftCompare :: (a -> b -> Ordering) -> Down a -> Down b -> Ordering | |||||
Read1 Down | |||||
Defined in Data.Functor.Classes Methods liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Down a) liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Down a] liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Down a) liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Down a] | |||||
Show1 Down | |||||
Defined in Data.Functor.Classes Methods liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Down a -> ShowS liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Down a] -> ShowS | |||||
NFData1 Down | |||||
Defined in Control.DeepSeq | |||||
Applicative Down | |||||
Functor Down | |||||
Monad Down | |||||
Foldable Down | |||||
Defined in GHC.Internal.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 | |||||
Generic1 Down | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
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)) | |||||
FromJSON a => FromJSON (Down a) | |||||
Defined in Data.Aeson.Types.FromJSON Methods parseJSON :: Value -> Parser (Down a) parseJSONList :: Value -> Parser [Down a] omittedField :: Maybe (Down a) | |||||
ToJSON a => ToJSON (Down a) | |||||
Defined in Data.Aeson.Types.ToJSON Methods toEncoding :: Down a -> Encoding toJSONList :: [Down a] -> Value toEncodingList :: [Down a] -> Encoding | |||||
NFData a => NFData (Down a) | |||||
Defined in Control.DeepSeq | |||||
Monoid a => Monoid (Down a) | |||||
Semigroup a => Semigroup (Down a) | |||||
Bits a => Bits (Down a) | |||||
Defined in GHC.Internal.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 GHC.Internal.Data.Ord Methods finiteBitSize :: Down a -> Int countLeadingZeros :: Down a -> Int countTrailingZeros :: Down a -> Int | |||||
Bounded a => Bounded (Down a) | |||||
Defined in GHC.Internal.Data.Ord | |||||
(Enum a, Bounded a, Eq a) => Enum (Down a) | |||||
Defined in GHC.Internal.Data.Ord | |||||
Floating a => Floating (Down a) | |||||
RealFloat a => RealFloat (Down a) | |||||
Defined in GHC.Internal.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 | |||||
Storable a => Storable (Down a) | |||||
Defined in GHC.Internal.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 () | |||||
Generic (Down a) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Ix a => Ix (Down a) | |||||
Num a => Num (Down a) | |||||
Read a => Read (Down a) | |||||
Defined in GHC.Internal.Data.Ord | |||||
Fractional a => Fractional (Down a) | |||||
Defined in GHC.Internal.Data.Ord | |||||
Real a => Real (Down a) | |||||
Defined in GHC.Internal.Data.Ord Methods toRational :: Down a -> Rational | |||||
RealFrac a => RealFrac (Down a) | |||||
Show a => Show (Down a) | |||||
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.Internal.Generics | |||||
newtype MVector s (Down a) | |||||
Defined in Data.Vector.Unboxed.Base | |||||
type Rep (Down a) | |||||
Defined in GHC.Internal.Generics | |||||
newtype Vector (Down a) | |||||
Defined in Data.Vector.Unboxed.Base |
sourcePosPretty :: SourcePos -> String #
data DependencyType #
Constructors
AllSucceed | |
AllFinish |
Instances
Read DependencyType | |
Defined in Test.Tasty.Core Methods readsPrec :: Int -> ReadS DependencyType readList :: ReadS [DependencyType] readPrec :: ReadPrec DependencyType readListPrec :: ReadPrec [DependencyType] | |
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 |
after :: DependencyType -> String -> TestTree -> TestTree #
after_ :: DependencyType -> Expr -> TestTree -> TestTree #
sequentialTestGroup :: TestName -> DependencyType -> [TestTree] -> TestTree #
utf8 :: TextEncoding #
isRelative :: FilePath -> Bool #
Constructors
InputOpts | |
Fields
|
Instances
asum :: (Foldable t, Alternative f) => t (f a) -> f a #
txnTieKnot :: Transaction -> Transaction #
accountSetDeclarationInfo :: Journal -> Account -> Account #
accountTree :: AccountName -> [AccountName] -> Account #
accountsFromPostings :: [Posting] -> [Account] #
accountsLevels :: Account -> [[Account]] #
anyAccounts :: (Account -> Bool) -> Account -> Bool #
clipAccounts :: Int -> Account -> Account #
clipAccountsAndAggregate :: DepthSpec -> [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 #
accountNameTreeFrom :: [AccountName] -> Tree AccountName #
accountNameType :: Map AccountName AccountType -> AccountName -> Maybe AccountType #
acctsepchar :: Char #
clipAccountName :: DepthSpec -> AccountName -> AccountName #
concatAccountNames :: [AccountName] -> AccountName #
defaultBaseConversionAccount :: IsString a => a #
elideAccountName :: Int -> AccountName -> AccountName #
escapeName :: AccountName -> Text #
expandAccountName :: AccountName -> [AccountName] #
expandAccountNames :: [AccountName] -> [AccountName] #
getAccountNameClippedDepth :: DepthSpec -> AccountName -> Maybe Int #
isAccountNamePrefixOf :: AccountName -> AccountName -> Bool #
isSubAccountNameOf :: AccountName -> AccountName -> Bool #
joinAccountNames :: AccountName -> AccountName -> AccountName #
parentAccountNames :: AccountName -> [AccountName] #
subAccountNamesFrom :: [AccountName] -> AccountName -> [AccountName] #
topAccountNames :: [AccountName] -> [AccountName] #
data BalancingOpts #
Constructors
BalancingOpts | |
Fields
|
Instances
Show BalancingOpts | |
Defined in Hledger.Data.Balancing Methods showsPrec :: Int -> BalancingOpts -> ShowS show :: BalancingOpts -> String showList :: [BalancingOpts] -> ShowS | |
Eq BalancingOpts | |
Defined in Hledger.Data.Balancing | |
Ord BalancingOpts | |
Defined in Hledger.Data.Balancing Methods compare :: BalancingOpts -> BalancingOpts -> Ordering # (<) :: BalancingOpts -> BalancingOpts -> Bool # (<=) :: BalancingOpts -> BalancingOpts -> Bool # (>) :: BalancingOpts -> BalancingOpts -> Bool # (>=) :: BalancingOpts -> BalancingOpts -> Bool # max :: BalancingOpts -> BalancingOpts -> BalancingOpts # min :: BalancingOpts -> BalancingOpts -> BalancingOpts # | |
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 # |
balanceTransaction :: BalancingOpts -> Transaction -> Either String Transaction #
balanceTransactionHelper :: BalancingOpts -> Transaction -> Either String (Transaction, [(AccountName, MixedAmount)]) #
isTransactionBalanced :: BalancingOpts -> Transaction -> Bool #
journalBalanceTransactions :: BalancingOpts -> Journal -> Either String Journal #
transactionCheckAssertions :: BalancingOpts -> Journal -> Transaction -> Either String Transaction #
currencies :: [([Char], CurrencyCode, CurrencySymbol)] #
currencyCodeToSymbol :: CurrencyCode -> Maybe CurrencySymbol #
currencySymbolToCode :: CurrencySymbol -> Maybe CurrencyCode #
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) #
makePriceDirectiveErrorExcerpt :: PriceDirective -> Maybe (PriceDirective -> 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 #
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 #
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 #
journalDbg :: Journal -> String #
journalDescriptions :: Journal -> [Text] #
journalEndDate :: Bool -> Journal -> Maybe Day #
journalFilePath :: Journal -> FilePath #
journalFilePaths :: Journal -> [FilePath] #
journalInferCommodityStyles :: 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 #
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 #
journalTagCostsAndEquityAndMaybeInferCosts :: Bool -> Bool -> 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 () #
journalCheckBalanceAssertions :: Journal -> Either String () #
journalCheckCommodities :: Journal -> Either String () #
journalCheckPairedConversionPostings :: Journal -> Either String () #
journalCheckPayees :: Journal -> Either String () #
journalCheckRecentAssertions :: Journal -> Either String () #
journalCheckTags :: Journal -> Either String () #
journalStrictChecks :: Journal -> Either String () #
journalCheckOrdereddates :: 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 #
firstMonthOfQuarter :: Num a => a -> a #
isLastDayOfMonth :: (Eq a1, Eq a2, Num a1, Num a2) => Year -> a1 -> a2 -> Bool #
isStandardPeriod :: Period -> Bool #
mondayBefore :: Day -> 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 #
startOfFirstWeekInMonth :: Year -> MonthOfYear -> Day #
thursdayOfWeekContaining :: Day -> 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 #
originalPosting :: Posting -> Posting #
post' :: AccountName -> Amount -> Maybe BalanceAssertion -> Posting #
postingAddHiddenAndMaybeVisibleTag :: Bool -> HiddenTag -> 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) #
postingDate :: Posting -> Day #
postingDate2 :: Posting -> Day #
postingDateOrDate2 :: WhichDate -> Posting -> Day #
postingIndent :: Text -> Text #
postingNegate :: Posting -> Posting #
postingStatus :: Posting -> Status #
postingStripCosts :: Posting -> Posting #
postingStyleAmounts :: Map CommoditySymbol AmountStyle -> Posting -> Posting #
postingToCost :: ConversionOp -> Posting -> Maybe Posting #
postingTransformAmount :: (MixedAmount -> MixedAmount) -> Posting -> Posting #
postingsAsLines :: Bool -> [Posting] -> [Text] #
relatedPostings :: Posting -> [Posting] #
renderCommentLines :: Text -> [Text] #
showAccountName :: Maybe Int -> PostingType -> 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 #
dropRawOpt :: String -> RawOpts -> RawOpts #
listofstringopt :: String -> RawOpts -> [String] #
maybecharopt :: String -> RawOpts -> Maybe Char #
maybeintopt :: String -> RawOpts -> Maybe Int #
maybeposintopt :: String -> RawOpts -> Maybe Int #
maybestringopt :: String -> RawOpts -> Maybe String #
maybeynaopt :: String -> RawOpts -> Maybe YNA #
maybeynopt :: String -> RawOpts -> Maybe Bool #
overRawOpts :: ([(String, String)] -> [(String, String)]) -> RawOpts -> RawOpts #
setboolopt :: String -> RawOpts -> RawOpts #
unsetboolopt :: String -> RawOpts -> RawOpts #
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
Default StringFormat | |
Defined in Hledger.Data.StringFormat Methods def :: StringFormat | |
Show StringFormat | |
Defined in Hledger.Data.StringFormat Methods showsPrec :: Int -> StringFormat -> ShowS show :: StringFormat -> String showList :: [StringFormat] -> ShowS | |
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 |
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])) #
payeeAndNoteFromDescription :: Text -> (Text, Text) #
payeeAndNoteFromDescription' :: Text -> (Text, Text) #
realPostings :: Transaction -> [Posting] #
showTransaction :: Transaction -> Text #
transaction :: Day -> [Posting] -> Transaction #
transactionAddHiddenAndMaybeVisibleTag :: Bool -> HiddenTag -> Transaction -> Transaction #
transactionAddTags :: Transaction -> [Tag] -> Transaction #
transactionAmounts :: Transaction -> [MixedAmount] #
transactionApplyValuation :: PriceOracle -> Map CommoditySymbol AmountStyle -> Day -> Day -> ValuationType -> Transaction -> Transaction #
transactionDate2 :: Transaction -> Day #
transactionDateOrDate2 :: WhichDate -> Transaction -> Day #
transactionFile :: Transaction -> FilePath #
transactionInferEquityPostings :: Bool -> AccountName -> Transaction -> Transaction #
transactionMapPostingAmounts :: (MixedAmount -> MixedAmount) -> Transaction -> Transaction #
transactionMapPostings :: (Posting -> Posting) -> Transaction -> Transaction #
transactionNote :: Transaction -> Text #
transactionPayee :: Transaction -> Text #
transactionTagCostsAndEquityAndMaybeInferCosts :: Bool -> Bool -> [AccountName] -> Transaction -> Either String Transaction #
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] #
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 |
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) #
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 #
tests_Data :: TestTree #
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 #
type RegexError = String #
filterQuery :: (Query -> Bool) -> Query -> Query #
queryIsDepth :: Query -> Bool #
queryIsSym :: Query -> Bool #
simplifyQuery :: Query -> Query #
sourcePosPairPretty :: (SourcePos, SourcePos) -> String #
Instances
NFData ThreadId | |
Defined in Control.DeepSeq | |
Show ThreadId | |
Eq ThreadId | |
Ord ThreadId | |
Defined in GHC.Internal.Conc.Sync | |
Hashable ThreadId | |
Defined in Data.Hashable.Class |
initialPos :: FilePath -> SourcePos #
spacenonewline :: forall s (m :: Type -> Type). (Stream s, Char ~ Token s) => ParsecT HledgerParseErrorData s m Char #
emptyorcommentlinep2 :: forall (m :: Type -> Type). [Char] -> TextParser m () #
forever :: Applicative f => f a -> f b #
mapAndUnzipM :: Applicative m => (a -> m (b, c)) -> [a] -> m ([b], [c]) #
replicateM_ :: Applicative m => Int -> m a -> m () #
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 #
readEitherSafe :: Read a => String -> Either String 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 #
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 XdgDirectoryList #
Constructors
XdgDataDirs | |
XdgConfigDirs |
Instances
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 #
getXdgDirectoryList :: XdgDirectoryList -> IO [FilePath] #
listDirectory :: 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 #
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) #
splitExtension :: FilePath -> (String, String) #
splitExtensions :: FilePath -> (FilePath, String) #
splitSearchPath :: String -> [FilePath] #
stripExtension :: String -> FilePath -> Maybe FilePath #
takeExtensions :: FilePath -> String #
isPunctuation :: Char -> Bool #
isSeparator :: Char -> Bool #
Constructors
QueryOptInAcctOnly AccountName | |
QueryOptInAcct AccountName |
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 #
parseDepthSpec :: Text -> Either RegexError DepthSpec #
queryDateSpan :: Bool -> Query -> DateSpan #
queryDateSpan' :: Query -> DateSpan #
queryDepth :: Query -> DepthSpec #
queryEndDate :: Bool -> Query -> Maybe Day #
queryIsAcct :: Query -> Bool #
queryIsAmt :: Query -> Bool #
queryIsAmtOrSym :: 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] #
tests_Query :: TestTree #
type PrefixedFilePath = FilePath #
defaultJournal :: IO Journal #
defaultJournalPath :: IO String #
defaultJournalSafely :: IO (Either String Journal) #
defaultJournalWith :: InputOpts -> IO Journal #
ensureJournalFileExists :: FilePath -> IO () #
isWindowsUnsafeDotPath :: FilePath -> Bool #
journalEnvVar :: String #
orDieTrying :: MonadIO m => ExceptT String m a -> m a #
readJournal' :: Handle -> IO Journal #
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 #
data Reader (m :: Type -> Type) #
Constructors
Reader | |
Fields
|
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 #
commentlinetagsp :: forall (m :: Type -> Type). TextParser m [Tag] #
commoditysymbolp :: forall (m :: Type -> Type). TextParser m CommoditySymbol #
costp :: forall (m :: Type -> Type). Amount -> JournalParser m AmountCost #
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) #
handleReadFnToTextReadFn :: (InputOpts -> FilePath -> Text -> ExceptT String IO Journal) -> InputOpts -> FilePath -> Handle -> ExceptT String IO Journal #
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 () #
rawOptsToInputOpts :: Day -> Bool -> Bool -> RawOpts -> InputOpts #
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) #
splitReaderPrefix :: PrefixedFilePath -> (Maybe StorageFormat, FilePath) #
tmpostingrulep :: forall (m :: Type -> Type). Maybe Year -> JournalParser m TMPostingRule #
type AccountTransactionsReportItem = (Transaction, Transaction, Bool, Text, MixedAmount, MixedAmount) #
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 #
type BalanceReport = ([BalanceReportItem], MixedAmount) #
type BalanceReportItem = (AccountName, AccountName, Int, MixedAmount) #
balanceReport :: ReportSpec -> Journal -> BalanceReport #
flatShowsExclusiveBalance :: Bool #
type BudgetAverage = Average #
type BudgetCell = (Maybe Change, Maybe BudgetGoal) #
type BudgetGoal = Change #
type BudgetTotal = Total #
budgetReport :: ReportSpec -> BalancingOpts -> DateSpan -> Journal -> BudgetReport #
combineBudgetAndActual :: ReportOpts -> Journal -> MultiBalanceReport -> MultiBalanceReport -> BudgetReport #
type EntriesReport = [EntriesReportItem] #
type EntriesReportItem = Transaction #
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] #
type PostingsReport = [PostingsReportItem] #
type PostingsReportItem = (Maybe Day, Maybe Period, Maybe Text, Posting, MixedAmount) #
mkpostingsReportItem :: Bool -> Bool -> WhichDate -> Maybe Period -> Posting -> MixedAmount -> PostingsReportItem #
postingsReport :: ReportSpec -> Journal -> PostingsReport #
data AccountListMode #
Instances
Default AccountListMode | |
Defined in Hledger.Reports.ReportOptions Methods | |
Show AccountListMode | |
Defined in Hledger.Reports.ReportOptions Methods showsPrec :: Int -> AccountListMode -> ShowS show :: AccountListMode -> String showList :: [AccountListMode] -> ShowS | |
Eq AccountListMode | |
Defined in Hledger.Reports.ReportOptions Methods (==) :: AccountListMode -> AccountListMode -> Bool (/=) :: AccountListMode -> AccountListMode -> Bool |
Constructors
AbsAmount' Bool | |
Account' Bool | |
Amount' Bool | |
Date' Bool | |
Description' Bool |
Instances
data BalanceAccumulation #
Constructors
PerPeriod | |
Cumulative | |
Historical |
Instances
Default BalanceAccumulation | |
Defined in Hledger.Reports.ReportOptions Methods | |
Show BalanceAccumulation | |
Defined in Hledger.Reports.ReportOptions Methods showsPrec :: Int -> BalanceAccumulation -> ShowS show :: BalanceAccumulation -> String showList :: [BalanceAccumulation] -> ShowS | |
Eq BalanceAccumulation | |
Defined in Hledger.Reports.ReportOptions Methods (==) :: BalanceAccumulation -> BalanceAccumulation -> Bool (/=) :: BalanceAccumulation -> BalanceAccumulation -> Bool |
data BalanceCalculation #
Constructors
CalcChange | |
CalcBudget | |
CalcValueChange | |
CalcGain | |
CalcPostingsCount |
Instances
Default BalanceCalculation | |
Defined in Hledger.Reports.ReportOptions Methods | |
Show BalanceCalculation | |
Defined in Hledger.Reports.ReportOptions Methods showsPrec :: Int -> BalanceCalculation -> ShowS show :: BalanceCalculation -> String showList :: [BalanceCalculation] -> ShowS | |
Eq BalanceCalculation | |
Defined in Hledger.Reports.ReportOptions Methods (==) :: BalanceCalculation -> BalanceCalculation -> Bool (/=) :: BalanceCalculation -> BalanceCalculation -> Bool |
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 DepthSpec #
date2 :: ReportableLens' a Bool #
real :: ReportableLens' a Bool #
querystring :: ReportableLens' a [Text] #
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 # |
Constructors
LayoutWide (Maybe Int) | |
LayoutTall | |
LayoutBare | |
LayoutTidy |
data ReportSpec #
Constructors
ReportSpec | |
Fields
|
Instances
defsortspec :: SortSpec #
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 -> Bool -> RawOpts -> ReportOpts #
rawOptsToReportSpec :: Day -> Bool -> RawOpts -> Either String ReportSpec #
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] #
sortKeysDescription :: [Char] #
transactionDateFn :: ReportOpts -> Transaction -> Day #
tree_ :: ReportOpts -> Bool #
updateReportSpec :: ReportOpts -> ReportSpec -> Either String ReportSpec #
updateReportSpecWith :: (ReportOpts -> ReportOpts) -> ReportSpec -> Either String ReportSpec #
whichDate :: ReportOpts -> WhichDate #
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 omitField :: CompoundPeriodicReport a b -> Bool | |||||
Generic (CompoundPeriodicReport a b) | |||||
Defined in Hledger.Reports.ReportTypes Associated Types
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.43.1-15iVJWaizG8awuHeVEPAe" '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 omitField :: DisplayName -> Bool | |
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 omitField :: PeriodicReport a b -> Bool | |||||
Generic (PeriodicReport a b) | |||||
Defined in Hledger.Reports.ReportTypes Associated Types
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.43.1-15iVJWaizG8awuHeVEPAe" '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 omitField :: PeriodicReportRow a b -> Bool | |||||
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
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.43.1-15iVJWaizG8awuHeVEPAe" '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)))) |
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 #
prrIndent :: PeriodicReportRow DisplayName a -> Int #
prrShowDebug :: PeriodicReportRow DisplayName MixedAmount -> String #
makeHledgerClassyLenses :: Name -> DecsQ #
maximumStrict :: Ord a => [a] -> a #
minimumStrict :: Ord a => [a] -> a #
tests_Utils :: TestTree #
data GhcDebugMode #
Constructors
GDNotSupported | |
GDDisabled | |
GDNoPause | |
GDPauseAtStart | |
GDPauseAtEnd |
Instances
Show GhcDebugMode | |
Defined in Hledger.Utils.Debug Methods showsPrec :: Int -> GhcDebugMode -> ShowS show :: GhcDebugMode -> String showList :: [GhcDebugMode] -> ShowS | |
Eq GhcDebugMode | |
Defined in Hledger.Utils.Debug | |
Ord GhcDebugMode | |
Defined in Hledger.Utils.Debug Methods compare :: GhcDebugMode -> GhcDebugMode -> Ordering # (<) :: GhcDebugMode -> GhcDebugMode -> Bool # (<=) :: GhcDebugMode -> GhcDebugMode -> Bool # (>) :: GhcDebugMode -> GhcDebugMode -> Bool # (>=) :: GhcDebugMode -> GhcDebugMode -> Bool # max :: GhcDebugMode -> GhcDebugMode -> GhcDebugMode # min :: GhcDebugMode -> GhcDebugMode -> GhcDebugMode # |
ghcDebugPause' :: IO () #
withGhcDebug' :: a -> a #
data FinalParseError' e #
Instances
Monoid (FinalParseError' e) | |
Defined in Hledger.Utils.Parse Methods mempty :: FinalParseError' e mappend :: FinalParseError' e -> FinalParseError' e -> FinalParseError' e mconcat :: [FinalParseError' e] -> FinalParseError' e | |
Semigroup (FinalParseError' e) | |
Defined in Hledger.Utils.Parse Methods (<>) :: FinalParseError' e -> FinalParseError' e -> FinalParseError' e sconcat :: NonEmpty (FinalParseError' e) -> FinalParseError' e stimes :: Integral b => b -> FinalParseError' e -> FinalParseError' e | |
Show e => Show (FinalParseError' e) | |
Defined in Hledger.Utils.Parse Methods showsPrec :: Int -> FinalParseError' e -> ShowS show :: FinalParseError' e -> String showList :: [FinalParseError' e] -> ShowS |
data FinalParseErrorBundle' e #
Instances
Show e => Show (FinalParseErrorBundle' e) | |
Defined in Hledger.Utils.Parse Methods showsPrec :: Int -> FinalParseErrorBundle' e -> ShowS show :: FinalParseErrorBundle' e -> String showList :: [FinalParseErrorBundle' e] -> ShowS |
type SimpleStringParser a = Parsec HledgerParseErrorData String a #
type SimpleTextParser = Parsec HledgerParseErrorData Text #
data SourceExcerpt #
attachSource :: FilePath -> Text -> FinalParseError' e -> FinalParseErrorBundle' e #
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 () #
excerpt_ :: MonadParsec HledgerParseErrorData Text m => m a -> m SourceExcerpt #
finalCustomFailure :: (MonadParsec e s m, MonadError (FinalParseError' e) m) => e -> m a #
finalError :: ParseError Text e -> FinalParseError' e #
finalFail :: (MonadParsec e s m, MonadError (FinalParseError' e) m) => String -> m a #
finalFancyFailure :: (MonadParsec e s m, MonadError (FinalParseError' e) m) => Set (ErrorFancy e) -> m a #
getExcerptText :: SourceExcerpt -> Text #
nonspace :: forall (m :: Type -> Type). TextParser m Char #
parseErrorAt :: Int -> String -> HledgerParseErrorData #
parseErrorAtRegion :: Int -> Int -> String -> HledgerParseErrorData #
parseIncludeFile :: forall (m :: Type -> Type) st a. Monad m => StateT st (ParsecT HledgerParseErrorData Text (ExceptT FinalParseError m)) a -> st -> FilePath -> Text -> StateT st (ParsecT HledgerParseErrorData Text (ExceptT FinalParseError m)) a #
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 #
reparseExcerpt :: forall (m :: Type -> Type) a. Monad m => SourceExcerpt -> ParsecT HledgerParseErrorData Text m a -> ParsecT HledgerParseErrorData Text m 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 () #
surroundedBy :: Applicative m => m openclose -> m a -> m a #
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 #
traceShowId :: Show a => a -> a #
adjustOption :: IsOption v => (v -> v) -> TestTree -> TestTree #
defaultIngredients :: [Ingredient] #
localOption :: IsOption v => v -> TestTree -> TestTree #
defaultMainWithIngredients :: [Ingredient] -> TestTree -> IO () #
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 #
runExceptT :: ExceptT e m a -> m (Either e a) #
Instances
Show Timeout | |
Eq Timeout | |
Ord Timeout | |
Defined in Test.Tasty.Options.Core | |
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 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 backtraceDesired :: HUnitFailure -> Bool | |
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 |
Constructors
CompleteValue String | |
CompleteFile String FilePath | |
CompleteDir String FilePath |
Instances
Show Complete | |
Eq Complete | |
Ord Complete | |
Defined in System.Console.CmdArgs.Explicit.Complete |
data IOErrorType #
Instances
Show IOErrorType | |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> IOErrorType -> ShowS show :: IOErrorType -> String showList :: [IOErrorType] -> ShowS | |
Eq IOErrorType | |
Defined in GHC.Internal.IO.Exception |
latin1 :: TextEncoding #
mkTextEncoding :: String -> IO TextEncoding #
utf16 :: TextEncoding #
utf16be :: TextEncoding #
utf16le :: TextEncoding #
utf32 :: TextEncoding #
utf32be :: TextEncoding #
utf32le :: TextEncoding #
data HandlePosn #
Instances
Show HandlePosn | |
Defined in GHC.Internal.IO.Handle Methods showsPrec :: Int -> HandlePosn -> ShowS show :: HandlePosn -> String showList :: [HandlePosn] -> ShowS | |
Eq HandlePosn | |
Defined in GHC.Internal.IO.Handle |
hGetBuffering :: Handle -> IO BufferMode #
hGetEncoding :: Handle -> IO (Maybe TextEncoding) #
hGetPosn :: Handle -> IO HandlePosn #
hIsReadable :: Handle -> IO Bool #
hIsSeekable :: 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 #
hGetContents' :: Handle -> IO String #
hPutBufNonBlocking :: Handle -> Ptr a -> Int -> IO Int #
hWaitForInput :: Handle -> Int -> IO Bool #
data BufferMode #
Constructors
NoBuffering | |
LineBuffering | |
BlockBuffering (Maybe Int) |
Instances
Read BufferMode | |
Defined in GHC.Internal.IO.Handle.Types Methods readsPrec :: Int -> ReadS BufferMode readList :: ReadS [BufferMode] readPrec :: ReadPrec BufferMode readListPrec :: ReadPrec [BufferMode] | |
Show BufferMode | |
Defined in GHC.Internal.IO.Handle.Types Methods showsPrec :: Int -> BufferMode -> ShowS show :: BufferMode -> String showList :: [BufferMode] -> ShowS | |
Eq BufferMode | |
Defined in GHC.Internal.IO.Handle.Types | |
Ord BufferMode | |
Defined in GHC.Internal.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.Internal.IO.Handle.Types Methods readsPrec :: Int -> ReadS NewlineMode readList :: ReadS [NewlineMode] readPrec :: ReadPrec NewlineMode readListPrec :: ReadPrec [NewlineMode] | |
Show NewlineMode | |
Defined in GHC.Internal.IO.Handle.Types Methods showsPrec :: Int -> NewlineMode -> ShowS show :: NewlineMode -> String showList :: [NewlineMode] -> ShowS | |
Eq NewlineMode | |
Defined in GHC.Internal.IO.Handle.Types | |
Ord NewlineMode | |
Defined in GHC.Internal.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 # |
newEmptyMVar :: IO (MVar a) #
getContents' :: IO String #
newtype WrappedArrow (a :: Type -> Type -> Type) b c #
Constructors
WrapArrow | |
Fields
|
Instances
Generic1 (WrappedArrow a b :: Type -> Type) | |||||
Defined in Control.Applicative Associated Types
Methods from1 :: WrappedArrow a b a0 -> Rep1 (WrappedArrow a b) a0 to1 :: 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 Control.Applicative 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
Methods from :: WrappedArrow a b c -> Rep (WrappedArrow a b c) x to :: Rep (WrappedArrow a b c) x -> 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)))) |
newtype WrappedMonad (m :: Type -> Type) a #
Constructors
WrapMonad | |
Fields
|
Instances
Generic1 (WrappedMonad m :: Type -> Type) | |||||
Defined in Control.Applicative Associated Types
Methods from1 :: WrappedMonad m a -> Rep1 (WrappedMonad m) a to1 :: 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 Control.Applicative 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
Methods from :: WrappedMonad m a -> Rep (WrappedMonad m a) x to :: Rep (WrappedMonad m a) x -> 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)))) |
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 |
callCommand :: String -> IO () #
getEnvironment :: IO [(String, String)] #
getProgName :: IO String #
withProgName :: String -> IO a -> IO a #
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 | |
Constructors
Inherit | |
UseHandle Handle | |
CreatePipe | |
NoStream |
data ProcessHandle #
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 #
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 |
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 #
genericLength :: Num i => [a] -> i #
zipWith7 :: (a -> b -> c -> d -> e -> f -> g -> h) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -> [h] #
deleteFirstsBy :: (a -> a -> Bool) -> [a] -> [a] -> [a] #
genericIndex :: Integral i => [a] -> i -> a #
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]] #
isEOFError :: IOError -> Bool #
isSubsequenceOf :: Eq a => [a] -> [a] -> Bool #
isHexDigit :: Char -> Bool #
isOctDigit :: Char -> Bool #
lexLitChar :: ReadS String #
readLitChar :: ReadS Char #
Constructors
Flag | |
helpText :: [String] -> HelpFormat -> Mode a -> [Text] #
data HelpFormat #
Instances
digitToInt :: Char -> Int #
generalCategory :: Char -> GeneralCategory #
isAsciiLower :: Char -> Bool #
isAsciiUpper :: Char -> Bool #
isLowerCase :: Char -> Bool #
isUpperCase :: Char -> Bool #
Constructors
FlagReq | |
FlagOpt String | |
FlagOptRare String | |
FlagNone |
Instances
Packer FlagInfo | |
Defined in System.Console.CmdArgs.Helper | |
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 |
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 #
exitFailure :: IO a #
modifyMVar :: MVar a -> (a -> IO (a, b)) -> IO b #
addMVarFinalizer :: MVar a -> IO () -> IO () #
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 #
isEmptyMVar :: MVar a -> IO Bool #
tryPutMVar :: MVar a -> a -> IO Bool #
tryReadMVar :: MVar a -> IO (Maybe a) #
tryTakeMVar :: MVar a -> IO (Maybe a) #
getChanContents :: Chan a -> IO [a] #
writeList2Chan :: Chan a -> [a] -> IO () #
signalQSem :: QSem -> IO () #
signalQSemN :: QSemN -> Int -> IO () #
threadWaitRead :: Fd -> IO () #
threadWaitReadSTM :: Fd -> IO (STM (), IO ()) #
threadWaitWrite :: Fd -> IO () #
threadWaitWriteSTM :: Fd -> IO (STM (), IO ()) #
isCurrentThreadBound :: IO Bool #
rtsSupportsBoundThreads :: Bool #
runInBoundThread :: IO a -> IO a #
runInUnboundThread :: IO a -> IO a #
getNumCapabilities :: IO Int #
killThread :: ThreadId -> IO () #
mkWeakThreadId :: ThreadId -> IO (Weak ThreadId) #
myThreadId :: IO ThreadId #
setNumCapabilities :: Int -> IO () #
threadCapability :: ThreadId -> IO (Int, Bool) #
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 #
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 #