hledger-1.30.1: Command-line interface for the hledger accounting system
Safe HaskellSafe-Inferred
LanguageHaskell2010

Hledger.Cli.Script

Description

A convenient module to import in hledger scripts, aiming to provide the most useful imports and reduce boilerplate. |

Synopsis

Documentation

data Text #

Instances

Instances details
FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Text

parseJSONList :: Value -> Parser [Text]

FromJSONKey Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Text

fromJSONKeyList :: FromJSONKeyFunction [Text]

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Text -> Value

toEncoding :: Text -> Encoding

toJSONList :: [Text] -> Value

toEncodingList :: [Text] -> Encoding

ToJSONKey Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Text

toJSONKeyList :: ToJSONKeyFunction [Text]

Chunk Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

Associated Types

type ChunkElem Text

Methods

nullChunk :: Text -> Bool

pappendChunk :: State Text -> Text -> State Text

atBufferEnd :: Text -> State Text -> Pos

bufferElemAt :: Text -> Pos -> State Text -> Maybe (ChunkElem Text, Int)

chunkElemToChar :: Text -> ChunkElem Text -> Char

Show CsvRules 
Instance details

Defined in Hledger.Read.RulesReader

Methods

showsPrec :: Int -> CsvRules -> ShowS

show :: CsvRules -> String

showList :: [CsvRules] -> ShowS

HasChars Text 
Instance details

Defined in Text.DocLayout

Methods

foldrChar :: (Char -> b -> b) -> b -> Text -> b

foldlChar :: (b -> Char -> b) -> b -> Text -> b

replicateChar :: Int -> Char -> Text

isNull :: Text -> Bool

splitLines :: Text -> [Text]

Eq CsvRules 
Instance details

Defined in Hledger.Read.RulesReader

Methods

(==) :: CsvRules -> CsvRules -> Bool

(/=) :: CsvRules -> CsvRules -> Bool

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int

hash :: Text -> Int

Anon Text Source # 
Instance details

Defined in Hledger.Cli.Anon

Methods

anon :: Text -> Text Source #

ToHtml Text 
Instance details

Defined in Lucid.Base

Methods

toHtml :: forall (m :: Type -> Type). Monad m => Text -> HtmlT m () Source #

toHtmlRaw :: forall (m :: Type -> Type). Monad m => Text -> HtmlT m () Source #

Stream Text 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token Text

type Tokens Text

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 
Instance details

Defined in Text.Megaparsec.Stream

Methods

reachOffset :: Int -> PosState Text -> (Maybe String, PosState Text)

reachOffsetNoLine :: Int -> PosState Text -> PosState Text

VisualStream Text 
Instance details

Defined in Text.Megaparsec.Stream

Methods

showTokens :: Proxy Text -> NonEmpty (Token Text) -> String

tokensLength :: Proxy Text -> NonEmpty (Token Text) -> Int

GrowingAppend Text 
Instance details

Defined in Data.MonoTraversable

MonoFoldable Text 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element Text -> m) -> Text -> m

ofoldr :: (Element Text -> b -> b) -> b -> Text -> b

ofoldl' :: (a -> Element Text -> a) -> a -> Text -> a

otoList :: Text -> [Element Text]

oall :: (Element Text -> Bool) -> Text -> Bool

oany :: (Element Text -> Bool) -> Text -> Bool

onull :: Text -> Bool

olength :: Text -> Int

olength64 :: Text -> Int64

ocompareLength :: Integral i => Text -> i -> Ordering

otraverse_ :: Applicative f => (Element Text -> f b) -> Text -> f ()

ofor_ :: Applicative f => Text -> (Element Text -> f b) -> f ()

omapM_ :: Applicative m => (Element Text -> m ()) -> Text -> m ()

oforM_ :: Applicative m => Text -> (Element Text -> m ()) -> m ()

ofoldlM :: Monad m => (a -> Element Text -> m a) -> a -> Text -> m a

ofoldMap1Ex :: Semigroup m => (Element Text -> m) -> Text -> m

ofoldr1Ex :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text

ofoldl1Ex' :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text

headEx :: Text -> Element Text

lastEx :: Text -> Element Text

unsafeHead :: Text -> Element Text

unsafeLast :: Text -> Element Text

maximumByEx :: (Element Text -> Element Text -> Ordering) -> Text -> Element Text

minimumByEx :: (Element Text -> Element Text -> Ordering) -> Text -> Element Text

oelem :: Element Text -> Text -> Bool

onotElem :: Element Text -> Text -> Bool

MonoFunctor Text 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element Text -> Element Text) -> Text -> Text

MonoPointed Text 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element Text -> Text

MonoTraversable Text 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element Text -> f (Element Text)) -> Text -> f Text

omapM :: Applicative m => (Element Text -> m (Element Text)) -> Text -> m Text

IsSequence Text 
Instance details

Defined in Data.Sequences

Methods

fromList :: [Element Text] -> Text

lengthIndex :: Text -> Index Text

break :: (Element Text -> Bool) -> Text -> (Text, Text)

span :: (Element Text -> Bool) -> Text -> (Text, Text)

dropWhile :: (Element Text -> Bool) -> Text -> Text

takeWhile :: (Element Text -> Bool) -> Text -> Text

splitAt :: Index Text -> Text -> (Text, Text)

unsafeSplitAt :: Index Text -> Text -> (Text, Text)

take :: Index Text -> Text -> Text

unsafeTake :: Index Text -> Text -> Text

drop :: Index Text -> Text -> Text

unsafeDrop :: Index Text -> Text -> Text

dropEnd :: Index Text -> Text -> Text

partition :: (Element Text -> Bool) -> Text -> (Text, Text)

uncons :: Text -> Maybe (Element Text, Text)

unsnoc :: Text -> Maybe (Text, Element Text)

filter :: (Element Text -> Bool) -> Text -> Text

filterM :: Monad m => (Element Text -> m Bool) -> Text -> m Text

replicate :: Index Text -> Element Text -> Text

replicateM :: Monad m => Index Text -> m (Element Text) -> m Text

groupBy :: (Element Text -> Element Text -> Bool) -> Text -> [Text]

groupAllOn :: Eq b => (Element Text -> b) -> Text -> [Text]

subsequences :: Text -> [Text]

permutations :: Text -> [Text]

tailEx :: Text -> Text

tailMay :: Text -> Maybe Text

initEx :: Text -> Text

initMay :: Text -> Maybe Text

unsafeTail :: Text -> Text

unsafeInit :: Text -> Text

index :: Text -> Index Text -> Maybe (Element Text)

indexEx :: Text -> Index Text -> Element Text

unsafeIndex :: Text -> Index Text -> Element Text

splitWhen :: (Element Text -> Bool) -> Text -> [Text]

SemiSequence Text 
Instance details

Defined in Data.Sequences

Associated Types

type Index Text

Methods

intersperse :: Element Text -> Text -> Text

reverse :: Text -> Text

find :: (Element Text -> Bool) -> Text -> Maybe (Element Text)

sortBy :: (Element Text -> Element Text -> Ordering) -> Text -> Text

cons :: Element Text -> Text -> Text

snoc :: Text -> Element Text -> Text

Textual Text 
Instance details

Defined in Data.Sequences

Methods

words :: Text -> [Text]

unwords :: (Element seq ~ Text, MonoFoldable seq) => seq -> Text

lines :: Text -> [Text]

unlines :: (Element seq ~ Text, MonoFoldable seq) => seq -> Text

toLower :: Text -> Text

toUpper :: Text -> Text

toCaseFold :: Text -> Text

breakWord :: Text -> (Text, Text)

breakLine :: Text -> (Text, Text)

Pretty Text 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Text -> Doc ann

prettyList :: [Text] -> Doc ann

Extract Text 
Instance details

Defined in Text.Regex.Base.RegexLike

Methods

before :: Int -> Text -> Text

after :: Int -> Text -> Text

empty :: Text

extract :: (Int, Int) -> Text -> Text

Term Text Attribute

Some terms (like style_, title_) can be used for attributes as well as elements.

Instance details

Defined in Lucid.Base

TermRaw Text Attribute

Some termRaws (like style_, title_) can be used for attributes as well as elements.

Instance details

Defined in Lucid.Base

LazySequence Text Text 
Instance details

Defined in Data.Sequences

Methods

toChunks :: Text -> [Text0]

fromChunks :: [Text0] -> Text

toStrict :: Text -> Text0

fromStrict :: Text0 -> Text

Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

Methods

encodeUtf8 :: Text -> ByteString

decodeUtf8 :: ByteString -> Text

(Monad m, a ~ ()) => TermRaw Text (HtmlT m a)

Given children immediately, just use that and expect no attributes.

Instance details

Defined in Lucid.Base

Methods

termRaw :: Text -> Text -> HtmlT m a Source #

termRawWith :: Text -> [Attribute] -> Text -> HtmlT m a Source #

Stream (NoShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token (NoShareInput Text)

type Tokens (NoShareInput Text)

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) 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token (ShareInput Text)

type Tokens (ShareInput Text)

Methods

tokenToChunk :: Proxy (ShareInput Text) -> Token (ShareInput Text) -> Tokens (ShareInput Text)

tokensToChunk :: Proxy (ShareInput Text) -> [Token (ShareInput Text)] -> Tokens (ShareInput Text)

chunkToTokens :: Proxy (ShareInput Text) -> Tokens (ShareInput Text) -> [Token (ShareInput Text)]

chunkLength :: Proxy (ShareInput Text) -> Tokens (ShareInput Text) -> Int

chunkEmpty :: Proxy (ShareInput Text) -> Tokens (ShareInput Text) -> Bool

take1_ :: ShareInput Text -> Maybe (Token (ShareInput Text), ShareInput Text)

takeN_ :: Int -> ShareInput Text -> Maybe (Tokens (ShareInput Text), ShareInput Text)

takeWhile_ :: (Token (ShareInput Text) -> Bool) -> ShareInput Text -> (Tokens (ShareInput Text), ShareInput Text)

Ord (ParseError Text HledgerParseErrorData) 
Instance details

Defined in Text.Megaparsec.Custom

Methods

compare :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Ordering #

(<) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool #

(<=) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool #

(>) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool #

(>=) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool #

max :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData #

min :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData #

type ChunkElem Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type ChunkElem Text = Char
type State Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State Text = Buffer
type Item Text 
Instance details

Defined in Data.Text

type Item Text = Char
type Token Text 
Instance details

Defined in Text.Megaparsec.Stream

type Token Text = Token (ShareInput Text)
type Tokens Text 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens Text = Tokens (ShareInput Text)
type Element Text 
Instance details

Defined in Data.MonoTraversable

type Element Text = Char
type Index Text 
Instance details

Defined in Data.Sequences

type Index Text = Int
type Token (NoShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Token (NoShareInput Text) = Char
type Token (ShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Token (ShareInput Text) = Char
type Tokens (NoShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (NoShareInput Text) = Text
type Tokens (ShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (ShareInput Text) = Text

data Char #

Instances

Instances details
FromJSON Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Char

parseJSONList :: Value -> Parser [Char]

FromJSONKey Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Char

fromJSONKeyList :: FromJSONKeyFunction [Char]

ToJSON Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Char -> Value

toEncoding :: Char -> Encoding

toJSONList :: [Char] -> Value

toEncodingList :: [Char] -> Encoding

ToJSONKey Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Char

toJSONKeyList :: ToJSONKeyFunction [Char]

Data Char 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Char -> c Char

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Char

toConstr :: Char -> Constr

dataTypeOf :: Char -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Char)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Char)

gmapT :: (forall b. Data b => b -> b) -> Char -> Char

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r

gmapQ :: (forall d. Data d => d -> u) -> Char -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Char -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Char -> m Char

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char

Bounded Char 
Instance details

Defined in GHC.Enum

Enum Char 
Instance details

Defined in GHC.Enum

Methods

succ :: Char -> Char

pred :: Char -> Char

toEnum :: Int -> Char

fromEnum :: Char -> Int

enumFrom :: Char -> [Char]

enumFromThen :: Char -> Char -> [Char]

enumFromTo :: Char -> Char -> [Char]

enumFromThenTo :: Char -> Char -> Char -> [Char]

Ix Char 
Instance details

Defined in GHC.Ix

Methods

range :: (Char, Char) -> [Char]

index :: (Char, Char) -> Char -> Int

unsafeIndex :: (Char, Char) -> Char -> Int

inRange :: (Char, Char) -> Char -> Bool

rangeSize :: (Char, Char) -> Int

unsafeRangeSize :: (Char, Char) -> Int

Read Char 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Char

readList :: ReadS [Char]

readPrec :: ReadPrec Char

readListPrec :: ReadPrec [Char]

Show Char 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Char -> ShowS

show :: Char -> String

showList :: [Char] -> ShowS

IsChar Char 
Instance details

Defined in Text.Printf

Methods

toChar :: Char -> Char #

fromChar :: Char -> Char #

PrintfArg Char 
Instance details

Defined in Text.Printf

NFData Char 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Char -> ()

HasChars String 
Instance details

Defined in Text.DocLayout

Methods

foldrChar :: (Char -> b -> b) -> b -> String -> b

foldlChar :: (b -> Char -> b) -> b -> String -> b

replicateChar :: Int -> Char -> String

isNull :: String -> Bool

splitLines :: String -> [String]

Eq Char 
Instance details

Defined in GHC.Classes

Methods

(==) :: Char -> Char -> Bool

(/=) :: Char -> Char -> Bool

Ord Char 
Instance details

Defined in GHC.Classes

Methods

compare :: Char -> Char -> Ordering #

(<) :: Char -> Char -> Bool #

(<=) :: Char -> Char -> Bool #

(>) :: Char -> Char -> Bool #

(>=) :: Char -> Char -> Bool #

max :: Char -> Char -> Char #

min :: Char -> Char -> Char #

Hashable Char 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Char -> Int

hash :: Char -> Int

ToHtml String 
Instance details

Defined in Lucid.Base

Methods

toHtml :: forall (m :: Type -> Type). Monad m => String -> HtmlT m () Source #

toHtmlRaw :: forall (m :: Type -> Type). Monad m => String -> HtmlT m () Source #

TraversableStream String 
Instance details

Defined in Text.Megaparsec.Stream

Methods

reachOffset :: Int -> PosState String -> (Maybe String, PosState String)

reachOffsetNoLine :: Int -> PosState String -> PosState String

VisualStream String 
Instance details

Defined in Text.Megaparsec.Stream

Methods

showTokens :: Proxy String -> NonEmpty (Token String) -> String

tokensLength :: Proxy String -> NonEmpty (Token String) -> Int

Pretty Char 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Char -> Doc ann

prettyList :: [Char] -> Doc ann

Uniform Char 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Char

UniformRange Char 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Char, Char) -> g -> m Char

Extract String 
Instance details

Defined in Text.Regex.Base.RegexLike

Methods

before :: Int -> String -> String

after :: Int -> String -> String

empty :: String

extract :: (Int, Int) -> String -> String

Assertable String 
Instance details

Defined in Test.Tasty.HUnit.Orig

Methods

assert :: String -> Assertion #

ErrorList Char 
Instance details

Defined in Control.Monad.Trans.Error

Methods

listMsg :: String -> [Char]

Unbox Char 
Instance details

Defined in Data.Vector.Unboxed.Base

RegexLike Regexp String 
Instance details

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 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Char -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Char -> Code m Char

Vector Vector Char 
Instance details

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 ()

elemseq :: Vector Char -> Char -> b -> b

MVector MVector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Char -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Char -> MVector s Char

basicOverlaps :: MVector s Char -> MVector s Char -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Char)

basicInitialize :: MVector s Char -> ST s ()

basicUnsafeReplicate :: Int -> Char -> ST s (MVector s Char)

basicUnsafeRead :: MVector s Char -> Int -> ST s Char

basicUnsafeWrite :: MVector s Char -> Int -> Char -> ST s ()

basicClear :: MVector s Char -> ST s ()

basicSet :: MVector s Char -> Char -> ST s ()

basicUnsafeCopy :: MVector s Char -> MVector s Char -> ST s ()

basicUnsafeMove :: MVector s Char -> MVector s Char -> ST s ()

basicUnsafeGrow :: MVector s Char -> Int -> ST s (MVector s Char)

RegexContext Regexp String String 
Instance details

Defined in Hledger.Utils.Regex

Methods

match :: Regexp -> String -> String

matchM :: MonadFail m => Regexp -> String -> m String

Generic1 (URec Char :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Char) :: k -> Type

Methods

from1 :: forall (a :: k0). URec Char a -> Rep1 (URec Char) a

to1 :: forall (a :: k0). Rep1 (URec Char) a -> URec Char a

Foldable (UChar :: Type -> Type) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UChar m -> m

foldMap :: Monoid m => (a -> m) -> UChar a -> m

foldMap' :: Monoid m => (a -> m) -> UChar a -> m

foldr :: (a -> b -> b) -> b -> UChar a -> b #

foldr' :: (a -> b -> b) -> b -> UChar a -> b

foldl :: (b -> a -> b) -> b -> UChar a -> b #

foldl' :: (b -> a -> b) -> b -> UChar a -> b #

foldr1 :: (a -> a -> a) -> UChar a -> a #

foldl1 :: (a -> a -> a) -> UChar a -> a #

toList :: UChar a -> [a]

null :: UChar a -> Bool #

length :: UChar a -> Int #

elem :: Eq a => a -> UChar a -> Bool #

maximum :: Ord a => UChar a -> a #

minimum :: Ord a => UChar a -> a #

sum :: Num a => UChar a -> a #

product :: Num a => UChar a -> a #

Traversable (UChar :: Type -> Type) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UChar a -> f (UChar b)

sequenceA :: Applicative f => UChar (f a) -> f (UChar a)

mapM :: Monad m => (a -> m b) -> UChar a -> m (UChar b) #

sequence :: Monad m => UChar (m a) -> m (UChar a) #

OutputCap [Char] 
Instance details

Defined in System.Console.Terminfo.Base

Methods

hasOkPadding :: [Char] -> String -> Bool

outputCap :: ([Int] -> String) -> [Int] -> [Char]

TermStr [Char] 
Instance details

Defined in System.Console.Terminfo.Base

Functor (URec Char :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Char a -> URec Char b #

(<$) :: a -> URec Char b -> URec Char a #

Generic (URec Char p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Char p) :: Type -> Type

Methods

from :: URec Char p -> Rep (URec Char p) x

to :: Rep (URec Char p) x -> URec Char p

Show (URec Char p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Char p -> ShowS

show :: URec Char p -> String

showList :: [URec Char p] -> ShowS

Eq (URec Char p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: URec Char p -> URec Char p -> Bool

(/=) :: URec Char p -> URec Char p -> Bool

Ord (URec Char p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Char p -> URec Char p -> Ordering #

(<) :: URec Char p -> URec Char p -> Bool #

(<=) :: URec Char p -> URec Char p -> Bool #

(>) :: URec Char p -> URec Char p -> Bool #

(>=) :: URec Char p -> URec Char p -> Bool #

max :: URec Char p -> URec Char p -> URec Char p #

min :: URec Char p -> URec Char p -> URec Char p #

newtype Vector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Char = V_Char (Vector Char)
data URec Char (p :: k) 
Instance details

Defined in GHC.Generics

data URec Char (p :: k) = UChar {}
newtype MVector s Char 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Char = MV_Char (MVector s Char)
type Rep1 (URec Char :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (URec Char :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "uChar#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UChar :: k -> Type)))
type Rep (URec Char p) 
Instance details

Defined in GHC.Generics

type Rep (URec Char p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "uChar#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UChar :: Type -> Type)))

data Ordering #

Constructors

LT 
EQ 
GT 

Instances

Instances details
FromJSON Ordering 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Ordering

parseJSONList :: Value -> Parser [Ordering]

ToJSON Ordering 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Ordering -> Value

toEncoding :: Ordering -> Encoding

toJSONList :: [Ordering] -> Value

toEncodingList :: [Ordering] -> Encoding

Data Ordering 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ordering -> c Ordering

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Ordering

toConstr :: Ordering -> Constr

dataTypeOf :: Ordering -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Ordering)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Ordering)

gmapT :: (forall b. Data b => b -> b) -> Ordering -> Ordering

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r

gmapQ :: (forall d. Data d => d -> u) -> Ordering -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Ordering -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering

Monoid Ordering 
Instance details

Defined in GHC.Base

Semigroup Ordering 
Instance details

Defined in GHC.Base

Methods

(<>) :: Ordering -> Ordering -> Ordering

sconcat :: NonEmpty Ordering -> Ordering

stimes :: Integral b => b -> Ordering -> Ordering

Bounded Ordering 
Instance details

Defined in GHC.Enum

Enum Ordering 
Instance details

Defined in GHC.Enum

Generic Ordering 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Ordering :: Type -> Type

Methods

from :: Ordering -> Rep Ordering x

to :: Rep Ordering x -> Ordering

Ix Ordering 
Instance details

Defined in GHC.Ix

Read Ordering 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Ordering

readList :: ReadS [Ordering]

readPrec :: ReadPrec Ordering

readListPrec :: ReadPrec [Ordering]

Show Ordering 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Ordering -> ShowS

show :: Ordering -> String

showList :: [Ordering] -> ShowS

Default Ordering 
Instance details

Defined in Data.Default.Class

Methods

def :: Ordering

NFData Ordering 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ordering -> ()

Eq Ordering 
Instance details

Defined in GHC.Classes

Methods

(==) :: Ordering -> Ordering -> Bool

(/=) :: Ordering -> Ordering -> Bool

Ord Ordering 
Instance details

Defined in GHC.Classes

Methods

compare :: Ordering -> Ordering -> Ordering #

(<) :: Ordering -> Ordering -> Bool #

(<=) :: Ordering -> Ordering -> Bool #

(>) :: Ordering -> Ordering -> Bool #

(>=) :: Ordering -> Ordering -> Bool #

max :: Ordering -> Ordering -> Ordering #

min :: Ordering -> Ordering -> Ordering #

Hashable Ordering 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ordering -> Int

hash :: Ordering -> Int

type Rep Ordering 
Instance details

Defined in GHC.Generics

type Rep Ordering = D1 ('MetaData "Ordering" "GHC.Types" "ghc-prim" 'False) (C1 ('MetaCons "LT" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "EQ" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GT" 'PrefixI 'False) (U1 :: Type -> Type)))

data Maybe a #

Constructors

Nothing 
Just a 

Instances

Instances details
FromJSON1 Maybe 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Maybe a)

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Maybe a]

ToJSON1 Maybe 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Maybe a -> Value

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Maybe a] -> Value

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Maybe a -> Encoding

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Maybe a] -> Encoding

MonadFail Maybe 
Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> Maybe a #

Foldable Maybe 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Maybe m -> m

foldMap :: Monoid m => (a -> m) -> Maybe a -> m

foldMap' :: Monoid m => (a -> m) -> Maybe a -> m

foldr :: (a -> b -> b) -> b -> Maybe a -> b #

foldr' :: (a -> b -> b) -> b -> Maybe a -> b

foldl :: (b -> a -> b) -> b -> Maybe a -> b #

foldl' :: (b -> a -> b) -> b -> Maybe a -> b #

foldr1 :: (a -> a -> a) -> Maybe a -> a #

foldl1 :: (a -> a -> a) -> Maybe a -> a #

toList :: Maybe a -> [a]

null :: Maybe a -> Bool #

length :: Maybe a -> Int #

elem :: Eq a => a -> Maybe a -> Bool #

maximum :: Ord a => Maybe a -> a #

minimum :: Ord a => Maybe a -> a #

sum :: Num a => Maybe a -> a #

product :: Num a => Maybe a -> a #

Traversable Maybe 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Maybe a -> f (Maybe b)

sequenceA :: Applicative f => Maybe (f a) -> f (Maybe a)

mapM :: Monad m => (a -> m b) -> Maybe a -> m (Maybe b) #

sequence :: Monad m => Maybe (m a) -> m (Maybe a) #

Alternative Maybe 
Instance details

Defined in GHC.Base

Methods

empty :: Maybe a #

(<|>) :: Maybe a -> Maybe a -> Maybe a #

some :: Maybe a -> Maybe [a] #

many :: Maybe a -> Maybe [a] #

Applicative Maybe 
Instance details

Defined in GHC.Base

Methods

pure :: a -> Maybe a #

(<*>) :: Maybe (a -> b) -> Maybe a -> Maybe b #

liftA2 :: (a -> b -> c) -> Maybe a -> Maybe b -> Maybe c #

(*>) :: Maybe a -> Maybe b -> Maybe b #

(<*) :: Maybe a -> Maybe b -> Maybe a #

Functor Maybe 
Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> Maybe a -> Maybe b #

(<$) :: a -> Maybe b -> Maybe a #

Monad Maybe 
Instance details

Defined in GHC.Base

Methods

(>>=) :: Maybe a -> (a -> Maybe b) -> Maybe b #

(>>) :: Maybe a -> Maybe b -> Maybe b #

return :: a -> Maybe a #

MonadPlus Maybe 
Instance details

Defined in GHC.Base

Methods

mzero :: Maybe a #

mplus :: Maybe a -> Maybe a -> Maybe a #

NFData1 Maybe 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Maybe a -> ()

MonadThrow Maybe 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> Maybe a

Hashable1 Maybe 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Maybe a -> Int

Generic1 Maybe 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Maybe :: k -> Type

Methods

from1 :: forall (a :: k). Maybe a -> Rep1 Maybe a

to1 :: forall (a :: k). Rep1 Maybe a -> Maybe a

Reportable Maybe e 
Instance details

Defined in Hledger.Reports.ReportOptions

Methods

report :: a -> Maybe (Either e a) -> Maybe a

(Selector s, GToJSON' enc arity (K1 i (Maybe a) :: Type -> Type), KeyValuePair enc pairs, Monoid pairs) => RecordToPairs enc pairs arity (S1 s (K1 i (Maybe a) :: Type -> Type)) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

recordToPairs :: Options -> ToArgs enc arity a0 -> S1 s (K1 i (Maybe a)) a0 -> pairs

Lift a => Lift (Maybe a :: Type) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Maybe a -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Maybe a -> Code m (Maybe a)

(Selector s, FromJSON a) => RecordFromJSON' arity (S1 s (K1 i (Maybe a) :: Type -> Type)) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

recordParseJSON' :: (ConName :* (TypeName :* (Options :* FromArgs arity a0))) -> Object -> Parser (S1 s (K1 i (Maybe a)) a0)

FromJSON a => FromJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Maybe a)

parseJSONList :: Value -> Parser [Maybe a]

ToJSON a => ToJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Maybe a -> Value

toEncoding :: Maybe a -> Encoding

toJSONList :: [Maybe a] -> Value

toEncodingList :: [Maybe a] -> Encoding

Data a => Data (Maybe a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Maybe a -> c (Maybe a)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Maybe a)

toConstr :: Maybe a -> Constr

dataTypeOf :: Maybe a -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Maybe a))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Maybe a))

gmapT :: (forall b. Data b => b -> b) -> Maybe a -> Maybe a

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r

gmapQ :: (forall d. Data d => d -> u) -> Maybe a -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Maybe a -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a)

Semigroup a => Monoid (Maybe a) 
Instance details

Defined in GHC.Base

Methods

mempty :: Maybe a

mappend :: Maybe a -> Maybe a -> Maybe a

mconcat :: [Maybe a] -> Maybe a

Semigroup a => Semigroup (Maybe a) 
Instance details

Defined in GHC.Base

Methods

(<>) :: Maybe a -> Maybe a -> Maybe a

sconcat :: NonEmpty (Maybe a) -> Maybe a

stimes :: Integral b => b -> Maybe a -> Maybe a

Generic (Maybe a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Maybe a) :: Type -> Type

Methods

from :: Maybe a -> Rep (Maybe a) x

to :: Rep (Maybe a) x -> Maybe a

SingKind a => SingKind (Maybe a) 
Instance details

Defined in GHC.Generics

Associated Types

type DemoteRep (Maybe a)

Methods

fromSing :: forall (a0 :: Maybe a). Sing a0 -> DemoteRep (Maybe a)

Read a => Read (Maybe a) 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (Maybe a)

readList :: ReadS [Maybe a]

readPrec :: ReadPrec (Maybe a)

readListPrec :: ReadPrec [Maybe a]

Show a => Show (Maybe a) 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Maybe a -> ShowS

show :: Maybe a -> String

showList :: [Maybe a] -> ShowS

Default (Maybe a) 
Instance details

Defined in System.Console.CmdArgs.Default

Methods

def :: Maybe a

Default (Maybe a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Maybe a

NFData a => NFData (Maybe a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Maybe a -> ()

Eq a => Eq (Maybe a) 
Instance details

Defined in GHC.Maybe

Methods

(==) :: Maybe a -> Maybe a -> Bool

(/=) :: Maybe a -> Maybe a -> Bool

Ord a => Ord (Maybe a) 
Instance details

Defined in GHC.Maybe

Methods

compare :: Maybe a -> Maybe a -> Ordering #

(<) :: Maybe a -> Maybe a -> Bool #

(<=) :: Maybe a -> Maybe a -> Bool #

(>) :: Maybe a -> Maybe a -> Bool #

(>=) :: Maybe a -> Maybe a -> Bool #

max :: Maybe a -> Maybe a -> Maybe a #

min :: Maybe a -> Maybe a -> Maybe a #

Hashable a => Hashable (Maybe a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Maybe a -> Int

hash :: Maybe a -> Int

MonoFoldable (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Maybe a) -> m) -> Maybe a -> m

ofoldr :: (Element (Maybe a) -> b -> b) -> b -> Maybe a -> b

ofoldl' :: (a0 -> Element (Maybe a) -> a0) -> a0 -> Maybe a -> a0

otoList :: Maybe a -> [Element (Maybe a)]

oall :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool

oany :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool

onull :: Maybe a -> Bool

olength :: Maybe a -> Int

olength64 :: Maybe a -> Int64

ocompareLength :: Integral i => Maybe a -> i -> Ordering

otraverse_ :: Applicative f => (Element (Maybe a) -> f b) -> Maybe a -> f ()

ofor_ :: Applicative f => Maybe a -> (Element (Maybe a) -> f b) -> f ()

omapM_ :: Applicative m => (Element (Maybe a) -> m ()) -> Maybe a -> m ()

oforM_ :: Applicative m => Maybe a -> (Element (Maybe a) -> m ()) -> m ()

ofoldlM :: Monad m => (a0 -> Element (Maybe a) -> m a0) -> a0 -> Maybe a -> m a0

ofoldMap1Ex :: Semigroup m => (Element (Maybe a) -> m) -> Maybe a -> m

ofoldr1Ex :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a)

ofoldl1Ex' :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a)

headEx :: Maybe a -> Element (Maybe a)

lastEx :: Maybe a -> Element (Maybe a)

unsafeHead :: Maybe a -> Element (Maybe a)

unsafeLast :: Maybe a -> Element (Maybe a)

maximumByEx :: (Element (Maybe a) -> Element (Maybe a) -> Ordering) -> Maybe a -> Element (Maybe a)

minimumByEx :: (Element (Maybe a) -> Element (Maybe a) -> Ordering) -> Maybe a -> Element (Maybe a)

oelem :: Element (Maybe a) -> Maybe a -> Bool

onotElem :: Element (Maybe a) -> Maybe a -> Bool

MonoFunctor (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Maybe a

MonoPointed (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Maybe a) -> Maybe a

MonoTraversable (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Maybe a) -> f (Element (Maybe a))) -> Maybe a -> f (Maybe a)

omapM :: Applicative m => (Element (Maybe a) -> m (Element (Maybe a))) -> Maybe a -> m (Maybe a)

Pretty a => Pretty (Maybe a) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Maybe a -> Doc ann

prettyList :: [Maybe a] -> Doc ann

SingI ('Nothing :: Maybe a) 
Instance details

Defined in GHC.Generics

Methods

sing :: Sing 'Nothing

Each (Maybe a) (Maybe b) a b 
Instance details

Defined in Lens.Micro.Internal

Methods

each :: Traversal (Maybe a) (Maybe b) a b

SingI a2 => SingI ('Just a2 :: Maybe a1) 
Instance details

Defined in GHC.Generics

Methods

sing :: Sing ('Just a2)

type Rep1 Maybe 
Instance details

Defined in GHC.Generics

type Rep1 Maybe = D1 ('MetaData "Maybe" "GHC.Maybe" "base" 'False) (C1 ('MetaCons "Nothing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Just" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
type DemoteRep (Maybe a) 
Instance details

Defined in GHC.Generics

type DemoteRep (Maybe a) = Maybe (DemoteRep a)
type Rep (Maybe a) 
Instance details

Defined in GHC.Generics

type Rep (Maybe a) = D1 ('MetaData "Maybe" "GHC.Maybe" "base" 'False) (C1 ('MetaCons "Nothing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Just" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
data Sing (b :: Maybe a) 
Instance details

Defined in GHC.Generics

data Sing (b :: Maybe a) where
type Element (Maybe a) 
Instance details

Defined in Data.MonoTraversable

type Element (Maybe a) = a

class Functor f => Applicative (f :: Type -> Type) where #

Minimal complete definition

pure, ((<*>) | liftA2)

Methods

pure :: a -> f a #

(<*>) :: f (a -> b) -> f a -> f b #

liftA2 :: (a -> b -> c) -> f a -> f b -> f c #

(*>) :: f a -> f b -> f b #

(<*) :: f a -> f b -> f a #

Instances

Instances details
Applicative IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> IResult a #

(<*>) :: IResult (a -> b) -> IResult a -> IResult b #

liftA2 :: (a -> b -> c) -> IResult a -> IResult b -> IResult c #

(*>) :: IResult a -> IResult b -> IResult b #

(<*) :: IResult a -> IResult b -> IResult a #

Applicative Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> Parser a #

(<*>) :: Parser (a -> b) -> Parser a -> Parser b #

liftA2 :: (a -> b -> c) -> Parser a -> Parser b -> Parser c #

(*>) :: Parser a -> Parser b -> Parser b #

(<*) :: Parser a -> Parser b -> Parser a #

Applicative Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> Result a #

(<*>) :: Result (a -> b) -> Result a -> Result b #

liftA2 :: (a -> b -> c) -> Result a -> Result b -> Result c #

(*>) :: Result a -> Result b -> Result b #

(<*) :: Result a -> Result b -> Result a #

Applicative ZipList 
Instance details

Defined in Control.Applicative

Methods

pure :: a -> ZipList a #

(<*>) :: ZipList (a -> b) -> ZipList a -> ZipList b #

liftA2 :: (a -> b -> c) -> ZipList a -> ZipList b -> ZipList c #

(*>) :: ZipList a -> ZipList b -> ZipList b #

(<*) :: ZipList a -> ZipList b -> ZipList a #

Applicative Identity 
Instance details

Defined in Data.Functor.Identity

Methods

pure :: a -> Identity a #

(<*>) :: Identity (a -> b) -> Identity a -> Identity b #

liftA2 :: (a -> b -> c) -> Identity a -> Identity b -> Identity c #

(*>) :: Identity a -> Identity b -> Identity b #

(<*) :: Identity a -> Identity b -> Identity a #

Applicative Down 
Instance details

Defined in Data.Ord

Methods

pure :: a -> Down a #

(<*>) :: Down (a -> b) -> Down a -> Down b #

liftA2 :: (a -> b -> c) -> Down a -> Down b -> Down c #

(*>) :: Down a -> Down b -> Down b #

(<*) :: Down a -> Down b -> Down a #

Applicative First 
Instance details

Defined in Data.Semigroup

Methods

pure :: a -> First a #

(<*>) :: First (a -> b) -> First a -> First b #

liftA2 :: (a -> b -> c) -> First a -> First b -> First c #

(*>) :: First a -> First b -> First b #

(<*) :: First a -> First b -> First a #

Applicative Last 
Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Last a #

(<*>) :: Last (a -> b) -> Last a -> Last b #

liftA2 :: (a -> b -> c) -> Last a -> Last b -> Last c #

(*>) :: Last a -> Last b -> Last b #

(<*) :: Last a -> Last b -> Last a #

Applicative Max 
Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Max a #

(<*>) :: Max (a -> b) -> Max a -> Max b #

liftA2 :: (a -> b -> c) -> Max a -> Max b -> Max c #

(*>) :: Max a -> Max b -> Max b #

(<*) :: Max a -> Max b -> Max a #

Applicative Min 
Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Min a #

(<*>) :: Min (a -> b) -> Min a -> Min b #

liftA2 :: (a -> b -> c) -> Min a -> Min b -> Min c #

(*>) :: Min a -> Min b -> Min b #

(<*) :: Min a -> Min b -> Min a #

Applicative Dual 
Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Dual a #

(<*>) :: Dual (a -> b) -> Dual a -> Dual b #

liftA2 :: (a -> b -> c) -> Dual a -> Dual b -> Dual c #

(*>) :: Dual a -> Dual b -> Dual b #

(<*) :: Dual a -> Dual b -> Dual a #

Applicative Product 
Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Product a #

(<*>) :: Product (a -> b) -> Product a -> Product b #

liftA2 :: (a -> b -> c) -> Product a -> Product b -> Product c #

(*>) :: Product a -> Product b -> Product b #

(<*) :: Product a -> Product b -> Product a #

Applicative Sum 
Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Sum a #

(<*>) :: Sum (a -> b) -> Sum a -> Sum b #

liftA2 :: (a -> b -> c) -> Sum a -> Sum b -> Sum c #

(*>) :: Sum a -> Sum b -> Sum b #

(<*) :: Sum a -> Sum b -> Sum a #

Applicative STM 
Instance details

Defined in GHC.Conc.Sync

Methods

pure :: a -> STM a #

(<*>) :: STM (a -> b) -> STM a -> STM b #

liftA2 :: (a -> b -> c) -> STM a -> STM b -> STM c #

(*>) :: STM a -> STM b -> STM b #

(<*) :: STM a -> STM b -> STM a #

Applicative Par1 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> Par1 a #

(<*>) :: Par1 (a -> b) -> Par1 a -> Par1 b #

liftA2 :: (a -> b -> c) -> Par1 a -> Par1 b -> Par1 c #

(*>) :: Par1 a -> Par1 b -> Par1 b #

(<*) :: Par1 a -> Par1 b -> Par1 a #

Applicative P 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

pure :: a -> P a #

(<*>) :: P (a -> b) -> P a -> P b #

liftA2 :: (a -> b -> c) -> P a -> P b -> P c #

(*>) :: P a -> P b -> P b #

(<*) :: P a -> P b -> P a #

Applicative ReadP 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

pure :: a -> ReadP a #

(<*>) :: ReadP (a -> b) -> ReadP a -> ReadP b #

liftA2 :: (a -> b -> c) -> ReadP a -> ReadP b -> ReadP c #

(*>) :: ReadP a -> ReadP b -> ReadP b #

(<*) :: ReadP a -> ReadP b -> ReadP a #

Applicative ReadPrec 
Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

pure :: a -> ReadPrec a #

(<*>) :: ReadPrec (a -> b) -> ReadPrec a -> ReadPrec b #

liftA2 :: (a -> b -> c) -> ReadPrec a -> ReadPrec b -> ReadPrec c #

(*>) :: ReadPrec a -> ReadPrec b -> ReadPrec b #

(<*) :: ReadPrec a -> ReadPrec b -> ReadPrec a #

Applicative Put 
Instance details

Defined in Data.ByteString.Builder.Internal

Methods

pure :: a -> Put a #

(<*>) :: Put (a -> b) -> Put a -> Put b #

liftA2 :: (a -> b -> c) -> Put a -> Put b -> Put c #

(*>) :: Put a -> Put b -> Put b #

(<*) :: Put a -> Put b -> Put a #

Applicative RGB 
Instance details

Defined in Data.Colour.RGB

Methods

pure :: a -> RGB a #

(<*>) :: RGB (a -> b) -> RGB a -> RGB b #

liftA2 :: (a -> b -> c) -> RGB a -> RGB b -> RGB c #

(*>) :: RGB a -> RGB b -> RGB b #

(<*) :: RGB a -> RGB b -> RGB a #

Applicative Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

pure :: a -> Seq a #

(<*>) :: Seq (a -> b) -> Seq a -> Seq b #

liftA2 :: (a -> b -> c) -> Seq a -> Seq b -> Seq c #

(*>) :: Seq a -> Seq b -> Seq b #

(<*) :: Seq a -> Seq b -> Seq a #

Applicative Tree 
Instance details

Defined in Data.Tree

Methods

pure :: a -> Tree a #

(<*>) :: Tree (a -> b) -> Tree a -> Tree b #

liftA2 :: (a -> b -> c) -> Tree a -> Tree b -> Tree c #

(*>) :: Tree a -> Tree b -> Tree b #

(<*) :: Tree a -> Tree b -> Tree a #

Applicative DNonEmpty 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

pure :: a -> DNonEmpty a #

(<*>) :: DNonEmpty (a -> b) -> DNonEmpty a -> DNonEmpty b #

liftA2 :: (a -> b -> c) -> DNonEmpty a -> DNonEmpty b -> DNonEmpty c #

(*>) :: DNonEmpty a -> DNonEmpty b -> DNonEmpty b #

(<*) :: DNonEmpty a -> DNonEmpty b -> DNonEmpty a #

Applicative DList 
Instance details

Defined in Data.DList.Internal

Methods

pure :: a -> DList a #

(<*>) :: DList (a -> b) -> DList a -> DList b #

liftA2 :: (a -> b -> c) -> DList a -> DList b -> DList c #

(*>) :: DList a -> DList b -> DList b #

(<*) :: DList a -> DList b -> DList a #

Applicative IO 
Instance details

Defined in GHC.Base

Methods

pure :: a -> IO a #

(<*>) :: IO (a -> b) -> IO a -> IO b #

liftA2 :: (a -> b -> c) -> IO a -> IO b -> IO c #

(*>) :: IO a -> IO b -> IO b #

(<*) :: IO a -> IO b -> IO a #

Applicative Root 
Instance details

Defined in Numeric.RootFinding

Methods

pure :: a -> Root a #

(<*>) :: Root (a -> b) -> Root a -> Root b #

liftA2 :: (a -> b -> c) -> Root a -> Root b -> Root c #

(*>) :: Root a -> Root b -> Root b #

(<*) :: Root a -> Root b -> Root a #

Applicative Array 
Instance details

Defined in Data.Primitive.Array

Methods

pure :: a -> Array a #

(<*>) :: Array (a -> b) -> Array a -> Array b #

liftA2 :: (a -> b -> c) -> Array a -> Array b -> Array c #

(*>) :: Array a -> Array b -> Array b #

(<*) :: Array a -> Array b -> Array a #

Applicative SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

pure :: a -> SmallArray a #

(<*>) :: SmallArray (a -> b) -> SmallArray a -> SmallArray b #

liftA2 :: (a -> b -> c) -> SmallArray a -> SmallArray b -> SmallArray c #

(*>) :: SmallArray a -> SmallArray b -> SmallArray b #

(<*) :: SmallArray a -> SmallArray b -> SmallArray a #

Applicative Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

pure :: a -> Q a #

(<*>) :: Q (a -> b) -> Q a -> Q b #

liftA2 :: (a -> b -> c) -> Q a -> Q b -> Q c #

(*>) :: Q a -> Q b -> Q b #

(<*) :: Q a -> Q b -> Q a #

Applicative Capability 
Instance details

Defined in System.Console.Terminfo.Base

Methods

pure :: a -> Capability a #

(<*>) :: Capability (a -> b) -> Capability a -> Capability b #

liftA2 :: (a -> b -> c) -> Capability a -> Capability b -> Capability c #

(*>) :: Capability a -> Capability b -> Capability b #

(<*) :: Capability a -> Capability b -> Capability a #

Applicative Vector 
Instance details

Defined in Data.Vector

Methods

pure :: a -> Vector a #

(<*>) :: Vector (a -> b) -> Vector a -> Vector b #

liftA2 :: (a -> b -> c) -> Vector a -> Vector b -> Vector c #

(*>) :: Vector a -> Vector b -> Vector b #

(<*) :: Vector a -> Vector b -> Vector a #

Applicative NonEmpty 
Instance details

Defined in GHC.Base

Methods

pure :: a -> NonEmpty a #

(<*>) :: NonEmpty (a -> b) -> NonEmpty a -> NonEmpty b #

liftA2 :: (a -> b -> c) -> NonEmpty a -> NonEmpty b -> NonEmpty c #

(*>) :: NonEmpty a -> NonEmpty b -> NonEmpty b #

(<*) :: NonEmpty a -> NonEmpty b -> NonEmpty a #

Applicative Maybe 
Instance details

Defined in GHC.Base

Methods

pure :: a -> Maybe a #

(<*>) :: Maybe (a -> b) -> Maybe a -> Maybe b #

liftA2 :: (a -> b -> c) -> Maybe a -> Maybe b -> Maybe c #

(*>) :: Maybe a -> Maybe b -> Maybe b #

(<*) :: Maybe a -> Maybe b -> Maybe a #

Applicative Solo 
Instance details

Defined in GHC.Base

Methods

pure :: a -> Solo a #

(<*>) :: Solo (a -> b) -> Solo a -> Solo b #

liftA2 :: (a -> b -> c) -> Solo a -> Solo b -> Solo c #

(*>) :: Solo a -> Solo b -> Solo b #

(<*) :: Solo a -> Solo b -> Solo a #

Applicative [] 
Instance details

Defined in GHC.Base

Methods

pure :: a -> [a] #

(<*>) :: [a -> b] -> [a] -> [b] #

liftA2 :: (a -> b -> c) -> [a] -> [b] -> [c] #

(*>) :: [a] -> [b] -> [b] #

(<*) :: [a] -> [b] -> [a] #

Applicative (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

pure :: a -> Parser i a #

(<*>) :: Parser i (a -> b) -> Parser i a -> Parser i b #

liftA2 :: (a -> b -> c) -> Parser i a -> Parser i b -> Parser i c #

(*>) :: Parser i a -> Parser i b -> Parser i b #

(<*) :: Parser i a -> Parser i b -> Parser i a #

Monad m => Applicative (WrappedMonad m) 
Instance details

Defined in Control.Applicative

Methods

pure :: a -> WrappedMonad m a #

(<*>) :: WrappedMonad m (a -> b) -> WrappedMonad m a -> WrappedMonad m b #

liftA2 :: (a -> b -> c) -> WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m c #

(*>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b #

(<*) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m a #

Arrow a => Applicative (ArrowMonad a) 
Instance details

Defined in Control.Arrow

Methods

pure :: a0 -> ArrowMonad a a0 #

(<*>) :: ArrowMonad a (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b #

liftA2 :: (a0 -> b -> c) -> ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a c #

(*>) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a b #

(<*) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a a0 #

Applicative (Either e) 
Instance details

Defined in Data.Either

Methods

pure :: a -> Either e a #

(<*>) :: Either e (a -> b) -> Either e a -> Either e b #

liftA2 :: (a -> b -> c) -> Either e a -> Either e b -> Either e c #

(*>) :: Either e a -> Either e b -> Either e b #

(<*) :: Either e a -> Either e b -> Either e a #

Applicative (StateL s) 
Instance details

Defined in Data.Functor.Utils

Methods

pure :: a -> StateL s a #

(<*>) :: StateL s (a -> b) -> StateL s a -> StateL s b #

liftA2 :: (a -> b -> c) -> StateL s a -> StateL s b -> StateL s c #

(*>) :: StateL s a -> StateL s b -> StateL s b #

(<*) :: StateL s a -> StateL s b -> StateL s a #

Applicative (StateR s) 
Instance details

Defined in Data.Functor.Utils

Methods

pure :: a -> StateR s a #

(<*>) :: StateR s (a -> b) -> StateR s a -> StateR s b #

liftA2 :: (a -> b -> c) -> StateR s a -> StateR s b -> StateR s c #

(*>) :: StateR s a -> StateR s b -> StateR s b #

(<*) :: StateR s a -> StateR s b -> StateR s a #

Applicative (U1 :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> U1 a #

(<*>) :: U1 (a -> b) -> U1 a -> U1 b #

liftA2 :: (a -> b -> c) -> U1 a -> U1 b -> U1 c #

(*>) :: U1 a -> U1 b -> U1 b #

(<*) :: U1 a -> U1 b -> U1 a #

Applicative (ST s) 
Instance details

Defined in GHC.ST

Methods

pure :: a -> ST s a #

(<*>) :: ST s (a -> b) -> ST s a -> ST s b #

liftA2 :: (a -> b -> c) -> ST s a -> ST s b -> ST s c #

(*>) :: ST s a -> ST s b -> ST s b #

(<*) :: ST s a -> ST s b -> ST s a #

Monad m => Applicative (ZipSource m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ZipSource m a #

(<*>) :: ZipSource m (a -> b) -> ZipSource m a -> ZipSource m b #

liftA2 :: (a -> b -> c) -> ZipSource m a -> ZipSource m b -> ZipSource m c #

(*>) :: ZipSource m a -> ZipSource m b -> ZipSource m b #

(<*) :: ZipSource m a -> ZipSource m b -> ZipSource m a #

Applicative (SetM s) 
Instance details

Defined in Data.Graph

Methods

pure :: a -> SetM s a #

(<*>) :: SetM s (a -> b) -> SetM s a -> SetM s b #

liftA2 :: (a -> b -> c) -> SetM s a -> SetM s b -> SetM s c #

(*>) :: SetM s a -> SetM s b -> SetM s b #

(<*) :: SetM s a -> SetM s b -> SetM s a #

Functor f => Applicative (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

pure :: a -> Free f a #

(<*>) :: Free f (a -> b) -> Free f a -> Free f b #

liftA2 :: (a -> b -> c) -> Free f a -> Free f b -> Free f c #

(*>) :: Free f a -> Free f b -> Free f b #

(<*) :: Free f a -> Free f b -> Free f a #

Applicative m => Applicative (InputT m) 
Instance details

Defined in System.Console.Haskeline.InputT

Methods

pure :: a -> InputT m a #

(<*>) :: InputT m (a -> b) -> InputT m a -> InputT m b #

liftA2 :: (a -> b -> c) -> InputT m a -> InputT m b -> InputT m c #

(*>) :: InputT m a -> InputT m b -> InputT m b #

(<*) :: InputT m a -> InputT m b -> InputT m a #

Applicative m => Applicative (HtmlT m)

Based on the monad instance.

Instance details

Defined in Lucid.Base

Methods

pure :: a -> HtmlT m a #

(<*>) :: HtmlT m (a -> b) -> HtmlT m a -> HtmlT m b #

liftA2 :: (a -> b -> c) -> HtmlT m a -> HtmlT m b -> HtmlT m c #

(*>) :: HtmlT m a -> HtmlT m b -> HtmlT m b #

(<*) :: HtmlT m a -> HtmlT m b -> HtmlT m a #

Applicative f => Applicative (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

pure :: a -> WrappedPoly f a #

(<*>) :: WrappedPoly f (a -> b) -> WrappedPoly f a -> WrappedPoly f b #

liftA2 :: (a -> b -> c) -> WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f c #

(*>) :: WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f b #

(<*) :: WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f a #

Applicative m => Applicative (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

pure :: a -> ResourceT m a #

(<*>) :: ResourceT m (a -> b) -> ResourceT m a -> ResourceT m b #

liftA2 :: (a -> b -> c) -> ResourceT m a -> ResourceT m b -> ResourceT m c #

(*>) :: ResourceT m a -> ResourceT m b -> ResourceT m b #

(<*) :: ResourceT m a -> ResourceT m b -> ResourceT m a #

Semigroup a => Applicative (These a) 
Instance details

Defined in Data.Strict.These

Methods

pure :: a0 -> These a a0 #

(<*>) :: These a (a0 -> b) -> These a a0 -> These a b #

liftA2 :: (a0 -> b -> c) -> These a a0 -> These a b -> These a c #

(*>) :: These a a0 -> These a b -> These a b #

(<*) :: These a a0 -> These a b -> These a a0 #

Applicative m => Applicative (QuoteToQuasi m) 
Instance details

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) 
Instance details

Defined in Data.These

Methods

pure :: a0 -> These a a0 #

(<*>) :: These a (a0 -> b) -> These a a0 -> These a b #

liftA2 :: (a0 -> b -> c) -> These a a0 -> These a b -> These a c #

(*>) :: These a a0 -> These a b -> These a b #

(<*) :: These a a0 -> These a b -> These a a0 #

(Functor m, Monad m) => Applicative (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

pure :: a -> MaybeT m a #

(<*>) :: MaybeT m (a -> b) -> MaybeT m a -> MaybeT m b #

liftA2 :: (a -> b -> c) -> MaybeT m a -> MaybeT m b -> MaybeT m c #

(*>) :: MaybeT m a -> MaybeT m b -> MaybeT m b #

(<*) :: MaybeT m a -> MaybeT m b -> MaybeT m a #

Functor backend => Applicative (Wizard backend) 
Instance details

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) 
Instance details

Defined in GHC.Base

Methods

pure :: a0 -> (a, a0) #

(<*>) :: (a, a0 -> b) -> (a, a0) -> (a, b) #

liftA2 :: (a0 -> b -> c) -> (a, a0) -> (a, b) -> (a, c) #

(*>) :: (a, a0) -> (a, b) -> (a, b) #

(<*) :: (a, a0) -> (a, b) -> (a, a0) #

Arrow a => Applicative (WrappedArrow a b) 
Instance details

Defined in Control.Applicative

Methods

pure :: a0 -> WrappedArrow a b a0 #

(<*>) :: WrappedArrow a b (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 #

liftA2 :: (a0 -> b0 -> c) -> WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b c #

(*>) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b b0 #

(<*) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 #

Applicative m => Applicative (Kleisli m a) 
Instance details

Defined in Control.Arrow

Methods

pure :: a0 -> Kleisli m a a0 #

(<*>) :: Kleisli m a (a0 -> b) -> Kleisli m a a0 -> Kleisli m a b #

liftA2 :: (a0 -> b -> c) -> Kleisli m a a0 -> Kleisli m a b -> Kleisli m a c #

(*>) :: Kleisli m a a0 -> Kleisli m a b -> Kleisli m a b #

(<*) :: Kleisli m a a0 -> Kleisli m a b -> Kleisli m a a0 #

Monoid m => Applicative (Const m :: Type -> Type) 
Instance details

Defined in Data.Functor.Const

Methods

pure :: a -> Const m a #

(<*>) :: Const m (a -> b) -> Const m a -> Const m b #

liftA2 :: (a -> b -> c) -> Const m a -> Const m b -> Const m c #

(*>) :: Const m a -> Const m b -> Const m b #

(<*) :: Const m a -> Const m b -> Const m a #

Applicative f => Applicative (Alt f) 
Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Alt f a #

(<*>) :: Alt f (a -> b) -> Alt f a -> Alt f b #

liftA2 :: (a -> b -> c) -> Alt f a -> Alt f b -> Alt f c #

(*>) :: Alt f a -> Alt f b -> Alt f b #

(<*) :: Alt f a -> Alt f b -> Alt f a #

(Generic1 f, Applicative (Rep1 f)) => Applicative (Generically1 f) 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> Generically1 f a #

(<*>) :: Generically1 f (a -> b) -> Generically1 f a -> Generically1 f b #

liftA2 :: (a -> b -> c) -> Generically1 f a -> Generically1 f b -> Generically1 f c #

(*>) :: Generically1 f a -> Generically1 f b -> Generically1 f b #

(<*) :: Generically1 f a -> Generically1 f b -> Generically1 f a #

Applicative f => Applicative (Rec1 f) 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> Rec1 f a #

(<*>) :: Rec1 f (a -> b) -> Rec1 f a -> Rec1 f b #

liftA2 :: (a -> b -> c) -> Rec1 f a -> Rec1 f b -> Rec1 f c #

(*>) :: Rec1 f a -> Rec1 f b -> Rec1 f b #

(<*) :: Rec1 f a -> Rec1 f b -> Rec1 f a #

Biapplicative p => Applicative (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

pure :: a -> Join p a #

(<*>) :: Join p (a -> b) -> Join p a -> Join p b #

liftA2 :: (a -> b -> c) -> Join p a -> Join p b -> Join p c #

(*>) :: Join p a -> Join p b -> Join p b #

(<*) :: Join p a -> Join p b -> Join p a #

Monad m => Applicative (ZipSink i m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ZipSink i m a #

(<*>) :: ZipSink i m (a -> b) -> ZipSink i m a -> ZipSink i m b #

liftA2 :: (a -> b -> c) -> ZipSink i m a -> ZipSink i m b -> ZipSink i m c #

(*>) :: ZipSink i m a -> ZipSink i m b -> ZipSink i m b #

(<*) :: ZipSink i m a -> ZipSink i m b -> ZipSink i m a #

(Applicative f, Monad f) => Applicative (WhenMissing f x) 
Instance details

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) 
Instance details

Defined in Control.Monad.Free

Methods

pure :: a0 -> FreeT f a a0 #

(<*>) :: FreeT f a (a0 -> b) -> FreeT f a a0 -> FreeT f a b #

liftA2 :: (a0 -> b -> c) -> FreeT f a a0 -> FreeT f a b -> FreeT f a c #

(*>) :: FreeT f a a0 -> FreeT f a b -> FreeT f a b #

(<*) :: FreeT f a a0 -> FreeT f a b -> FreeT f a a0 #

Applicative (Bazaar a b) 
Instance details

Defined in Lens.Micro

Methods

pure :: a0 -> Bazaar a b a0 #

(<*>) :: Bazaar a b (a0 -> b0) -> Bazaar a b a0 -> Bazaar a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Bazaar a b a0 -> Bazaar a b b0 -> Bazaar a b c #

(*>) :: Bazaar a b a0 -> Bazaar a b b0 -> Bazaar a b b0 #

(<*) :: Bazaar a b a0 -> Bazaar a b b0 -> Bazaar a b a0 #

(Functor m, Monad m) => Applicative (StateT s m) 
Instance details

Defined in Lens.Micro

Methods

pure :: a -> StateT s m a #

(<*>) :: StateT s m (a -> b) -> StateT s m a -> StateT s m b #

liftA2 :: (a -> b -> c) -> StateT s m a -> StateT s m b -> StateT s m c #

(*>) :: StateT s m a -> StateT s m b -> StateT s m b #

(<*) :: StateT s m a -> StateT s m b -> StateT s m a #

Applicative (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

pure :: a -> Tagged s a #

(<*>) :: Tagged s (a -> b) -> Tagged s a -> Tagged s b #

liftA2 :: (a -> b -> c) -> Tagged s a -> Tagged s b -> Tagged s c #

(*>) :: Tagged s a -> Tagged s b -> Tagged s b #

(<*) :: Tagged s a -> Tagged s b -> Tagged s a #

(Functor m, Monad m) => Applicative (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

pure :: a -> ErrorT e m a #

(<*>) :: ErrorT e m (a -> b) -> ErrorT e m a -> ErrorT e m b #

liftA2 :: (a -> b -> c) -> ErrorT e m a -> ErrorT e m b -> ErrorT e m c #

(*>) :: ErrorT e m a -> ErrorT e m b -> ErrorT e m b #

(<*) :: ErrorT e m a -> ErrorT e m b -> ErrorT e m a #

(Functor m, Monad m) => Applicative (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

pure :: a -> ExceptT e m a #

(<*>) :: ExceptT e m (a -> b) -> ExceptT e m a -> ExceptT e m b #

liftA2 :: (a -> b -> c) -> ExceptT e m a -> ExceptT e m b -> ExceptT e m c #

(*>) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m b #

(<*) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m a #

Applicative m => Applicative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

pure :: a -> ReaderT r m a #

(<*>) :: ReaderT r m (a -> b) -> ReaderT r m a -> ReaderT r m b #

liftA2 :: (a -> b -> c) -> ReaderT r m a -> ReaderT r m b -> ReaderT r m c #

(*>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

(<*) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m a #

(Functor m, Monad m) => Applicative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

pure :: a -> StateT s m a #

(<*>) :: StateT s m (a -> b) -> StateT s m a -> StateT s m b #

liftA2 :: (a -> b -> c) -> StateT s m a -> StateT s m b -> StateT s m c #

(*>) :: StateT s m a -> StateT s m b -> StateT s m b #

(<*) :: StateT s m a -> StateT s m b -> StateT s m a #

(Monoid a, Monoid b) => Applicative ((,,) a b) 
Instance details

Defined in GHC.Base

Methods

pure :: a0 -> (a, b, a0) #

(<*>) :: (a, b, a0 -> b0) -> (a, b, a0) -> (a, b, b0) #

liftA2 :: (a0 -> b0 -> c) -> (a, b, a0) -> (a, b, b0) -> (a, b, c) #

(*>) :: (a, b, a0) -> (a, b, b0) -> (a, b, b0) #

(<*) :: (a, b, a0) -> (a, b, b0) -> (a, b, a0) #

(Applicative f, Applicative g) => Applicative (f :*: g) 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> (f :*: g) a #

(<*>) :: (f :*: g) (a -> b) -> (f :*: g) a -> (f :*: g) b #

liftA2 :: (a -> b -> c) -> (f :*: g) a -> (f :*: g) b -> (f :*: g) c #

(*>) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) b #

(<*) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) a #

Monoid c => Applicative (K1 i c :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> K1 i c a #

(<*>) :: K1 i c (a -> b) -> K1 i c a -> K1 i c b #

liftA2 :: (a -> b -> c0) -> K1 i c a -> K1 i c b -> K1 i c c0 #

(*>) :: K1 i c a -> K1 i c b -> K1 i c b #

(<*) :: K1 i c a -> K1 i c b -> K1 i c a #

Applicative (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ConduitT i o m a #

(<*>) :: ConduitT i o m (a -> b) -> ConduitT i o m a -> ConduitT i o m b #

liftA2 :: (a -> b -> c) -> ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m c #

(*>) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m b #

(<*) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m a #

Monad m => Applicative (ZipConduit i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ZipConduit i o m a #

(<*>) :: ZipConduit i o m (a -> b) -> ZipConduit i o m a -> ZipConduit i o m b #

liftA2 :: (a -> b -> c) -> ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m c #

(*>) :: ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m b #

(<*) :: ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m a #

(Monad f, Applicative f) => Applicative (WhenMatched f x y) 
Instance details

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) 
Instance details

Defined in Data.Map.Internal

Methods

pure :: a -> WhenMissing f k x a #

(<*>) :: WhenMissing f k x (a -> b) -> WhenMissing f k x a -> WhenMissing f k x b #

liftA2 :: (a -> b -> c) -> WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x c #

(*>) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x b #

(<*) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x a #

Stream s => Applicative (ParsecT e s m) 
Instance details

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 #

(Monoid a, Monoid b, Monoid c) => Applicative ((,,,) a b c) 
Instance details

Defined in GHC.Base

Methods

pure :: a0 -> (a, b, c, a0) #

(<*>) :: (a, b, c, a0 -> b0) -> (a, b, c, a0) -> (a, b, c, b0) #

liftA2 :: (a0 -> b0 -> c0) -> (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, c0) #

(*>) :: (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, b0) #

(<*) :: (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, a0) #

Applicative ((->) r) 
Instance details

Defined in GHC.Base

Methods

pure :: a -> r -> a #

(<*>) :: (r -> (a -> b)) -> (r -> a) -> r -> b #

liftA2 :: (a -> b -> c) -> (r -> a) -> (r -> b) -> r -> c #

(*>) :: (r -> a) -> (r -> b) -> r -> b #

(<*) :: (r -> a) -> (r -> b) -> r -> a #

(Applicative f, Applicative g) => Applicative (f :.: g) 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> (f :.: g) a #

(<*>) :: (f :.: g) (a -> b) -> (f :.: g) a -> (f :.: g) b #

liftA2 :: (a -> b -> c) -> (f :.: g) a -> (f :.: g) b -> (f :.: g) c #

(*>) :: (f :.: g) a -> (f :.: g) b -> (f :.: g) b #

(<*) :: (f :.: g) a -> (f :.: g) b -> (f :.: g) a #

Applicative f => Applicative (M1 i c f) 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> M1 i c f a #

(<*>) :: M1 i c f (a -> b) -> M1 i c f a -> M1 i c f b #

liftA2 :: (a -> b -> c0) -> M1 i c f a -> M1 i c f b -> M1 i c f c0 #

(*>) :: M1 i c f a -> M1 i c f b -> M1 i c f b #

(<*) :: M1 i c f a -> M1 i c f b -> M1 i c f a #

(Monad f, Applicative f) => Applicative (WhenMatched f k x y) 
Instance details

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 #

Monad m => Applicative (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

pure :: a -> Pipe l i o u m a #

(<*>) :: Pipe l i o u m (a -> b) -> Pipe l i o u m a -> Pipe l i o u m b #

liftA2 :: (a -> b -> c) -> Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m c #

(*>) :: Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m b #

(<*) :: Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m a #

class Functor (f :: Type -> Type) where #

Minimal complete definition

fmap

Methods

fmap :: (a -> b) -> f a -> f b #

(<$) :: a -> f b -> f a #

Instances

Instances details
Functor Only 
Instance details

Defined in Data.Tuple.Only

Methods

fmap :: (a -> b) -> Only a -> Only b #

(<$) :: a -> Only b -> Only a #

Functor KeyMap 
Instance details

Defined in Data.Aeson.KeyMap

Methods

fmap :: (a -> b) -> KeyMap a -> KeyMap b #

(<$) :: a -> KeyMap b -> KeyMap a #

Functor FromJSONKeyFunction 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fmap :: (a -> b) -> FromJSONKeyFunction a -> FromJSONKeyFunction b #

(<$) :: a -> FromJSONKeyFunction b -> FromJSONKeyFunction a #

Functor IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fmap :: (a -> b) -> IResult a -> IResult b #

(<$) :: a -> IResult b -> IResult a #

Functor Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fmap :: (a -> b) -> Parser a -> Parser b #

(<$) :: a -> Parser b -> Parser a #

Functor Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fmap :: (a -> b) -> Result a -> Result b #

(<$) :: a -> Result b -> Result a #

Functor ZipList 
Instance details

Defined in Control.Applicative

Methods

fmap :: (a -> b) -> ZipList a -> ZipList b #

(<$) :: a -> ZipList b -> ZipList a #

Functor Handler 
Instance details

Defined in Control.Exception

Methods

fmap :: (a -> b) -> Handler a -> Handler b #

(<$) :: a -> Handler b -> Handler a #

Functor Identity 
Instance details

Defined in Data.Functor.Identity

Methods

fmap :: (a -> b) -> Identity a -> Identity b #

(<$) :: a -> Identity b -> Identity a #

Functor Down 
Instance details

Defined in Data.Ord

Methods

fmap :: (a -> b) -> Down a -> Down b #

(<$) :: a -> Down b -> Down a #

Functor First 
Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> First a -> First b #

(<$) :: a -> First b -> First a #

Functor Last 
Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> Last a -> Last b #

(<$) :: a -> Last b -> Last a #

Functor Max 
Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> Max a -> Max b #

(<$) :: a -> Max b -> Max a #

Functor Min 
Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> Min a -> Min b #

(<$) :: a -> Min b -> Min a #

Functor Dual 
Instance details

Defined in Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Dual a -> Dual b #

(<$) :: a -> Dual b -> Dual a #

Functor Product 
Instance details

Defined in Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Product a -> Product b #

(<$) :: a -> Product b -> Product a #

Functor Sum 
Instance details

Defined in Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Sum a -> Sum b #

(<$) :: a -> Sum b -> Sum a #

Functor STM 
Instance details

Defined in GHC.Conc.Sync

Methods

fmap :: (a -> b) -> STM a -> STM b #

(<$) :: a -> STM b -> STM a #

Functor Par1 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> Par1 a -> Par1 b #

(<$) :: a -> Par1 b -> Par1 a #

Functor P 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fmap :: (a -> b) -> P a -> P b #

(<$) :: a -> P b -> P a #

Functor ReadP 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fmap :: (a -> b) -> ReadP a -> ReadP b #

(<$) :: a -> ReadP b -> ReadP a #

Functor ReadPrec 
Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

fmap :: (a -> b) -> ReadPrec a -> ReadPrec b #

(<$) :: a -> ReadPrec b -> ReadPrec a #

Functor Put 
Instance details

Defined in Data.ByteString.Builder.Internal

Methods

fmap :: (a -> b) -> Put a -> Put b #

(<$) :: a -> Put b -> Put a #

Functor Capture 
Instance details

Defined in System.Console.CmdArgs.Annotate

Methods

fmap :: (a -> b) -> Capture a -> Capture b #

(<$) :: a -> Capture b -> Capture a #

Functor Group 
Instance details

Defined in System.Console.CmdArgs.Explicit.Type

Methods

fmap :: (a -> b) -> Group a -> Group b #

(<$) :: a -> Group b -> Group a #

Functor CmdArgs 
Instance details

Defined in System.Console.CmdArgs.Implicit.Type

Methods

fmap :: (a -> b) -> CmdArgs a -> CmdArgs b #

(<$) :: a -> CmdArgs b -> CmdArgs a #

Functor RGB 
Instance details

Defined in Data.Colour.RGB

Methods

fmap :: (a -> b) -> RGB a -> RGB b #

(<$) :: a -> RGB b -> RGB a #

Functor Flush 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> Flush a -> Flush b #

(<$) :: a -> Flush b -> Flush a #

Functor SCC 
Instance details

Defined in Data.Graph

Methods

fmap :: (a -> b) -> SCC a -> SCC b #

(<$) :: a -> SCC b -> SCC a #

Functor IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> IntMap a -> IntMap b #

(<$) :: a -> IntMap b -> IntMap a #

Functor Digit 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Digit a -> Digit b #

(<$) :: a -> Digit b -> Digit a #

Functor Elem 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Elem a -> Elem b #

(<$) :: a -> Elem b -> Elem a #

Functor FingerTree 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> FingerTree a -> FingerTree b #

(<$) :: a -> FingerTree b -> FingerTree a #

Functor Node 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Node a -> Node b #

(<$) :: a -> Node b -> Node a #

Functor Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Seq a -> Seq b #

(<$) :: a -> Seq b -> Seq a #

Functor ViewL 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> ViewL a -> ViewL b #

(<$) :: a -> ViewL b -> ViewL a #

Functor ViewR 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> ViewR a -> ViewR b #

(<$) :: a -> ViewR b -> ViewR a #

Functor Tree 
Instance details

Defined in Data.Tree

Methods

fmap :: (a -> b) -> Tree a -> Tree b #

(<$) :: a -> Tree b -> Tree a #

Functor DNonEmpty 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

fmap :: (a -> b) -> DNonEmpty a -> DNonEmpty b #

(<$) :: a -> DNonEmpty b -> DNonEmpty a #

Functor DList 
Instance details

Defined in Data.DList.Internal

Methods

fmap :: (a -> b) -> DList a -> DList b #

(<$) :: a -> DList b -> DList a #

Functor Doc 
Instance details

Defined in Text.DocLayout

Methods

fmap :: (a -> b) -> Doc a -> Doc b #

(<$) :: a -> Doc b -> Doc a #

Functor IO 
Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> IO a -> IO b #

(<$) :: a -> IO b -> IO a #

Functor Root 
Instance details

Defined in Numeric.RootFinding

Methods

fmap :: (a -> b) -> Root a -> Root b #

(<$) :: a -> Root b -> Root a #

Functor ErrorFancy 
Instance details

Defined in Text.Megaparsec.Error

Methods

fmap :: (a -> b) -> ErrorFancy a -> ErrorFancy b #

(<$) :: a -> ErrorFancy b -> ErrorFancy a #

Functor ErrorItem 
Instance details

Defined in Text.Megaparsec.Error

Methods

fmap :: (a -> b) -> ErrorItem a -> ErrorItem b #

(<$) :: a -> ErrorItem b -> ErrorItem a #

Functor AnnotDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fmap :: (a -> b) -> AnnotDetails a -> AnnotDetails b #

(<$) :: a -> AnnotDetails b -> AnnotDetails a #

Functor Doc 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fmap :: (a -> b) -> Doc a -> Doc b #

(<$) :: a -> Doc b -> Doc a #

Functor Span 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fmap :: (a -> b) -> Span a -> Span b #

(<$) :: a -> Span b -> Span a #

Functor Doc 
Instance details

Defined in Prettyprinter.Internal

Methods

fmap :: (a -> b) -> Doc a -> Doc b #

(<$) :: a -> Doc b -> Doc a #

Functor FlattenResult 
Instance details

Defined in Prettyprinter.Internal

Methods

fmap :: (a -> b) -> FlattenResult a -> FlattenResult b #

(<$) :: a -> FlattenResult b -> FlattenResult a #

Functor SimpleDocStream 
Instance details

Defined in Prettyprinter.Internal

Methods

fmap :: (a -> b) -> SimpleDocStream a -> SimpleDocStream b #

(<$) :: a -> SimpleDocStream b -> SimpleDocStream a #

Functor Array 
Instance details

Defined in Data.Primitive.Array

Methods

fmap :: (a -> b) -> Array a -> Array b #

(<$) :: a -> Array b -> Array a #

Functor SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

fmap :: (a -> b) -> SmallArray a -> SmallArray b #

(<$) :: a -> SmallArray b -> SmallArray a #

Functor Maybe 
Instance details

Defined in Data.Strict.Maybe

Methods

fmap :: (a -> b) -> Maybe a -> Maybe b #

(<$) :: a -> Maybe b -> Maybe a #

Functor Header 
Instance details

Defined in Text.Tabular

Methods

fmap :: (a -> b) -> Header a -> Header b #

(<$) :: a -> Header b -> Header a #

Functor Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

fmap :: (a -> b) -> Q a -> Q b #

(<$) :: a -> Q b -> Q a #

Functor TyVarBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

fmap :: (a -> b) -> TyVarBndr a -> TyVarBndr b #

(<$) :: a -> TyVarBndr b -> TyVarBndr a #

Functor Window 
Instance details

Defined in System.Console.Terminal.Common

Methods

fmap :: (a -> b) -> Window a -> Window b #

(<$) :: a -> Window b -> Window a #

Functor Capability 
Instance details

Defined in System.Console.Terminfo.Base

Methods

fmap :: (a -> b) -> Capability a -> Capability b #

(<$) :: a -> Capability b -> Capability a #

Functor Vector 
Instance details

Defined in Data.Vector

Methods

fmap :: (a -> b) -> Vector a -> Vector b #

(<$) :: a -> Vector b -> Vector a #

Functor Haskeline 
Instance details

Defined in System.Console.Wizard.Haskeline

Methods

fmap :: (a -> b) -> Haskeline a -> Haskeline b #

(<$) :: a -> Haskeline b -> Haskeline a #

Functor WithSettings 
Instance details

Defined in System.Console.Wizard.Haskeline

Methods

fmap :: (a -> b) -> WithSettings a -> WithSettings b #

(<$) :: a -> WithSettings b -> WithSettings a #

Functor ArbitraryIO 
Instance details

Defined in System.Console.Wizard.Internal

Methods

fmap :: (a -> b) -> ArbitraryIO a -> ArbitraryIO b #

(<$) :: a -> ArbitraryIO b -> ArbitraryIO a #

Functor Character 
Instance details

Defined in System.Console.Wizard.Internal

Methods

fmap :: (a -> b) -> Character a -> Character b #

(<$) :: a -> Character b -> Character a #

Functor Line 
Instance details

Defined in System.Console.Wizard.Internal

Methods

fmap :: (a -> b) -> Line a -> Line b #

(<$) :: a -> Line b -> Line a #

Functor LinePrewritten 
Instance details

Defined in System.Console.Wizard.Internal

Methods

fmap :: (a -> b) -> LinePrewritten a -> LinePrewritten b #

(<$) :: a -> LinePrewritten b -> LinePrewritten a #

Functor Output 
Instance details

Defined in System.Console.Wizard.Internal

Methods

fmap :: (a -> b) -> Output a -> Output b #

(<$) :: a -> Output b -> Output a #

Functor OutputLn 
Instance details

Defined in System.Console.Wizard.Internal

Methods

fmap :: (a -> b) -> OutputLn a -> OutputLn b #

(<$) :: a -> OutputLn b -> OutputLn a #

Functor Password 
Instance details

Defined in System.Console.Wizard.Internal

Methods

fmap :: (a -> b) -> Password a -> Password b #

(<$) :: a -> Password b -> Password a #

Functor NonEmpty 
Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> NonEmpty a -> NonEmpty b #

(<$) :: a -> NonEmpty b -> NonEmpty a #

Functor Maybe 
Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> Maybe a -> Maybe b #

(<$) :: a -> Maybe b -> Maybe a #

Functor Solo 
Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> Solo a -> Solo b #

(<$) :: a -> Solo b -> Solo a #

Functor [] 
Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> [a] -> [b] #

(<$) :: a -> [b] -> [a] #

Functor (IResult i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fmap :: (a -> b) -> IResult i a -> IResult i b #

(<$) :: a -> IResult i b -> IResult i a #

Functor (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fmap :: (a -> b) -> Parser i a -> Parser i b #

(<$) :: a -> Parser i b -> Parser i a #

Monad m => Functor (WrappedMonad m) 
Instance details

Defined in Control.Applicative

Methods

fmap :: (a -> b) -> WrappedMonad m a -> WrappedMonad m b #

(<$) :: a -> WrappedMonad m b -> WrappedMonad m a #

Arrow a => Functor (ArrowMonad a) 
Instance details

Defined in Control.Arrow

Methods

fmap :: (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b #

(<$) :: a0 -> ArrowMonad a b -> ArrowMonad a a0 #

Functor (Either a) 
Instance details

Defined in Data.Either

Methods

fmap :: (a0 -> b) -> Either a a0 -> Either a b #

(<$) :: a0 -> Either a b -> Either a a0 #

Functor (StateL s) 
Instance details

Defined in Data.Functor.Utils

Methods

fmap :: (a -> b) -> StateL s a -> StateL s b #

(<$) :: a -> StateL s b -> StateL s a #

Functor (StateR s) 
Instance details

Defined in Data.Functor.Utils

Methods

fmap :: (a -> b) -> StateR s a -> StateR s b #

(<$) :: a -> StateR s b -> StateR s a #

Functor (Arg a) 
Instance details

Defined in Data.Semigroup

Methods

fmap :: (a0 -> b) -> Arg a a0 -> Arg a b #

(<$) :: a0 -> Arg a b -> Arg a a0 #

Functor (U1 :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> U1 a -> U1 b #

(<$) :: a -> U1 b -> U1 a #

Functor (V1 :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> V1 a -> V1 b #

(<$) :: a -> V1 b -> V1 a #

Functor (ST s) 
Instance details

Defined in GHC.ST

Methods

fmap :: (a -> b) -> ST s a -> ST s b #

(<$) :: a -> ST s b -> ST s a #

Monad m => Functor (ZipSource m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> ZipSource m a -> ZipSource m b #

(<$) :: a -> ZipSource m b -> ZipSource m a #

Functor (SetM s) 
Instance details

Defined in Data.Graph

Methods

fmap :: (a -> b) -> SetM s a -> SetM s b #

(<$) :: a -> SetM s b -> SetM s a #

Functor (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> Map k a -> Map k b #

(<$) :: a -> Map k b -> Map k a #

Functor f => Functor (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

fmap :: (a -> b) -> Free f a -> Free f b #

(<$) :: a -> Free f b -> Free f a #

Monad m => Functor (Handler m) 
Instance details

Defined in Control.Monad.Catch

Methods

fmap :: (a -> b) -> Handler m a -> Handler m b #

(<$) :: a -> Handler m b -> Handler m a #

Functor m => Functor (InputT m) 
Instance details

Defined in System.Console.Haskeline.InputT

Methods

fmap :: (a -> b) -> InputT m a -> InputT m b #

(<$) :: a -> InputT m b -> InputT m a #

Functor (CompoundPeriodicReport a) 
Instance details

Defined in Hledger.Reports.ReportTypes

Functor (PeriodicReport a) 
Instance details

Defined in Hledger.Reports.ReportTypes

Methods

fmap :: (a0 -> b) -> PeriodicReport a a0 -> PeriodicReport a b #

(<$) :: a0 -> PeriodicReport a b -> PeriodicReport a a0 #

Functor (PeriodicReportRow a) 
Instance details

Defined in Hledger.Reports.ReportTypes

Methods

fmap :: (a0 -> b) -> PeriodicReportRow a a0 -> PeriodicReportRow a b #

(<$) :: a0 -> PeriodicReportRow a b -> PeriodicReportRow a a0 #

Functor m => Functor (HtmlT m)

Just re-uses Monad.

Instance details

Defined in Lucid.Base

Methods

fmap :: (a -> b) -> HtmlT m a -> HtmlT m b #

(<$) :: a -> HtmlT m b -> HtmlT m a #

Functor f => Functor (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

fmap :: (a -> b) -> WrappedPoly f a -> WrappedPoly f b #

(<$) :: a -> WrappedPoly f b -> WrappedPoly f a #

Functor m => Functor (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

fmap :: (a -> b) -> ResourceT m a -> ResourceT m b #

(<$) :: a -> ResourceT m b -> ResourceT m a #

Functor (Either a) 
Instance details

Defined in Data.Strict.Either

Methods

fmap :: (a0 -> b) -> Either a a0 -> Either a b #

(<$) :: a0 -> Either a b -> Either a a0 #

Functor (These a) 
Instance details

Defined in Data.Strict.These

Methods

fmap :: (a0 -> b) -> These a a0 -> These a b #

(<$) :: a0 -> These a b -> These a a0 #

Functor (Pair e) 
Instance details

Defined in Data.Strict.Tuple

Methods

fmap :: (a -> b) -> Pair e a -> Pair e b #

(<$) :: a -> Pair e b -> Pair e a #

Functor m => Functor (QuoteToQuasi m) 
Instance details

Defined in Language.Haskell.TH.Syntax.Compat

Methods

fmap :: (a -> b) -> QuoteToQuasi m a -> QuoteToQuasi m b #

(<$) :: a -> QuoteToQuasi m b -> QuoteToQuasi m a #

Functor (These a) 
Instance details

Defined in Data.These

Methods

fmap :: (a0 -> b) -> These a a0 -> These a b #

(<$) :: a0 -> These a b -> These a a0 #

Functor m => Functor (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fmap :: (a -> b) -> MaybeT m a -> MaybeT m b #

(<$) :: a -> MaybeT m b -> MaybeT m a #

Functor (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

fmap :: (a -> b) -> HashMap k a -> HashMap k b #

(<$) :: a -> HashMap k b -> HashMap k a #

Functor backend => Functor (Wizard backend) 
Instance details

Defined in System.Console.Wizard.Internal

Methods

fmap :: (a -> b) -> Wizard backend a -> Wizard backend b #

(<$) :: a -> Wizard backend b -> Wizard backend a #

Functor ((,) a) 
Instance details

Defined in GHC.Base

Methods

fmap :: (a0 -> b) -> (a, a0) -> (a, b) #

(<$) :: a0 -> (a, b) -> (a, a0) #

Arrow a => Functor (WrappedArrow a b) 
Instance details

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 #

Functor m => Functor (Kleisli m a) 
Instance details

Defined in Control.Arrow

Methods

fmap :: (a0 -> b) -> Kleisli m a a0 -> Kleisli m a b #

(<$) :: a0 -> Kleisli m a b -> Kleisli m a a0 #

Functor (Const m :: Type -> Type) 
Instance details

Defined in Data.Functor.Const

Methods

fmap :: (a -> b) -> Const m a -> Const m b #

(<$) :: a -> Const m b -> Const m a #

Functor f => Functor (Alt f) 
Instance details

Defined in Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Alt f a -> Alt f b #

(<$) :: a -> Alt f b -> Alt f a #

(Generic1 f, Functor (Rep1 f)) => Functor (Generically1 f) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> Generically1 f a -> Generically1 f b #

(<$) :: a -> Generically1 f b -> Generically1 f a #

Functor f => Functor (Rec1 f) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> Rec1 f a -> Rec1 f b #

(<$) :: a -> Rec1 f b -> Rec1 f a #

Functor (URec (Ptr ()) :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec (Ptr ()) a -> URec (Ptr ()) b #

(<$) :: a -> URec (Ptr ()) b -> URec (Ptr ()) a #

Functor (URec Char :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Char a -> URec Char b #

(<$) :: a -> URec Char b -> URec Char a #

Functor (URec Double :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Double a -> URec Double b #

(<$) :: a -> URec Double b -> URec Double a #

Functor (URec Float :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Float a -> URec Float b #

(<$) :: a -> URec Float b -> URec Float a #

Functor (URec Int :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Int a -> URec Int b #

(<$) :: a -> URec Int b -> URec Int a #

Functor (URec Word :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Word a -> URec Word b #

(<$) :: a -> URec Word b -> URec Word a #

Bifunctor p => Functor (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

fmap :: (a -> b) -> Join p a -> Join p b #

(<$) :: a -> Join p b -> Join p a #

Monad m => Functor (ZipSink i m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> ZipSink i m a -> ZipSink i m b #

(<$) :: a -> ZipSink i m b -> ZipSink i m a #

(Applicative f, Monad f) => Functor (WhenMissing f x) 
Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> WhenMissing f x a -> WhenMissing f x b #

(<$) :: a -> WhenMissing f x b -> WhenMissing f x a #

(Functor f, Functor m) => Functor (FreeT f m) 
Instance details

Defined in Control.Monad.Free

Methods

fmap :: (a -> b) -> FreeT f m a -> FreeT f m b #

(<$) :: a -> FreeT f m b -> FreeT f m a #

Functor (Bazaar a b) 
Instance details

Defined in Lens.Micro

Methods

fmap :: (a0 -> b0) -> Bazaar a b a0 -> Bazaar a b b0 #

(<$) :: a0 -> Bazaar a b b0 -> Bazaar a b a0 #

Functor m => Functor (StateT s m) 
Instance details

Defined in Lens.Micro

Methods

fmap :: (a -> b) -> StateT s m a -> StateT s m b #

(<$) :: a -> StateT s m b -> StateT s m a #

Functor (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

fmap :: (a -> b) -> Tagged s a -> Tagged s b #

(<$) :: a -> Tagged s b -> Tagged s a #

(Functor f, Functor g) => Functor (These1 f g) 
Instance details

Defined in Data.Functor.These

Methods

fmap :: (a -> b) -> These1 f g a -> These1 f g b #

(<$) :: a -> These1 f g b -> These1 f g a #

Functor m => Functor (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

fmap :: (a -> b) -> ErrorT e m a -> ErrorT e m b #

(<$) :: a -> ErrorT e m b -> ErrorT e m a #

Functor m => Functor (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fmap :: (a -> b) -> ExceptT e m a -> ExceptT e m b #

(<$) :: a -> ExceptT e m b -> ExceptT e m a #

Functor m => Functor (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fmap :: (a -> b) -> ReaderT r m a -> ReaderT r m b #

(<$) :: a -> ReaderT r m b -> ReaderT r m a #

Functor m => Functor (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

fmap :: (a -> b) -> StateT s m a -> StateT s m b #

(<$) :: a -> StateT s m b -> StateT s m a #

(Functor f, Functor g) => Functor (f :+: g) 
Instance details

Defined in System.Console.Wizard.Internal

Methods

fmap :: (a -> b) -> (f :+: g) a -> (f :+: g) b #

(<$) :: a -> (f :+: g) b -> (f :+: g) a #

Functor ((,,) a b) 
Instance details

Defined in GHC.Base

Methods

fmap :: (a0 -> b0) -> (a, b, a0) -> (a, b, b0) #

(<$) :: a0 -> (a, b, b0) -> (a, b, a0) #

(Functor f, Functor g) => Functor (f :*: g) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> (f :*: g) a -> (f :*: g) b #

(<$) :: a -> (f :*: g) b -> (f :*: g) a #

(Functor f, Functor g) => Functor (f :+: g) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> (f :+: g) a -> (f :+: g) b #

(<$) :: a -> (f :+: g) b -> (f :+: g) a #

Functor (K1 i c :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> K1 i c a -> K1 i c b #

(<$) :: a -> K1 i c b -> K1 i c a #

Functor (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> ConduitT i o m a -> ConduitT i o m b #

(<$) :: a -> ConduitT i o m b -> ConduitT i o m a #

Functor (ZipConduit i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> ZipConduit i o m a -> ZipConduit i o m b #

(<$) :: a -> ZipConduit i o m b -> ZipConduit i o m a #

Functor f => Functor (WhenMatched f x y) 
Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b #

(<$) :: a -> WhenMatched f x y b -> WhenMatched f x y a #

(Applicative f, Monad f) => Functor (WhenMissing f k x) 
Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> WhenMissing f k x a -> WhenMissing f k x b #

(<$) :: a -> WhenMissing f k x b -> WhenMissing f k x a #

Functor (ParsecT e s m) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

fmap :: (a -> b) -> ParsecT e s m a -> ParsecT e s m b #

(<$) :: a -> ParsecT e s m b -> ParsecT e s m a #

Functor ((,,,) a b c) 
Instance details

Defined in GHC.Base

Methods

fmap :: (a0 -> b0) -> (a, b, c, a0) -> (a, b, c, b0) #

(<$) :: a0 -> (a, b, c, b0) -> (a, b, c, a0) #

Functor ((->) r) 
Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> (r -> a) -> r -> b #

(<$) :: a -> (r -> b) -> r -> a #

(Functor f, Functor g) => Functor (f :.: g) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> (f :.: g) a -> (f :.: g) b #

(<$) :: a -> (f :.: g) b -> (f :.: g) a #

Functor f => Functor (M1 i c f) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> M1 i c f a -> M1 i c f b #

(<$) :: a -> M1 i c f b -> M1 i c f a #

Functor (Clown f a :: Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

fmap :: (a0 -> b) -> Clown f a a0 -> Clown f a b #

(<$) :: a0 -> Clown f a b -> Clown f a a0 #

Bifunctor p => Functor (Flip p a) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

fmap :: (a0 -> b) -> Flip p a a0 -> Flip p a b #

(<$) :: a0 -> Flip p a b -> Flip p a a0 #

Functor g => Functor (Joker g a) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

fmap :: (a0 -> b) -> Joker g a a0 -> Joker g a b #

(<$) :: a0 -> Joker g a b -> Joker g a a0 #

Bifunctor p => Functor (WrappedBifunctor p a) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

fmap :: (a0 -> b) -> WrappedBifunctor p a a0 -> WrappedBifunctor p a b #

(<$) :: a0 -> WrappedBifunctor p a b -> WrappedBifunctor p a a0 #

Functor f => Functor (WhenMatched f k x y) 
Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> WhenMatched f k x y a -> WhenMatched f k x y b #

(<$) :: a -> WhenMatched f k x y b -> WhenMatched f k x y a #

(Functor (f a), Functor (g a)) => Functor (Product f g a) 
Instance details

Defined in Data.Bifunctor.Product

Methods

fmap :: (a0 -> b) -> Product f g a a0 -> Product f g a b #

(<$) :: a0 -> Product f g a b -> Product f g a a0 #

(Functor (f a), Functor (g a)) => Functor (Sum f g a) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

fmap :: (a0 -> b) -> Sum f g a a0 -> Sum f g a b #

(<$) :: a0 -> Sum f g a b -> Sum f g a a0 #

Monad m => Functor (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

fmap :: (a -> b) -> Pipe l i o u m a -> Pipe l i o u m b #

(<$) :: a -> Pipe l i o u m b -> Pipe l i o u m a #

(Functor f, Bifunctor p) => Functor (Tannen f p a) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

fmap :: (a0 -> b) -> Tannen f p a a0 -> Tannen f p a b #

(<$) :: a0 -> Tannen f p a b -> Tannen f p a a0 #

(Bifunctor p, Functor g) => Functor (Biff p f g a) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

fmap :: (a0 -> b) -> Biff p f g a a0 -> Biff p f g a b #

(<$) :: a0 -> Biff p f g a b -> Biff p f g a a0 #

class Applicative m => Monad (m :: Type -> Type) where #

Minimal complete definition

(>>=)

Methods

(>>=) :: m a -> (a -> m b) -> m b #

(>>) :: m a -> m b -> m b #

return :: a -> m a #

Instances

Instances details
Monad IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(>>=) :: IResult a -> (a -> IResult b) -> IResult b #

(>>) :: IResult a -> IResult b -> IResult b #

return :: a -> IResult a #

Monad Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(>>=) :: Parser a -> (a -> Parser b) -> Parser b #

(>>) :: Parser a -> Parser b -> Parser b #

return :: a -> Parser a #

Monad Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(>>=) :: Result a -> (a -> Result b) -> Result b #

(>>) :: Result a -> Result b -> Result b #

return :: a -> Result a #

Monad Identity 
Instance details

Defined in Data.Functor.Identity

Methods

(>>=) :: Identity a -> (a -> Identity b) -> Identity b #

(>>) :: Identity a -> Identity b -> Identity b #

return :: a -> Identity a #

Monad Down 
Instance details

Defined in Data.Ord

Methods

(>>=) :: Down a -> (a -> Down b) -> Down b #

(>>) :: Down a -> Down b -> Down b #

return :: a -> Down a #

Monad First 
Instance details

Defined in Data.Semigroup

Methods

(>>=) :: First a -> (a -> First b) -> First b #

(>>) :: First a -> First b -> First b #

return :: a -> First a #

Monad Last 
Instance details

Defined in Data.Semigroup

Methods

(>>=) :: Last a -> (a -> Last b) -> Last b #

(>>) :: Last a -> Last b -> Last b #

return :: a -> Last a #

Monad Max 
Instance details

Defined in Data.Semigroup

Methods

(>>=) :: Max a -> (a -> Max b) -> Max b #

(>>) :: Max a -> Max b -> Max b #

return :: a -> Max a #

Monad Min 
Instance details

Defined in Data.Semigroup

Methods

(>>=) :: Min a -> (a -> Min b) -> Min b #

(>>) :: Min a -> Min b -> Min b #

return :: a -> Min a #

Monad Dual 
Instance details

Defined in Data.Semigroup.Internal

Methods

(>>=) :: Dual a -> (a -> Dual b) -> Dual b #

(>>) :: Dual a -> Dual b -> Dual b #

return :: a -> Dual a #

Monad Product 
Instance details

Defined in Data.Semigroup.Internal

Methods

(>>=) :: Product a -> (a -> Product b) -> Product b #

(>>) :: Product a -> Product b -> Product b #

return :: a -> Product a #

Monad Sum 
Instance details

Defined in Data.Semigroup.Internal

Methods

(>>=) :: Sum a -> (a -> Sum b) -> Sum b #

(>>) :: Sum a -> Sum b -> Sum b #

return :: a -> Sum a #

Monad STM 
Instance details

Defined in GHC.Conc.Sync

Methods

(>>=) :: STM a -> (a -> STM b) -> STM b #

(>>) :: STM a -> STM b -> STM b #

return :: a -> STM a #

Monad Par1 
Instance details

Defined in GHC.Generics

Methods

(>>=) :: Par1 a -> (a -> Par1 b) -> Par1 b #

(>>) :: Par1 a -> Par1 b -> Par1 b #

return :: a -> Par1 a #

Monad P 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

(>>=) :: P a -> (a -> P b) -> P b #

(>>) :: P a -> P b -> P b #

return :: a -> P a #

Monad ReadP 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

(>>=) :: ReadP a -> (a -> ReadP b) -> ReadP b #

(>>) :: ReadP a -> ReadP b -> ReadP b #

return :: a -> ReadP a #

Monad ReadPrec 
Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

(>>=) :: ReadPrec a -> (a -> ReadPrec b) -> ReadPrec b #

(>>) :: ReadPrec a -> ReadPrec b -> ReadPrec b #

return :: a -> ReadPrec a #

Monad Put 
Instance details

Defined in Data.ByteString.Builder.Internal

Methods

(>>=) :: Put a -> (a -> Put b) -> Put b #

(>>) :: Put a -> Put b -> Put b #

return :: a -> Put a #

Monad Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

(>>=) :: Seq a -> (a -> Seq b) -> Seq b #

(>>) :: Seq a -> Seq b -> Seq b #

return :: a -> Seq a #

Monad Tree 
Instance details

Defined in Data.Tree

Methods

(>>=) :: Tree a -> (a -> Tree b) -> Tree b #

(>>) :: Tree a -> Tree b -> Tree b #

return :: a -> Tree a #

Monad DNonEmpty 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

(>>=) :: DNonEmpty a -> (a -> DNonEmpty b) -> DNonEmpty b #

(>>) :: DNonEmpty a -> DNonEmpty b -> DNonEmpty b #

return :: a -> DNonEmpty a #

Monad DList 
Instance details

Defined in Data.DList.Internal

Methods

(>>=) :: DList a -> (a -> DList b) -> DList b #

(>>) :: DList a -> DList b -> DList b #

return :: a -> DList a #

Monad IO 
Instance details

Defined in GHC.Base

Methods

(>>=) :: IO a -> (a -> IO b) -> IO b #

(>>) :: IO a -> IO b -> IO b #

return :: a -> IO a #

Monad Root 
Instance details

Defined in Numeric.RootFinding

Methods

(>>=) :: Root a -> (a -> Root b) -> Root b #

(>>) :: Root a -> Root b -> Root b #

return :: a -> Root a #

Monad Array 
Instance details

Defined in Data.Primitive.Array

Methods

(>>=) :: Array a -> (a -> Array b) -> Array b #

(>>) :: Array a -> Array b -> Array b #

return :: a -> Array a #

Monad SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

(>>=) :: SmallArray a -> (a -> SmallArray b) -> SmallArray b #

(>>) :: SmallArray a -> SmallArray b -> SmallArray b #

return :: a -> SmallArray a #

Monad Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(>>=) :: Q a -> (a -> Q b) -> Q b #

(>>) :: Q a -> Q b -> Q b #

return :: a -> Q a #

Monad Capability 
Instance details

Defined in System.Console.Terminfo.Base

Methods

(>>=) :: Capability a -> (a -> Capability b) -> Capability b #

(>>) :: Capability a -> Capability b -> Capability b #

return :: a -> Capability a #

Monad Vector 
Instance details

Defined in Data.Vector

Methods

(>>=) :: Vector a -> (a -> Vector b) -> Vector b #

(>>) :: Vector a -> Vector b -> Vector b #

return :: a -> Vector a #

Monad NonEmpty 
Instance details

Defined in GHC.Base

Methods

(>>=) :: NonEmpty a -> (a -> NonEmpty b) -> NonEmpty b #

(>>) :: NonEmpty a -> NonEmpty b -> NonEmpty b #

return :: a -> NonEmpty a #

Monad Maybe 
Instance details

Defined in GHC.Base

Methods

(>>=) :: Maybe a -> (a -> Maybe b) -> Maybe b #

(>>) :: Maybe a -> Maybe b -> Maybe b #

return :: a -> Maybe a #

Monad Solo 
Instance details

Defined in GHC.Base

Methods

(>>=) :: Solo a -> (a -> Solo b) -> Solo b #

(>>) :: Solo a -> Solo b -> Solo b #

return :: a -> Solo a #

Monad [] 
Instance details

Defined in GHC.Base

Methods

(>>=) :: [a] -> (a -> [b]) -> [b] #

(>>) :: [a] -> [b] -> [b] #

return :: a -> [a] #

Monad (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(>>=) :: Parser i a -> (a -> Parser i b) -> Parser i b #

(>>) :: Parser i a -> Parser i b -> Parser i b #

return :: a -> Parser i a #

Monad m => Monad (WrappedMonad m) 
Instance details

Defined in Control.Applicative

Methods

(>>=) :: WrappedMonad m a -> (a -> WrappedMonad m b) -> WrappedMonad m b #

(>>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b #

return :: a -> WrappedMonad m a #

ArrowApply a => Monad (ArrowMonad a) 
Instance details

Defined in Control.Arrow

Methods

(>>=) :: ArrowMonad a a0 -> (a0 -> ArrowMonad a b) -> ArrowMonad a b #

(>>) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a b #

return :: a0 -> ArrowMonad a a0 #

Monad (Either e) 
Instance details

Defined in Data.Either

Methods

(>>=) :: Either e a -> (a -> Either e b) -> Either e b #

(>>) :: Either e a -> Either e b -> Either e b #

return :: a -> Either e a #

Monad (U1 :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

(>>=) :: U1 a -> (a -> U1 b) -> U1 b #

(>>) :: U1 a -> U1 b -> U1 b #

return :: a -> U1 a #

Monad (ST s) 
Instance details

Defined in GHC.ST

Methods

(>>=) :: ST s a -> (a -> ST s b) -> ST s b #

(>>) :: ST s a -> ST s b -> ST s b #

return :: a -> ST s a #

Monad (SetM s) 
Instance details

Defined in Data.Graph

Methods

(>>=) :: SetM s a -> (a -> SetM s b) -> SetM s b #

(>>) :: SetM s a -> SetM s b -> SetM s b #

return :: a -> SetM s a #

Functor f => Monad (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

(>>=) :: Free f a -> (a -> Free f b) -> Free f b #

(>>) :: Free f a -> Free f b -> Free f b #

return :: a -> Free f a #

Monad m => Monad (InputT m) 
Instance details

Defined in System.Console.Haskeline.InputT

Methods

(>>=) :: InputT m a -> (a -> InputT m b) -> InputT m b #

(>>) :: InputT m a -> InputT m b -> InputT m b #

return :: a -> InputT m a #

Monad m => Monad (HtmlT m)

Basically acts like Writer.

Instance details

Defined in Lucid.Base

Methods

(>>=) :: HtmlT m a -> (a -> HtmlT m b) -> HtmlT m b #

(>>) :: HtmlT m a -> HtmlT m b -> HtmlT m b #

return :: a -> HtmlT m a #

Monad f => Monad (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

(>>=) :: WrappedPoly f a -> (a -> WrappedPoly f b) -> WrappedPoly f b #

(>>) :: WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f b #

return :: a -> WrappedPoly f a #

Monad m => Monad (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

(>>=) :: ResourceT m a -> (a -> ResourceT m b) -> ResourceT m b #

(>>) :: ResourceT m a -> ResourceT m b -> ResourceT m b #

return :: a -> ResourceT m a #

Semigroup a => Monad (These a) 
Instance details

Defined in Data.Strict.These

Methods

(>>=) :: These a a0 -> (a0 -> These a b) -> These a b #

(>>) :: These a a0 -> These a b -> These a b #

return :: a0 -> These a a0 #

Monad m => Monad (QuoteToQuasi m) 
Instance details

Defined in Language.Haskell.TH.Syntax.Compat

Methods

(>>=) :: QuoteToQuasi m a -> (a -> QuoteToQuasi m b) -> QuoteToQuasi m b #

(>>) :: QuoteToQuasi m a -> QuoteToQuasi m b -> QuoteToQuasi m b #

return :: a -> QuoteToQuasi m a #

Semigroup a => Monad (These a) 
Instance details

Defined in Data.These

Methods

(>>=) :: These a a0 -> (a0 -> These a b) -> These a b #

(>>) :: These a a0 -> These a b -> These a b #

return :: a0 -> These a a0 #

Monad m => Monad (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

(>>=) :: MaybeT m a -> (a -> MaybeT m b) -> MaybeT m b #

(>>) :: MaybeT m a -> MaybeT m b -> MaybeT m b #

return :: a -> MaybeT m a #

Functor backend => Monad (Wizard backend) 
Instance details

Defined in System.Console.Wizard.Internal

Methods

(>>=) :: Wizard backend a -> (a -> Wizard backend b) -> Wizard backend b #

(>>) :: Wizard backend a -> Wizard backend b -> Wizard backend b #

return :: a -> Wizard backend a #

Monoid a => Monad ((,) a) 
Instance details

Defined in GHC.Base

Methods

(>>=) :: (a, a0) -> (a0 -> (a, b)) -> (a, b) #

(>>) :: (a, a0) -> (a, b) -> (a, b) #

return :: a0 -> (a, a0) #

Monad m => Monad (Kleisli m a) 
Instance details

Defined in Control.Arrow

Methods

(>>=) :: Kleisli m a a0 -> (a0 -> Kleisli m a b) -> Kleisli m a b #

(>>) :: Kleisli m a a0 -> Kleisli m a b -> Kleisli m a b #

return :: a0 -> Kleisli m a a0 #

Monad f => Monad (Alt f) 
Instance details

Defined in Data.Semigroup.Internal

Methods

(>>=) :: Alt f a -> (a -> Alt f b) -> Alt f b #

(>>) :: Alt f a -> Alt f b -> Alt f b #

return :: a -> Alt f a #

Monad f => Monad (Rec1 f) 
Instance details

Defined in GHC.Generics

Methods

(>>=) :: Rec1 f a -> (a -> Rec1 f b) -> Rec1 f b #

(>>) :: Rec1 f a -> Rec1 f b -> Rec1 f b #

return :: a -> Rec1 f a #

(Applicative f, Monad f) => Monad (WhenMissing f x) 
Instance details

Defined in Data.IntMap.Internal

Methods

(>>=) :: WhenMissing f x a -> (a -> WhenMissing f x b) -> WhenMissing f x b #

(>>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b #

return :: a -> WhenMissing f x a #

(Functor f, Monad m) => Monad (FreeT f m) 
Instance details

Defined in Control.Monad.Free

Methods

(>>=) :: FreeT f m a -> (a -> FreeT f m b) -> FreeT f m b #

(>>) :: FreeT f m a -> FreeT f m b -> FreeT f m b #

return :: a -> FreeT f m a #

Monad m => Monad (StateT s m) 
Instance details

Defined in Lens.Micro

Methods

(>>=) :: StateT s m a -> (a -> StateT s m b) -> StateT s m b #

(>>) :: StateT s m a -> StateT s m b -> StateT s m b #

return :: a -> StateT s m a #

Monad (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

(>>=) :: Tagged s a -> (a -> Tagged s b) -> Tagged s b #

(>>) :: Tagged s a -> Tagged s b -> Tagged s b #

return :: a -> Tagged s a #

(Monad m, Error e) => Monad (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

(>>=) :: ErrorT e m a -> (a -> ErrorT e m b) -> ErrorT e m b #

(>>) :: ErrorT e m a -> ErrorT e m b -> ErrorT e m b #

return :: a -> ErrorT e m a #

Monad m => Monad (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

(>>=) :: ExceptT e m a -> (a -> ExceptT e m b) -> ExceptT e m b #

(>>) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m b #

return :: a -> ExceptT e m a #

Monad m => Monad (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

(>>=) :: ReaderT r m a -> (a -> ReaderT r m b) -> ReaderT r m b #

(>>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

return :: a -> ReaderT r m a #

Monad m => Monad (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

(>>=) :: StateT s m a -> (a -> StateT s m b) -> StateT s m b #

(>>) :: StateT s m a -> StateT s m b -> StateT s m b #

return :: a -> StateT s m a #

(Monoid a, Monoid b) => Monad ((,,) a b) 
Instance details

Defined in GHC.Base

Methods

(>>=) :: (a, b, a0) -> (a0 -> (a, b, b0)) -> (a, b, b0) #

(>>) :: (a, b, a0) -> (a, b, b0) -> (a, b, b0) #

return :: a0 -> (a, b, a0) #

(Monad f, Monad g) => Monad (f :*: g) 
Instance details

Defined in GHC.Generics

Methods

(>>=) :: (f :*: g) a -> (a -> (f :*: g) b) -> (f :*: g) b #

(>>) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) b #

return :: a -> (f :*: g) a #

Monad (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

(>>=) :: ConduitT i o m a -> (a -> ConduitT i o m b) -> ConduitT i o m b #

(>>) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m b #

return :: a -> ConduitT i o m a #

(Monad f, Applicative f) => Monad (WhenMatched f x y) 
Instance details

Defined in Data.IntMap.Internal

Methods

(>>=) :: WhenMatched f x y a -> (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 b #

return :: a -> WhenMatched f x y a #

(Applicative f, Monad f) => Monad (WhenMissing f k x) 
Instance details

Defined in Data.Map.Internal

Methods

(>>=) :: WhenMissing f k x a -> (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 b #

return :: a -> WhenMissing f k x a #

Stream s => Monad (ParsecT e s m) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

(>>=) :: ParsecT e s m a -> (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 b #

return :: a -> ParsecT e s m a #

(Monoid a, Monoid b, Monoid c) => Monad ((,,,) a b c) 
Instance details

Defined in GHC.Base

Methods

(>>=) :: (a, b, c, a0) -> (a0 -> (a, b, c, b0)) -> (a, b, c, b0) #

(>>) :: (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, b0) #

return :: a0 -> (a, b, c, a0) #

Monad ((->) r) 
Instance details

Defined in GHC.Base

Methods

(>>=) :: (r -> a) -> (a -> r -> b) -> r -> b #

(>>) :: (r -> a) -> (r -> b) -> r -> b #

return :: a -> r -> a #

Monad f => Monad (M1 i c f) 
Instance details

Defined in GHC.Generics

Methods

(>>=) :: M1 i c f a -> (a -> M1 i c f b) -> M1 i c f b #

(>>) :: M1 i c f a -> M1 i c f b -> M1 i c f b #

return :: a -> M1 i c f a #

(Monad f, Applicative f) => Monad (WhenMatched f k x y) 
Instance details

Defined in Data.Map.Internal

Methods

(>>=) :: WhenMatched f k x y a -> (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 b #

return :: a -> WhenMatched f k x y a #

Monad m => Monad (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

(>>=) :: Pipe l i o u m a -> (a -> Pipe l i o u m b) -> Pipe l i o u m b #

(>>) :: Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m b #

return :: a -> Pipe l i o u m a #

data IO a #

Instances

Instances details
MonadFail IO 
Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> IO a #

MonadIO IO 
Instance details

Defined in Control.Monad.IO.Class

Methods

liftIO :: IO a -> IO a

Alternative IO 
Instance details

Defined in GHC.Base

Methods

empty :: IO a #

(<|>) :: IO a -> IO a -> IO a #

some :: IO a -> IO [a] #

many :: IO a -> IO [a] #

Applicative IO 
Instance details

Defined in GHC.Base

Methods

pure :: a -> IO a #

(<*>) :: IO (a -> b) -> IO a -> IO b #

liftA2 :: (a -> b -> c) -> IO a -> IO b -> IO c #

(*>) :: IO a -> IO b -> IO b #

(<*) :: IO a -> IO b -> IO a #

Functor IO 
Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> IO a -> IO b #

(<$) :: a -> IO b -> IO a #

Monad IO 
Instance details

Defined in GHC.Base

Methods

(>>=) :: IO a -> (a -> IO b) -> IO b #

(>>) :: IO a -> IO b -> IO b #

return :: a -> IO a #

MonadPlus IO 
Instance details

Defined in GHC.Base

Methods

mzero :: IO a #

mplus :: IO a -> IO a -> IO a #

MonadCatch IO 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => IO a -> (e -> IO a) -> IO a

MonadMask IO 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. IO a -> IO a) -> IO b) -> IO b

uninterruptibleMask :: ((forall a. IO a -> IO a) -> IO b) -> IO b

generalBracket :: IO a -> (a -> ExitCase b -> IO c) -> (a -> IO b) -> IO (b, c)

MonadThrow IO 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> IO a

PrimBase IO 
Instance details

Defined in Control.Monad.Primitive

Methods

internal :: IO a -> State# (PrimState IO) -> (# State# (PrimState IO), a #)

PrimMonad IO 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState IO

Methods

primitive :: (State# (PrimState IO) -> (# State# (PrimState IO), a #)) -> IO a

Quasi IO 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

qNewName :: String -> IO Name

qReport :: Bool -> String -> IO ()

qRecover :: IO a -> IO a -> IO a

qLookupName :: Bool -> String -> IO (Maybe Name)

qReify :: Name -> IO Info

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]

qLocation :: IO Loc

qRunIO :: IO a -> IO a

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]

qPutDoc :: DocLoc -> String -> IO ()

qGetDoc :: DocLoc -> IO (Maybe String)

Quote IO 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

newName :: String -> IO Name

Monoid a => Monoid (IO a) 
Instance details

Defined in GHC.Base

Methods

mempty :: IO a

mappend :: IO a -> IO a -> IO a

mconcat :: [IO a] -> IO a

Semigroup a => Semigroup (IO a) 
Instance details

Defined in GHC.Base

Methods

(<>) :: IO a -> IO a -> IO a

sconcat :: NonEmpty (IO a) -> IO a

stimes :: Integral b => b -> IO a -> IO a

a ~ () => HPrintfType (IO a) 
Instance details

Defined in Text.Printf

Methods

hspr :: Handle -> String -> [UPrintf] -> IO a

a ~ () => PrintfType (IO a) 
Instance details

Defined in Text.Printf

Methods

spr :: String -> [UPrintf] -> IO a

Default a => Default (IO a) 
Instance details

Defined in Data.Default.Class

Methods

def :: IO a

MonoFunctor (IO a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (IO a) -> Element (IO a)) -> IO a -> IO a

MonoPointed (IO a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (IO a) -> IO a

Assertable t => Assertable (IO t) 
Instance details

Defined in Test.Tasty.HUnit.Orig

Methods

assert :: IO t -> Assertion #

AssertionPredicable t => AssertionPredicable (IO t) 
Instance details

Defined in Test.Tasty.HUnit.Orig

Methods

assertionPredicate :: IO t -> IO Bool #

Run (InputT IO) Haskeline 
Instance details

Defined in System.Console.Wizard.Haskeline

Methods

runAlgebra :: Haskeline (InputT IO v) -> InputT IO v

Run (InputT IO) WithSettings 
Instance details

Defined in System.Console.Wizard.Haskeline

Methods

runAlgebra :: WithSettings (InputT IO v) -> InputT IO v

type PrimState IO 
Instance details

Defined in Control.Monad.Primitive

type PrimState IO = RealWorld
type Element (IO a) 
Instance details

Defined in Data.MonoTraversable

type Element (IO a) = a

class Eq a => Ord a where #

Minimal complete definition

compare | (<=)

Methods

compare :: a -> a -> Ordering #

(<) :: a -> a -> Bool #

(<=) :: a -> a -> Bool #

(>) :: a -> a -> Bool #

(>=) :: a -> a -> Bool #

max :: a -> a -> a #

min :: a -> a -> a #

Instances

Instances details
Ord DL 
Instance details

Defined in Data.Algorithm.Diff

Methods

compare :: DL -> DL -> Ordering #

(<) :: DL -> DL -> Bool #

(<=) :: DL -> DL -> Bool #

(>) :: DL -> DL -> Bool #

(>=) :: DL -> DL -> Bool #

max :: DL -> DL -> DL #

min :: DL -> DL -> DL #

Ord DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

compare :: DotNetTime -> DotNetTime -> Ordering #

(<) :: DotNetTime -> DotNetTime -> Bool #

(<=) :: DotNetTime -> DotNetTime -> Bool #

(>) :: DotNetTime -> DotNetTime -> Bool #

(>=) :: DotNetTime -> DotNetTime -> Bool #

max :: DotNetTime -> DotNetTime -> DotNetTime #

min :: DotNetTime -> DotNetTime -> DotNetTime #

Ord JSONPathElement 
Instance details

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 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

compare :: Value -> Value -> Ordering #

(<) :: Value -> Value -> Bool #

(<=) :: Value -> Value -> Bool #

(>) :: Value -> Value -> Bool #

(>=) :: Value -> Value -> Bool #

max :: Value -> Value -> Value #

min :: Value -> Value -> Value #

Ord BlinkSpeed 
Instance details

Defined in System.Console.ANSI.Types

Methods

compare :: BlinkSpeed -> BlinkSpeed -> Ordering #

(<) :: BlinkSpeed -> BlinkSpeed -> Bool #

(<=) :: BlinkSpeed -> BlinkSpeed -> Bool #

(>) :: BlinkSpeed -> BlinkSpeed -> Bool #

(>=) :: BlinkSpeed -> BlinkSpeed -> Bool #

max :: BlinkSpeed -> BlinkSpeed -> BlinkSpeed #

min :: BlinkSpeed -> BlinkSpeed -> BlinkSpeed #

Ord Color 
Instance details

Defined in System.Console.ANSI.Types

Methods

compare :: Color -> Color -> Ordering #

(<) :: Color -> Color -> Bool #

(<=) :: Color -> Color -> Bool #

(>) :: Color -> Color -> Bool #

(>=) :: Color -> Color -> Bool #

max :: Color -> Color -> Color #

min :: Color -> Color -> Color #

Ord ColorIntensity 
Instance details

Defined in System.Console.ANSI.Types

Methods

compare :: ColorIntensity -> ColorIntensity -> Ordering #

(<) :: ColorIntensity -> ColorIntensity -> Bool #

(<=) :: ColorIntensity -> ColorIntensity -> Bool #

(>) :: ColorIntensity -> ColorIntensity -> Bool #

(>=) :: ColorIntensity -> ColorIntensity -> Bool #

max :: ColorIntensity -> ColorIntensity -> ColorIntensity #

min :: ColorIntensity -> ColorIntensity -> ColorIntensity #

Ord ConsoleIntensity 
Instance details

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 
Instance details

Defined in System.Console.ANSI.Types

Methods

compare :: ConsoleLayer -> ConsoleLayer -> Ordering #

(<) :: ConsoleLayer -> ConsoleLayer -> Bool #

(<=) :: ConsoleLayer -> ConsoleLayer -> Bool #

(>) :: ConsoleLayer -> ConsoleLayer -> Bool #

(>=) :: ConsoleLayer -> ConsoleLayer -> Bool #

max :: ConsoleLayer -> ConsoleLayer -> ConsoleLayer #

min :: ConsoleLayer -> ConsoleLayer -> ConsoleLayer #

Ord Underlining 
Instance details

Defined in System.Console.ANSI.Types

Methods

compare :: Underlining -> Underlining -> Ordering #

(<) :: Underlining -> Underlining -> Bool #

(<=) :: Underlining -> Underlining -> Bool #

(>) :: Underlining -> Underlining -> Bool #

(>=) :: Underlining -> Underlining -> Bool #

max :: Underlining -> Underlining -> Underlining #

min :: Underlining -> Underlining -> Underlining #

Ord Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

compare :: Pos -> Pos -> Ordering #

(<) :: Pos -> Pos -> Bool #

(<=) :: Pos -> Pos -> Bool #

(>) :: Pos -> Pos -> Bool #

(>=) :: Pos -> Pos -> Bool #

max :: Pos -> Pos -> Pos #

min :: Pos -> Pos -> Pos #

Ord ByteArray 
Instance details

Defined in Data.Array.Byte

Methods

compare :: ByteArray -> ByteArray -> Ordering #

(<) :: ByteArray -> ByteArray -> Bool #

(<=) :: ByteArray -> ByteArray -> Bool #

(>) :: ByteArray -> ByteArray -> Bool #

(>=) :: ByteArray -> ByteArray -> Bool #

max :: ByteArray -> ByteArray -> ByteArray #

min :: ByteArray -> ByteArray -> ByteArray #

Ord All 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: All -> All -> Ordering #

(<) :: All -> All -> Bool #

(<=) :: All -> All -> Bool #

(>) :: All -> All -> Bool #

(>=) :: All -> All -> Bool #

max :: All -> All -> All #

min :: All -> All -> All #

Ord Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Any -> Any -> Ordering #

(<) :: Any -> Any -> Bool #

(<=) :: Any -> Any -> Bool #

(>) :: Any -> Any -> Bool #

(>=) :: Any -> Any -> Bool #

max :: Any -> Any -> Any #

min :: Any -> Any -> Any #

Ord SomeTypeRep 
Instance details

Defined in Data.Typeable.Internal

Methods

compare :: SomeTypeRep -> SomeTypeRep -> Ordering #

(<) :: SomeTypeRep -> SomeTypeRep -> Bool #

(<=) :: SomeTypeRep -> SomeTypeRep -> Bool #

(>) :: SomeTypeRep -> SomeTypeRep -> Bool #

(>=) :: SomeTypeRep -> SomeTypeRep -> Bool #

max :: SomeTypeRep -> SomeTypeRep -> SomeTypeRep #

min :: SomeTypeRep -> SomeTypeRep -> SomeTypeRep #

Ord Version 
Instance details

Defined in Data.Version

Methods

compare :: Version -> Version -> Ordering #

(<) :: Version -> Version -> Bool #

(<=) :: Version -> Version -> Bool #

(>) :: Version -> Version -> Bool #

(>=) :: Version -> Version -> Bool #

max :: Version -> Version -> Version #

min :: Version -> Version -> Version #

Ord Void 
Instance details

Defined in Data.Void

Methods

compare :: Void -> Void -> Ordering #

(<) :: Void -> Void -> Bool #

(<=) :: Void -> Void -> Bool #

(>) :: Void -> Void -> Bool #

(>=) :: Void -> Void -> Bool #

max :: Void -> Void -> Void #

min :: Void -> Void -> Void #

Ord BlockReason 
Instance details

Defined in GHC.Conc.Sync

Methods

compare :: BlockReason -> BlockReason -> Ordering #

(<) :: BlockReason -> BlockReason -> Bool #

(<=) :: BlockReason -> BlockReason -> Bool #

(>) :: BlockReason -> BlockReason -> Bool #

(>=) :: BlockReason -> BlockReason -> Bool #

max :: BlockReason -> BlockReason -> BlockReason #

min :: BlockReason -> BlockReason -> BlockReason #

Ord ThreadId 
Instance details

Defined in GHC.Conc.Sync

Methods

compare :: ThreadId -> ThreadId -> Ordering #

(<) :: ThreadId -> ThreadId -> Bool #

(<=) :: ThreadId -> ThreadId -> Bool #

(>) :: ThreadId -> ThreadId -> Bool #

(>=) :: ThreadId -> ThreadId -> Bool #

max :: ThreadId -> ThreadId -> ThreadId #

min :: ThreadId -> ThreadId -> ThreadId #

Ord ThreadStatus 
Instance details

Defined in GHC.Conc.Sync

Methods

compare :: ThreadStatus -> ThreadStatus -> Ordering #

(<) :: ThreadStatus -> ThreadStatus -> Bool #

(<=) :: ThreadStatus -> ThreadStatus -> Bool #

(>) :: ThreadStatus -> ThreadStatus -> Bool #

(>=) :: ThreadStatus -> ThreadStatus -> Bool #

max :: ThreadStatus -> ThreadStatus -> ThreadStatus #

min :: ThreadStatus -> ThreadStatus -> ThreadStatus #

Ord ErrorCall 
Instance details

Defined in GHC.Exception

Methods

compare :: ErrorCall -> ErrorCall -> Ordering #

(<) :: ErrorCall -> ErrorCall -> Bool #

(<=) :: ErrorCall -> ErrorCall -> Bool #

(>) :: ErrorCall -> ErrorCall -> Bool #

(>=) :: ErrorCall -> ErrorCall -> Bool #

max :: ErrorCall -> ErrorCall -> ErrorCall #

min :: ErrorCall -> ErrorCall -> ErrorCall #

Ord ArithException 
Instance details

Defined in GHC.Exception.Type

Methods

compare :: ArithException -> ArithException -> Ordering #

(<) :: ArithException -> ArithException -> Bool #

(<=) :: ArithException -> ArithException -> Bool #

(>) :: ArithException -> ArithException -> Bool #

(>=) :: ArithException -> ArithException -> Bool #

max :: ArithException -> ArithException -> ArithException #

min :: ArithException -> ArithException -> ArithException #

Ord Associativity 
Instance details

Defined in GHC.Generics

Methods

compare :: Associativity -> Associativity -> Ordering #

(<) :: Associativity -> Associativity -> Bool #

(<=) :: Associativity -> Associativity -> Bool #

(>) :: Associativity -> Associativity -> Bool #

(>=) :: Associativity -> Associativity -> Bool #

max :: Associativity -> Associativity -> Associativity #

min :: Associativity -> Associativity -> Associativity #

Ord DecidedStrictness 
Instance details

Defined in GHC.Generics

Methods

compare :: DecidedStrictness -> DecidedStrictness -> Ordering #

(<) :: DecidedStrictness -> DecidedStrictness -> Bool #

(<=) :: DecidedStrictness -> DecidedStrictness -> Bool #

(>) :: DecidedStrictness -> DecidedStrictness -> Bool #

(>=) :: DecidedStrictness -> DecidedStrictness -> Bool #

max :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness #

min :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness #

Ord Fixity 
Instance details

Defined in GHC.Generics

Methods

compare :: Fixity -> Fixity -> Ordering #

(<) :: Fixity -> Fixity -> Bool #

(<=) :: Fixity -> Fixity -> Bool #

(>) :: Fixity -> Fixity -> Bool #

(>=) :: Fixity -> Fixity -> Bool #

max :: Fixity -> Fixity -> Fixity #

min :: Fixity -> Fixity -> Fixity #

Ord SourceStrictness 
Instance details

Defined in GHC.Generics

Methods

compare :: SourceStrictness -> SourceStrictness -> Ordering #

(<) :: SourceStrictness -> SourceStrictness -> Bool #

(<=) :: SourceStrictness -> SourceStrictness -> Bool #

(>) :: SourceStrictness -> SourceStrictness -> Bool #

(>=) :: SourceStrictness -> SourceStrictness -> Bool #

max :: SourceStrictness -> SourceStrictness -> SourceStrictness #

min :: SourceStrictness -> SourceStrictness -> SourceStrictness #

Ord SourceUnpackedness 
Instance details

Defined in GHC.Generics

Methods

compare :: SourceUnpackedness -> SourceUnpackedness -> Ordering #

(<) :: SourceUnpackedness -> SourceUnpackedness -> Bool #

(<=) :: SourceUnpackedness -> SourceUnpackedness -> Bool #

(>) :: SourceUnpackedness -> SourceUnpackedness -> Bool #

(>=) :: SourceUnpackedness -> SourceUnpackedness -> Bool #

max :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness #

min :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness #

Ord SeekMode 
Instance details

Defined in GHC.IO.Device

Methods

compare :: SeekMode -> SeekMode -> Ordering #

(<) :: SeekMode -> SeekMode -> Bool #

(<=) :: SeekMode -> SeekMode -> Bool #

(>) :: SeekMode -> SeekMode -> Bool #

(>=) :: SeekMode -> SeekMode -> Bool #

max :: SeekMode -> SeekMode -> SeekMode #

min :: SeekMode -> SeekMode -> SeekMode #

Ord ArrayException 
Instance details

Defined in GHC.IO.Exception

Methods

compare :: ArrayException -> ArrayException -> Ordering #

(<) :: ArrayException -> ArrayException -> Bool #

(<=) :: ArrayException -> ArrayException -> Bool #

(>) :: ArrayException -> ArrayException -> Bool #

(>=) :: ArrayException -> ArrayException -> Bool #

max :: ArrayException -> ArrayException -> ArrayException #

min :: ArrayException -> ArrayException -> ArrayException #

Ord AsyncException 
Instance details

Defined in GHC.IO.Exception

Methods

compare :: AsyncException -> AsyncException -> Ordering #

(<) :: AsyncException -> AsyncException -> Bool #

(<=) :: AsyncException -> AsyncException -> Bool #

(>) :: AsyncException -> AsyncException -> Bool #

(>=) :: AsyncException -> AsyncException -> Bool #

max :: AsyncException -> AsyncException -> AsyncException #

min :: AsyncException -> AsyncException -> AsyncException #

Ord ExitCode 
Instance details

Defined in GHC.IO.Exception

Methods

compare :: ExitCode -> ExitCode -> Ordering #

(<) :: ExitCode -> ExitCode -> Bool #

(<=) :: ExitCode -> ExitCode -> Bool #

(>) :: ExitCode -> ExitCode -> Bool #

(>=) :: ExitCode -> ExitCode -> Bool #

max :: ExitCode -> ExitCode -> ExitCode #

min :: ExitCode -> ExitCode -> ExitCode #

Ord BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

Ord Newline 
Instance details

Defined in GHC.IO.Handle.Types

Methods

compare :: Newline -> Newline -> Ordering #

(<) :: Newline -> Newline -> Bool #

(<=) :: Newline -> Newline -> Bool #

(>) :: Newline -> Newline -> Bool #

(>=) :: Newline -> Newline -> Bool #

max :: Newline -> Newline -> Newline #

min :: Newline -> Newline -> Newline #

Ord NewlineMode 
Instance details

Defined in GHC.IO.Handle.Types

Ord IOMode 
Instance details

Defined in GHC.IO.IOMode

Methods

compare :: IOMode -> IOMode -> Ordering #

(<) :: IOMode -> IOMode -> Bool #

(<=) :: IOMode -> IOMode -> Bool #

(>) :: IOMode -> IOMode -> Bool #

(>=) :: IOMode -> IOMode -> Bool #

max :: IOMode -> IOMode -> IOMode #

min :: IOMode -> IOMode -> IOMode #

Ord GeneralCategory 
Instance details

Defined in GHC.Unicode

Ord Word16 
Instance details

Defined in GHC.Word

Methods

compare :: Word16 -> Word16 -> Ordering #

(<) :: Word16 -> Word16 -> Bool #

(<=) :: Word16 -> Word16 -> Bool #

(>) :: Word16 -> Word16 -> Bool #

(>=) :: Word16 -> Word16 -> Bool #

max :: Word16 -> Word16 -> Word16 #

min :: Word16 -> Word16 -> Word16 #

Ord Word32 
Instance details

Defined in GHC.Word

Methods

compare :: Word32 -> Word32 -> Ordering #

(<) :: Word32 -> Word32 -> Bool #

(<=) :: Word32 -> Word32 -> Bool #

(>) :: Word32 -> Word32 -> Bool #

(>=) :: Word32 -> Word32 -> Bool #

max :: Word32 -> Word32 -> Word32 #

min :: Word32 -> Word32 -> Word32 #

Ord Word64 
Instance details

Defined in GHC.Word

Methods

compare :: Word64 -> Word64 -> Ordering #

(<) :: Word64 -> Word64 -> Bool #

(<=) :: Word64 -> Word64 -> Bool #

(>) :: Word64 -> Word64 -> Bool #

(>=) :: Word64 -> Word64 -> Bool #

max :: Word64 -> Word64 -> Word64 #

min :: Word64 -> Word64 -> Word64 #

Ord Word8 
Instance details

Defined in GHC.Word

Methods

compare :: Word8 -> Word8 -> Ordering #

(<) :: Word8 -> Word8 -> Bool #

(<=) :: Word8 -> Word8 -> Bool #

(>) :: Word8 -> Word8 -> Bool #

(>=) :: Word8 -> Word8 -> Bool #

max :: Word8 -> Word8 -> Word8 #

min :: Word8 -> Word8 -> Word8 #

Ord CBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

compare :: CBlkCnt -> CBlkCnt -> Ordering #

(<) :: CBlkCnt -> CBlkCnt -> Bool #

(<=) :: CBlkCnt -> CBlkCnt -> Bool #

(>) :: CBlkCnt -> CBlkCnt -> Bool #

(>=) :: CBlkCnt -> CBlkCnt -> Bool #

max :: CBlkCnt -> CBlkCnt -> CBlkCnt #

min :: CBlkCnt -> CBlkCnt -> CBlkCnt #

Ord CBlkSize 
Instance details

Defined in System.Posix.Types

Methods

compare :: CBlkSize -> CBlkSize -> Ordering #

(<) :: CBlkSize -> CBlkSize -> Bool #

(<=) :: CBlkSize -> CBlkSize -> Bool #

(>) :: CBlkSize -> CBlkSize -> Bool #

(>=) :: CBlkSize -> CBlkSize -> Bool #

max :: CBlkSize -> CBlkSize -> CBlkSize #

min :: CBlkSize -> CBlkSize -> CBlkSize #

Ord CCc 
Instance details

Defined in System.Posix.Types

Methods

compare :: CCc -> CCc -> Ordering #

(<) :: CCc -> CCc -> Bool #

(<=) :: CCc -> CCc -> Bool #

(>) :: CCc -> CCc -> Bool #

(>=) :: CCc -> CCc -> Bool #

max :: CCc -> CCc -> CCc #

min :: CCc -> CCc -> CCc #

Ord CClockId 
Instance details

Defined in System.Posix.Types

Methods

compare :: CClockId -> CClockId -> Ordering #

(<) :: CClockId -> CClockId -> Bool #

(<=) :: CClockId -> CClockId -> Bool #

(>) :: CClockId -> CClockId -> Bool #

(>=) :: CClockId -> CClockId -> Bool #

max :: CClockId -> CClockId -> CClockId #

min :: CClockId -> CClockId -> CClockId #

Ord CDev 
Instance details

Defined in System.Posix.Types

Methods

compare :: CDev -> CDev -> Ordering #

(<) :: CDev -> CDev -> Bool #

(<=) :: CDev -> CDev -> Bool #

(>) :: CDev -> CDev -> Bool #

(>=) :: CDev -> CDev -> Bool #

max :: CDev -> CDev -> CDev #

min :: CDev -> CDev -> CDev #

Ord CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

compare :: CFsBlkCnt -> CFsBlkCnt -> Ordering #

(<) :: CFsBlkCnt -> CFsBlkCnt -> Bool #

(<=) :: CFsBlkCnt -> CFsBlkCnt -> Bool #

(>) :: CFsBlkCnt -> CFsBlkCnt -> Bool #

(>=) :: CFsBlkCnt -> CFsBlkCnt -> Bool #

max :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt #

min :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt #

Ord CFsFilCnt 
Instance details

Defined in System.Posix.Types

Methods

compare :: CFsFilCnt -> CFsFilCnt -> Ordering #

(<) :: CFsFilCnt -> CFsFilCnt -> Bool #

(<=) :: CFsFilCnt -> CFsFilCnt -> Bool #

(>) :: CFsFilCnt -> CFsFilCnt -> Bool #

(>=) :: CFsFilCnt -> CFsFilCnt -> Bool #

max :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt #

min :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt #

Ord CGid 
Instance details

Defined in System.Posix.Types

Methods

compare :: CGid -> CGid -> Ordering #

(<) :: CGid -> CGid -> Bool #

(<=) :: CGid -> CGid -> Bool #

(>) :: CGid -> CGid -> Bool #

(>=) :: CGid -> CGid -> Bool #

max :: CGid -> CGid -> CGid #

min :: CGid -> CGid -> CGid #

Ord CId 
Instance details

Defined in System.Posix.Types

Methods

compare :: CId -> CId -> Ordering #

(<) :: CId -> CId -> Bool #

(<=) :: CId -> CId -> Bool #

(>) :: CId -> CId -> Bool #

(>=) :: CId -> CId -> Bool #

max :: CId -> CId -> CId #

min :: CId -> CId -> CId #

Ord CIno 
Instance details

Defined in System.Posix.Types

Methods

compare :: CIno -> CIno -> Ordering #

(<) :: CIno -> CIno -> Bool #

(<=) :: CIno -> CIno -> Bool #

(>) :: CIno -> CIno -> Bool #

(>=) :: CIno -> CIno -> Bool #

max :: CIno -> CIno -> CIno #

min :: CIno -> CIno -> CIno #

Ord CKey 
Instance details

Defined in System.Posix.Types

Methods

compare :: CKey -> CKey -> Ordering #

(<) :: CKey -> CKey -> Bool #

(<=) :: CKey -> CKey -> Bool #

(>) :: CKey -> CKey -> Bool #

(>=) :: CKey -> CKey -> Bool #

max :: CKey -> CKey -> CKey #

min :: CKey -> CKey -> CKey #

Ord CMode 
Instance details

Defined in System.Posix.Types

Methods

compare :: CMode -> CMode -> Ordering #

(<) :: CMode -> CMode -> Bool #

(<=) :: CMode -> CMode -> Bool #

(>) :: CMode -> CMode -> Bool #

(>=) :: CMode -> CMode -> Bool #

max :: CMode -> CMode -> CMode #

min :: CMode -> CMode -> CMode #

Ord CNfds 
Instance details

Defined in System.Posix.Types

Methods

compare :: CNfds -> CNfds -> Ordering #

(<) :: CNfds -> CNfds -> Bool #

(<=) :: CNfds -> CNfds -> Bool #

(>) :: CNfds -> CNfds -> Bool #

(>=) :: CNfds -> CNfds -> Bool #

max :: CNfds -> CNfds -> CNfds #

min :: CNfds -> CNfds -> CNfds #

Ord CNlink 
Instance details

Defined in System.Posix.Types

Methods

compare :: CNlink -> CNlink -> Ordering #

(<) :: CNlink -> CNlink -> Bool #

(<=) :: CNlink -> CNlink -> Bool #

(>) :: CNlink -> CNlink -> Bool #

(>=) :: CNlink -> CNlink -> Bool #

max :: CNlink -> CNlink -> CNlink #

min :: CNlink -> CNlink -> CNlink #

Ord COff 
Instance details

Defined in System.Posix.Types

Methods

compare :: COff -> COff -> Ordering #

(<) :: COff -> COff -> Bool #

(<=) :: COff -> COff -> Bool #

(>) :: COff -> COff -> Bool #

(>=) :: COff -> COff -> Bool #

max :: COff -> COff -> COff #

min :: COff -> COff -> COff #

Ord CPid 
Instance details

Defined in System.Posix.Types

Methods

compare :: CPid -> CPid -> Ordering #

(<) :: CPid -> CPid -> Bool #

(<=) :: CPid -> CPid -> Bool #

(>) :: CPid -> CPid -> Bool #

(>=) :: CPid -> CPid -> Bool #

max :: CPid -> CPid -> CPid #

min :: CPid -> CPid -> CPid #

Ord CRLim 
Instance details

Defined in System.Posix.Types

Methods

compare :: CRLim -> CRLim -> Ordering #

(<) :: CRLim -> CRLim -> Bool #

(<=) :: CRLim -> CRLim -> Bool #

(>) :: CRLim -> CRLim -> Bool #

(>=) :: CRLim -> CRLim -> Bool #

max :: CRLim -> CRLim -> CRLim #

min :: CRLim -> CRLim -> CRLim #

Ord CSocklen 
Instance details

Defined in System.Posix.Types

Methods

compare :: CSocklen -> CSocklen -> Ordering #

(<) :: CSocklen -> CSocklen -> Bool #

(<=) :: CSocklen -> CSocklen -> Bool #

(>) :: CSocklen -> CSocklen -> Bool #

(>=) :: CSocklen -> CSocklen -> Bool #

max :: CSocklen -> CSocklen -> CSocklen #

min :: CSocklen -> CSocklen -> CSocklen #

Ord CSpeed 
Instance details

Defined in System.Posix.Types

Methods

compare :: CSpeed -> CSpeed -> Ordering #

(<) :: CSpeed -> CSpeed -> Bool #

(<=) :: CSpeed -> CSpeed -> Bool #

(>) :: CSpeed -> CSpeed -> Bool #

(>=) :: CSpeed -> CSpeed -> Bool #

max :: CSpeed -> CSpeed -> CSpeed #

min :: CSpeed -> CSpeed -> CSpeed #

Ord CSsize 
Instance details

Defined in System.Posix.Types

Methods

compare :: CSsize -> CSsize -> Ordering #

(<) :: CSsize -> CSsize -> Bool #

(<=) :: CSsize -> CSsize -> Bool #

(>) :: CSsize -> CSsize -> Bool #

(>=) :: CSsize -> CSsize -> Bool #

max :: CSsize -> CSsize -> CSsize #

min :: CSsize -> CSsize -> CSsize #

Ord CTcflag 
Instance details

Defined in System.Posix.Types

Methods

compare :: CTcflag -> CTcflag -> Ordering #

(<) :: CTcflag -> CTcflag -> Bool #

(<=) :: CTcflag -> CTcflag -> Bool #

(>) :: CTcflag -> CTcflag -> Bool #

(>=) :: CTcflag -> CTcflag -> Bool #

max :: CTcflag -> CTcflag -> CTcflag #

min :: CTcflag -> CTcflag -> CTcflag #

Ord CTimer 
Instance details

Defined in System.Posix.Types

Methods

compare :: CTimer -> CTimer -> Ordering #

(<) :: CTimer -> CTimer -> Bool #

(<=) :: CTimer -> CTimer -> Bool #

(>) :: CTimer -> CTimer -> Bool #

(>=) :: CTimer -> CTimer -> Bool #

max :: CTimer -> CTimer -> CTimer #

min :: CTimer -> CTimer -> CTimer #

Ord CUid 
Instance details

Defined in System.Posix.Types

Methods

compare :: CUid -> CUid -> Ordering #

(<) :: CUid -> CUid -> Bool #

(<=) :: CUid -> CUid -> Bool #

(>) :: CUid -> CUid -> Bool #

(>=) :: CUid -> CUid -> Bool #

max :: CUid -> CUid -> CUid #

min :: CUid -> CUid -> CUid #

Ord Fd 
Instance details

Defined in System.Posix.Types

Methods

compare :: Fd -> Fd -> Ordering #

(<) :: Fd -> Fd -> Bool #

(<=) :: Fd -> Fd -> Bool #

(>) :: Fd -> Fd -> Bool #

(>=) :: Fd -> Fd -> Bool #

max :: Fd -> Fd -> Fd #

min :: Fd -> Fd -> Fd #

Ord ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

compare :: ByteString -> ByteString -> Ordering #

(<) :: ByteString -> ByteString -> Bool #

(<=) :: ByteString -> ByteString -> Bool #

(>) :: ByteString -> ByteString -> Bool #

(>=) :: ByteString -> ByteString -> Bool #

max :: ByteString -> ByteString -> ByteString #

min :: ByteString -> ByteString -> ByteString #

Ord ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

compare :: ByteString -> ByteString -> Ordering #

(<) :: ByteString -> ByteString -> Bool #

(<=) :: ByteString -> ByteString -> Bool #

(>) :: ByteString -> ByteString -> Bool #

(>=) :: ByteString -> ByteString -> Bool #

max :: ByteString -> ByteString -> ByteString #

min :: ByteString -> ByteString -> ByteString #

Ord ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Methods

compare :: ShortByteString -> ShortByteString -> Ordering #

(<) :: ShortByteString -> ShortByteString -> Bool #

(<=) :: ShortByteString -> ShortByteString -> Bool #

(>) :: ShortByteString -> ShortByteString -> Bool #

(>=) :: ShortByteString -> ShortByteString -> Bool #

max :: ShortByteString -> ShortByteString -> ShortByteString #

min :: ShortByteString -> ShortByteString -> ShortByteString #

Ord Complete 
Instance details

Defined in System.Console.CmdArgs.Explicit.Complete

Methods

compare :: Complete -> Complete -> Ordering #

(<) :: Complete -> Complete -> Bool #

(<=) :: Complete -> Complete -> Bool #

(>) :: Complete -> Complete -> Bool #

(>=) :: Complete -> Complete -> Bool #

max :: Complete -> Complete -> Complete #

min :: Complete -> Complete -> Complete #

Ord HelpFormat 
Instance details

Defined in System.Console.CmdArgs.Explicit.Help

Ord FlagInfo 
Instance details

Defined in System.Console.CmdArgs.Explicit.Type

Methods

compare :: FlagInfo -> FlagInfo -> Ordering #

(<) :: FlagInfo -> FlagInfo -> Bool #

(<=) :: FlagInfo -> FlagInfo -> Bool #

(>) :: FlagInfo -> FlagInfo -> Bool #

(>=) :: FlagInfo -> FlagInfo -> Bool #

max :: FlagInfo -> FlagInfo -> FlagInfo #

min :: FlagInfo -> FlagInfo -> FlagInfo #

Ord Ann 
Instance details

Defined in System.Console.CmdArgs.Implicit.Ann

Methods

compare :: Ann -> Ann -> Ordering #

(<) :: Ann -> Ann -> Bool #

(<=) :: Ann -> Ann -> Bool #

(>) :: Ann -> Ann -> Bool #

(>=) :: Ann -> Ann -> Bool #

max :: Ann -> Ann -> Ann #

min :: Ann -> Ann -> Ann #

Ord CmdArgsPrivate 
Instance details

Defined in System.Console.CmdArgs.Implicit.Type

Methods

compare :: CmdArgsPrivate -> CmdArgsPrivate -> Ordering #

(<) :: CmdArgsPrivate -> CmdArgsPrivate -> Bool #

(<=) :: CmdArgsPrivate -> CmdArgsPrivate -> Bool #

(>) :: CmdArgsPrivate -> CmdArgsPrivate -> Bool #

(>=) :: CmdArgsPrivate -> CmdArgsPrivate -> Bool #

max :: CmdArgsPrivate -> CmdArgsPrivate -> CmdArgsPrivate #

min :: CmdArgsPrivate -> CmdArgsPrivate -> CmdArgsPrivate #

Ord TextFormat 
Instance details

Defined in System.Console.CmdArgs.Text

Methods

compare :: TextFormat -> TextFormat -> Ordering #

(<) :: TextFormat -> TextFormat -> Bool #

(<=) :: TextFormat -> TextFormat -> Bool #

(>) :: TextFormat -> TextFormat -> Bool #

(>=) :: TextFormat -> TextFormat -> Bool #

max :: TextFormat -> TextFormat -> TextFormat #

min :: TextFormat -> TextFormat -> TextFormat #

Ord Verbosity 
Instance details

Defined in System.Console.CmdArgs.Verbosity

Methods

compare :: Verbosity -> Verbosity -> Ordering #

(<) :: Verbosity -> Verbosity -> Bool #

(<=) :: Verbosity -> Verbosity -> Bool #

(>) :: Verbosity -> Verbosity -> Bool #

(>=) :: Verbosity -> Verbosity -> Bool #

max :: Verbosity -> Verbosity -> Verbosity #

min :: Verbosity -> Verbosity -> Verbosity #

Ord IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

compare :: IntSet -> IntSet -> Ordering #

(<) :: IntSet -> IntSet -> Bool #

(<=) :: IntSet -> IntSet -> Bool #

(>) :: IntSet -> IntSet -> Bool #

(>=) :: IntSet -> IntSet -> Bool #

max :: IntSet -> IntSet -> IntSet #

min :: IntSet -> IntSet -> IntSet #

Ord FileType 
Instance details

Defined in System.Directory.Internal.Common

Methods

compare :: FileType -> FileType -> Ordering #

(<) :: FileType -> FileType -> Bool #

(<=) :: FileType -> FileType -> Bool #

(>) :: FileType -> FileType -> Bool #

(>=) :: FileType -> FileType -> Bool #

max :: FileType -> FileType -> FileType #

min :: FileType -> FileType -> FileType #

Ord Permissions 
Instance details

Defined in System.Directory.Internal.Common

Ord XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Ord XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Ord BigNat 
Instance details

Defined in GHC.Num.BigNat

Methods

compare :: BigNat -> BigNat -> Ordering #

(<) :: BigNat -> BigNat -> Bool #

(<=) :: BigNat -> BigNat -> Bool #

(>) :: BigNat -> BigNat -> Bool #

(>=) :: BigNat -> BigNat -> Bool #

max :: BigNat -> BigNat -> BigNat #

min :: BigNat -> BigNat -> BigNat #

Ord Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Methods

compare :: Extension -> Extension -> Ordering #

(<) :: Extension -> Extension -> Bool #

(<=) :: Extension -> Extension -> Bool #

(>) :: Extension -> Extension -> Bool #

(>=) :: Extension -> Extension -> Bool #

max :: Extension -> Extension -> Extension #

min :: Extension -> Extension -> Extension #

Ord Ordering 
Instance details

Defined in GHC.Classes

Methods

compare :: Ordering -> Ordering -> Ordering #

(<) :: Ordering -> Ordering -> Bool #

(<=) :: Ordering -> Ordering -> Bool #

(>) :: Ordering -> Ordering -> Bool #

(>=) :: Ordering -> Ordering -> Bool #

max :: Ordering -> Ordering -> Ordering #

min :: Ordering -> Ordering -> Ordering #

Ord TyCon 
Instance details

Defined in GHC.Classes

Methods

compare :: TyCon -> TyCon -> Ordering #

(<) :: TyCon -> TyCon -> Bool #

(<=) :: TyCon -> TyCon -> Bool #

(>) :: TyCon -> TyCon -> Bool #

(>=) :: TyCon -> TyCon -> Bool #

max :: TyCon -> TyCon -> TyCon #

min :: TyCon -> TyCon -> TyCon #

Ord Completion 
Instance details

Defined in System.Console.Haskeline.Completion

Methods

compare :: Completion -> Completion -> Ordering #

(<) :: Completion -> Completion -> Bool #

(<=) :: Completion -> Completion -> Bool #

(>) :: Completion -> Completion -> Bool #

(>=) :: Completion -> Completion -> Bool #

max :: Completion -> Completion -> Completion #

min :: Completion -> Completion -> Completion #

Ord AccountAlias 
Instance details

Defined in Hledger.Data.Types

Ord AccountType 
Instance details

Defined in Hledger.Data.Types

Ord Amount 
Instance details

Defined in Hledger.Data.Types

Methods

compare :: Amount -> Amount -> Ordering #

(<) :: Amount -> Amount -> Bool #

(<=) :: Amount -> Amount -> Bool #

(>) :: Amount -> Amount -> Bool #

(>=) :: Amount -> Amount -> Bool #

max :: Amount -> Amount -> Amount #

min :: Amount -> Amount -> Amount #

Ord AmountPrecision 
Instance details

Defined in Hledger.Data.Types

Ord AmountPrice 
Instance details

Defined in Hledger.Data.Types

Ord AmountStyle 
Instance details

Defined in Hledger.Data.Types

Ord DateSpan 
Instance details

Defined in Hledger.Data.Types

Methods

compare :: DateSpan -> DateSpan -> Ordering #

(<) :: DateSpan -> DateSpan -> Bool #

(<=) :: DateSpan -> DateSpan -> Bool #

(>) :: DateSpan -> DateSpan -> Bool #

(>=) :: DateSpan -> DateSpan -> Bool #

max :: DateSpan -> DateSpan -> DateSpan #

min :: DateSpan -> DateSpan -> DateSpan #

Ord DigitGroupStyle 
Instance details

Defined in Hledger.Data.Types

Ord EFDay 
Instance details

Defined in Hledger.Data.Types

Methods

compare :: EFDay -> EFDay -> Ordering #

(<) :: EFDay -> EFDay -> Bool #

(<=) :: EFDay -> EFDay -> Bool #

(>) :: EFDay -> EFDay -> Bool #

(>=) :: EFDay -> EFDay -> Bool #

max :: EFDay -> EFDay -> EFDay #

min :: EFDay -> EFDay -> EFDay #

Ord Interval 
Instance details

Defined in Hledger.Data.Types

Methods

compare :: Interval -> Interval -> Ordering #

(<) :: Interval -> Interval -> Bool #

(<=) :: Interval -> Interval -> Bool #

(>) :: Interval -> Interval -> Bool #

(>=) :: Interval -> Interval -> Bool #

max :: Interval -> Interval -> Interval #

min :: Interval -> Interval -> Interval #

Ord MarketPrice 
Instance details

Defined in Hledger.Data.Types

Ord MixedAmount 
Instance details

Defined in Hledger.Data.Types

Ord MixedAmountKey 
Instance details

Defined in Hledger.Data.Types

Methods

compare :: MixedAmountKey -> MixedAmountKey -> Ordering #

(<) :: MixedAmountKey -> MixedAmountKey -> Bool #

(<=) :: MixedAmountKey -> MixedAmountKey -> Bool #

(>) :: MixedAmountKey -> MixedAmountKey -> Bool #

(>=) :: MixedAmountKey -> MixedAmountKey -> Bool #

max :: MixedAmountKey -> MixedAmountKey -> MixedAmountKey #

min :: MixedAmountKey -> MixedAmountKey -> MixedAmountKey #

Ord Period 
Instance details

Defined in Hledger.Data.Types

Methods

compare :: Period -> Period -> Ordering #

(<) :: Period -> Period -> Bool #

(<=) :: Period -> Period -> Bool #

(>) :: Period -> Period -> Bool #

(>=) :: Period -> Period -> Bool #

max :: Period -> Period -> Period #

min :: Period -> Period -> Period #

Ord PriceDirective 
Instance details

Defined in Hledger.Data.Types

Ord Side 
Instance details

Defined in Hledger.Data.Types

Methods

compare :: Side -> Side -> Ordering #

(<) :: Side -> Side -> Bool #

(<=) :: Side -> Side -> Bool #

(>) :: Side -> Side -> Bool #

(>=) :: Side -> Side -> Bool #

max :: Side -> Side -> Side #

min :: Side -> Side -> Side #

Ord Status 
Instance details

Defined in Hledger.Data.Types

Methods

compare :: Status -> Status -> Ordering #

(<) :: Status -> Status -> Bool #

(<=) :: Status -> Status -> Bool #

(>) :: Status -> Status -> Bool #

(>=) :: Status -> Status -> Bool #

max :: Status -> Status -> Status #

min :: Status -> Status -> Status #

Ord TimeclockCode 
Instance details

Defined in Hledger.Data.Types

Ord TimeclockEntry 
Instance details

Defined in Hledger.Data.Types

Ord DisplayName 
Instance details

Defined in Hledger.Reports.ReportTypes

Ord Regexp 
Instance details

Defined in Hledger.Utils.Regex

Methods

compare :: Regexp -> Regexp -> Ordering #

(<) :: Regexp -> Regexp -> Bool #

(<=) :: Regexp -> Regexp -> Bool #

(>) :: Regexp -> Regexp -> Bool #

(>=) :: Regexp -> Regexp -> Bool #

max :: Regexp -> Regexp -> Regexp #

min :: Regexp -> Regexp -> Regexp #

Ord HledgerParseErrorData 
Instance details

Defined in Text.Megaparsec.Custom

Ord Pos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

compare :: Pos -> Pos -> Ordering #

(<) :: Pos -> Pos -> Bool #

(<=) :: Pos -> Pos -> Bool #

(>) :: Pos -> Pos -> Bool #

(>=) :: Pos -> Pos -> Bool #

max :: Pos -> Pos -> Pos #

min :: Pos -> Pos -> Pos #

Ord SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Ord FusionDepth 
Instance details

Defined in Prettyprinter.Internal

Methods

compare :: FusionDepth -> FusionDepth -> Ordering #

(<) :: FusionDepth -> FusionDepth -> Bool #

(<=) :: FusionDepth -> FusionDepth -> Bool #

(>) :: FusionDepth -> FusionDepth -> Bool #

(>=) :: FusionDepth -> FusionDepth -> Bool #

max :: FusionDepth -> FusionDepth -> FusionDepth #

min :: FusionDepth -> FusionDepth -> FusionDepth #

Ord LayoutOptions 
Instance details

Defined in Prettyprinter.Internal

Methods

compare :: LayoutOptions -> LayoutOptions -> Ordering #

(<) :: LayoutOptions -> LayoutOptions -> Bool #

(<=) :: LayoutOptions -> LayoutOptions -> Bool #

(>) :: LayoutOptions -> LayoutOptions -> Bool #

(>=) :: LayoutOptions -> LayoutOptions -> Bool #

max :: LayoutOptions -> LayoutOptions -> LayoutOptions #

min :: LayoutOptions -> LayoutOptions -> LayoutOptions #

Ord PageWidth 
Instance details

Defined in Prettyprinter.Internal

Methods

compare :: PageWidth -> PageWidth -> Ordering #

(<) :: PageWidth -> PageWidth -> Bool #

(<=) :: PageWidth -> PageWidth -> Bool #

(>) :: PageWidth -> PageWidth -> Bool #

(>=) :: PageWidth -> PageWidth -> Bool #

max :: PageWidth -> PageWidth -> PageWidth #

min :: PageWidth -> PageWidth -> PageWidth #

Ord AnsiStyle 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: AnsiStyle -> AnsiStyle -> Ordering #

(<) :: AnsiStyle -> AnsiStyle -> Bool #

(<=) :: AnsiStyle -> AnsiStyle -> Bool #

(>) :: AnsiStyle -> AnsiStyle -> Bool #

(>=) :: AnsiStyle -> AnsiStyle -> Bool #

max :: AnsiStyle -> AnsiStyle -> AnsiStyle #

min :: AnsiStyle -> AnsiStyle -> AnsiStyle #

Ord Bold 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Bold -> Bold -> Ordering #

(<) :: Bold -> Bold -> Bool #

(<=) :: Bold -> Bold -> Bool #

(>) :: Bold -> Bold -> Bool #

(>=) :: Bold -> Bold -> Bool #

max :: Bold -> Bold -> Bold #

min :: Bold -> Bold -> Bold #

Ord Color 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Color -> Color -> Ordering #

(<) :: Color -> Color -> Bool #

(<=) :: Color -> Color -> Bool #

(>) :: Color -> Color -> Bool #

(>=) :: Color -> Color -> Bool #

max :: Color -> Color -> Color #

min :: Color -> Color -> Color #

Ord Intensity 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Intensity -> Intensity -> Ordering #

(<) :: Intensity -> Intensity -> Bool #

(<=) :: Intensity -> Intensity -> Bool #

(>) :: Intensity -> Intensity -> Bool #

(>=) :: Intensity -> Intensity -> Bool #

max :: Intensity -> Intensity -> Intensity #

min :: Intensity -> Intensity -> Intensity #

Ord Italicized 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Italicized -> Italicized -> Ordering #

(<) :: Italicized -> Italicized -> Bool #

(<=) :: Italicized -> Italicized -> Bool #

(>) :: Italicized -> Italicized -> Bool #

(>=) :: Italicized -> Italicized -> Bool #

max :: Italicized -> Italicized -> Italicized #

min :: Italicized -> Italicized -> Italicized #

Ord Layer 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Layer -> Layer -> Ordering #

(<) :: Layer -> Layer -> Bool #

(<=) :: Layer -> Layer -> Bool #

(>) :: Layer -> Layer -> Bool #

(>=) :: Layer -> Layer -> Bool #

max :: Layer -> Layer -> Layer #

min :: Layer -> Layer -> Layer #

Ord Underlined 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Underlined -> Underlined -> Ordering #

(<) :: Underlined -> Underlined -> Bool #

(<=) :: Underlined -> Underlined -> Bool #

(>) :: Underlined -> Underlined -> Bool #

(>=) :: Underlined -> Underlined -> Bool #

max :: Underlined -> Underlined -> Underlined #

min :: Underlined -> Underlined -> Underlined #

Ord DoPa 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

compare :: DoPa -> DoPa -> Ordering #

(<) :: DoPa -> DoPa -> Bool #

(<=) :: DoPa -> DoPa -> Bool #

(>) :: DoPa -> DoPa -> Bool #

(>=) :: DoPa -> DoPa -> Bool #

max :: DoPa -> DoPa -> DoPa #

min :: DoPa -> DoPa -> DoPa #

Ord WhichTest 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

compare :: WhichTest -> WhichTest -> Ordering #

(<) :: WhichTest -> WhichTest -> Bool #

(<=) :: WhichTest -> WhichTest -> Bool #

(>) :: WhichTest -> WhichTest -> Bool #

(>=) :: WhichTest -> WhichTest -> Bool #

max :: WhichTest -> WhichTest -> WhichTest #

min :: WhichTest -> WhichTest -> WhichTest #

Ord Scientific 
Instance details

Defined in Data.Scientific

Methods

compare :: Scientific -> Scientific -> Ordering #

(<) :: Scientific -> Scientific -> Bool #

(<=) :: Scientific -> Scientific -> Bool #

(>) :: Scientific -> Scientific -> Bool #

(>=) :: Scientific -> Scientific -> Bool #

max :: Scientific -> Scientific -> Scientific #

min :: Scientific -> Scientific -> Scientific #

Ord NumThreads 
Instance details

Defined in Test.Tasty.Options.Core

Methods

compare :: NumThreads -> NumThreads -> Ordering #

(<) :: NumThreads -> NumThreads -> Bool #

(<=) :: NumThreads -> NumThreads -> Bool #

(>) :: NumThreads -> NumThreads -> Bool #

(>=) :: NumThreads -> NumThreads -> Bool #

max :: NumThreads -> NumThreads -> NumThreads #

min :: NumThreads -> NumThreads -> NumThreads #

Ord AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: AnnLookup -> AnnLookup -> Ordering #

(<) :: AnnLookup -> AnnLookup -> Bool #

(<=) :: AnnLookup -> AnnLookup -> Bool #

(>) :: AnnLookup -> AnnLookup -> Bool #

(>=) :: AnnLookup -> AnnLookup -> Bool #

max :: AnnLookup -> AnnLookup -> AnnLookup #

min :: AnnLookup -> AnnLookup -> AnnLookup #

Ord AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: AnnTarget -> AnnTarget -> Ordering #

(<) :: AnnTarget -> AnnTarget -> Bool #

(<=) :: AnnTarget -> AnnTarget -> Bool #

(>) :: AnnTarget -> AnnTarget -> Bool #

(>=) :: AnnTarget -> AnnTarget -> Bool #

max :: AnnTarget -> AnnTarget -> AnnTarget #

min :: AnnTarget -> AnnTarget -> AnnTarget #

Ord Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Bang -> Bang -> Ordering #

(<) :: Bang -> Bang -> Bool #

(<=) :: Bang -> Bang -> Bool #

(>) :: Bang -> Bang -> Bool #

(>=) :: Bang -> Bang -> Bool #

max :: Bang -> Bang -> Bang #

min :: Bang -> Bang -> Bang #

Ord Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Body -> Body -> Ordering #

(<) :: Body -> Body -> Bool #

(<=) :: Body -> Body -> Bool #

(>) :: Body -> Body -> Bool #

(>=) :: Body -> Body -> Bool #

max :: Body -> Body -> Body #

min :: Body -> Body -> Body #

Ord Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Bytes -> Bytes -> Ordering #

(<) :: Bytes -> Bytes -> Bool #

(<=) :: Bytes -> Bytes -> Bool #

(>) :: Bytes -> Bytes -> Bool #

(>=) :: Bytes -> Bytes -> Bool #

max :: Bytes -> Bytes -> Bytes #

min :: Bytes -> Bytes -> Bytes #

Ord Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Callconv -> Callconv -> Ordering #

(<) :: Callconv -> Callconv -> Bool #

(<=) :: Callconv -> Callconv -> Bool #

(>) :: Callconv -> Callconv -> Bool #

(>=) :: Callconv -> Callconv -> Bool #

max :: Callconv -> Callconv -> Callconv #

min :: Callconv -> Callconv -> Callconv #

Ord Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Clause -> Clause -> Ordering #

(<) :: Clause -> Clause -> Bool #

(<=) :: Clause -> Clause -> Bool #

(>) :: Clause -> Clause -> Bool #

(>=) :: Clause -> Clause -> Bool #

max :: Clause -> Clause -> Clause #

min :: Clause -> Clause -> Clause #

Ord Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Con -> Con -> Ordering #

(<) :: Con -> Con -> Bool #

(<=) :: Con -> Con -> Bool #

(>) :: Con -> Con -> Bool #

(>=) :: Con -> Con -> Bool #

max :: Con -> Con -> Con #

min :: Con -> Con -> Con #

Ord Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Dec -> Dec -> Ordering #

(<) :: Dec -> Dec -> Bool #

(<=) :: Dec -> Dec -> Bool #

(>) :: Dec -> Dec -> Bool #

(>=) :: Dec -> Dec -> Bool #

max :: Dec -> Dec -> Dec #

min :: Dec -> Dec -> Dec #

Ord DecidedStrictness 
Instance details

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 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: DerivClause -> DerivClause -> Ordering #

(<) :: DerivClause -> DerivClause -> Bool #

(<=) :: DerivClause -> DerivClause -> Bool #

(>) :: DerivClause -> DerivClause -> Bool #

(>=) :: DerivClause -> DerivClause -> Bool #

max :: DerivClause -> DerivClause -> DerivClause #

min :: DerivClause -> DerivClause -> DerivClause #

Ord DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: DerivStrategy -> DerivStrategy -> Ordering #

(<) :: DerivStrategy -> DerivStrategy -> Bool #

(<=) :: DerivStrategy -> DerivStrategy -> Bool #

(>) :: DerivStrategy -> DerivStrategy -> Bool #

(>=) :: DerivStrategy -> DerivStrategy -> Bool #

max :: DerivStrategy -> DerivStrategy -> DerivStrategy #

min :: DerivStrategy -> DerivStrategy -> DerivStrategy #

Ord DocLoc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: DocLoc -> DocLoc -> Ordering #

(<) :: DocLoc -> DocLoc -> Bool #

(<=) :: DocLoc -> DocLoc -> Bool #

(>) :: DocLoc -> DocLoc -> Bool #

(>=) :: DocLoc -> DocLoc -> Bool #

max :: DocLoc -> DocLoc -> DocLoc #

min :: DocLoc -> DocLoc -> DocLoc #

Ord Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Exp -> Exp -> Ordering #

(<) :: Exp -> Exp -> Bool #

(<=) :: Exp -> Exp -> Bool #

(>) :: Exp -> Exp -> Bool #

(>=) :: Exp -> Exp -> Bool #

max :: Exp -> Exp -> Exp #

min :: Exp -> Exp -> Exp #

Ord FamilyResultSig 
Instance details

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 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Fixity -> Fixity -> Ordering #

(<) :: Fixity -> Fixity -> Bool #

(<=) :: Fixity -> Fixity -> Bool #

(>) :: Fixity -> Fixity -> Bool #

(>=) :: Fixity -> Fixity -> Bool #

max :: Fixity -> Fixity -> Fixity #

min :: Fixity -> Fixity -> Fixity #

Ord FixityDirection 
Instance details

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 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Foreign -> Foreign -> Ordering #

(<) :: Foreign -> Foreign -> Bool #

(<=) :: Foreign -> Foreign -> Bool #

(>) :: Foreign -> Foreign -> Bool #

(>=) :: Foreign -> Foreign -> Bool #

max :: Foreign -> Foreign -> Foreign #

min :: Foreign -> Foreign -> Foreign #

Ord FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: FunDep -> FunDep -> Ordering #

(<) :: FunDep -> FunDep -> Bool #

(<=) :: FunDep -> FunDep -> Bool #

(>) :: FunDep -> FunDep -> Bool #

(>=) :: FunDep -> FunDep -> Bool #

max :: FunDep -> FunDep -> FunDep #

min :: FunDep -> FunDep -> FunDep #

Ord Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Guard -> Guard -> Ordering #

(<) :: Guard -> Guard -> Bool #

(<=) :: Guard -> Guard -> Bool #

(>) :: Guard -> Guard -> Bool #

(>=) :: Guard -> Guard -> Bool #

max :: Guard -> Guard -> Guard #

min :: Guard -> Guard -> Guard #

Ord Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Info -> Info -> Ordering #

(<) :: Info -> Info -> Bool #

(<=) :: Info -> Info -> Bool #

(>) :: Info -> Info -> Bool #

(>=) :: Info -> Info -> Bool #

max :: Info -> Info -> Info #

min :: Info -> Info -> Info #

Ord InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: InjectivityAnn -> InjectivityAnn -> Ordering #

(<) :: InjectivityAnn -> InjectivityAnn -> Bool #

(<=) :: InjectivityAnn -> InjectivityAnn -> Bool #

(>) :: InjectivityAnn -> InjectivityAnn -> Bool #

(>=) :: InjectivityAnn -> InjectivityAnn -> Bool #

max :: InjectivityAnn -> InjectivityAnn -> InjectivityAnn #

min :: InjectivityAnn -> InjectivityAnn -> InjectivityAnn #

Ord Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Inline -> Inline -> Ordering #

(<) :: Inline -> Inline -> Bool #

(<=) :: Inline -> Inline -> Bool #

(>) :: Inline -> Inline -> Bool #

(>=) :: Inline -> Inline -> Bool #

max :: Inline -> Inline -> Inline #

min :: Inline -> Inline -> Inline #

Ord Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Lit -> Lit -> Ordering #

(<) :: Lit -> Lit -> Bool #

(<=) :: Lit -> Lit -> Bool #

(>) :: Lit -> Lit -> Bool #

(>=) :: Lit -> Lit -> Bool #

max :: Lit -> Lit -> Lit #

min :: Lit -> Lit -> Lit #

Ord Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Loc -> Loc -> Ordering #

(<) :: Loc -> Loc -> Bool #

(<=) :: Loc -> Loc -> Bool #

(>) :: Loc -> Loc -> Bool #

(>=) :: Loc -> Loc -> Bool #

max :: Loc -> Loc -> Loc #

min :: Loc -> Loc -> Loc #

Ord Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Match -> Match -> Ordering #

(<) :: Match -> Match -> Bool #

(<=) :: Match -> Match -> Bool #

(>) :: Match -> Match -> Bool #

(>=) :: Match -> Match -> Bool #

max :: Match -> Match -> Match #

min :: Match -> Match -> Match #

Ord ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: ModName -> ModName -> Ordering #

(<) :: ModName -> ModName -> Bool #

(<=) :: ModName -> ModName -> Bool #

(>) :: ModName -> ModName -> Bool #

(>=) :: ModName -> ModName -> Bool #

max :: ModName -> ModName -> ModName #

min :: ModName -> ModName -> ModName #

Ord Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Module -> Module -> Ordering #

(<) :: Module -> Module -> Bool #

(<=) :: Module -> Module -> Bool #

(>) :: Module -> Module -> Bool #

(>=) :: Module -> Module -> Bool #

max :: Module -> Module -> Module #

min :: Module -> Module -> Module #

Ord ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: ModuleInfo -> ModuleInfo -> Ordering #

(<) :: ModuleInfo -> ModuleInfo -> Bool #

(<=) :: ModuleInfo -> ModuleInfo -> Bool #

(>) :: ModuleInfo -> ModuleInfo -> Bool #

(>=) :: ModuleInfo -> ModuleInfo -> Bool #

max :: ModuleInfo -> ModuleInfo -> ModuleInfo #

min :: ModuleInfo -> ModuleInfo -> ModuleInfo #

Ord Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Name -> Name -> Ordering #

(<) :: Name -> Name -> Bool #

(<=) :: Name -> Name -> Bool #

(>) :: Name -> Name -> Bool #

(>=) :: Name -> Name -> Bool #

max :: Name -> Name -> Name #

min :: Name -> Name -> Name #

Ord NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: NameFlavour -> NameFlavour -> Ordering #

(<) :: NameFlavour -> NameFlavour -> Bool #

(<=) :: NameFlavour -> NameFlavour -> Bool #

(>) :: NameFlavour -> NameFlavour -> Bool #

(>=) :: NameFlavour -> NameFlavour -> Bool #

max :: NameFlavour -> NameFlavour -> NameFlavour #

min :: NameFlavour -> NameFlavour -> NameFlavour #

Ord NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: NameSpace -> NameSpace -> Ordering #

(<) :: NameSpace -> NameSpace -> Bool #

(<=) :: NameSpace -> NameSpace -> Bool #

(>) :: NameSpace -> NameSpace -> Bool #

(>=) :: NameSpace -> NameSpace -> Bool #

max :: NameSpace -> NameSpace -> NameSpace #

min :: NameSpace -> NameSpace -> NameSpace #

Ord OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: OccName -> OccName -> Ordering #

(<) :: OccName -> OccName -> Bool #

(<=) :: OccName -> OccName -> Bool #

(>) :: OccName -> OccName -> Bool #

(>=) :: OccName -> OccName -> Bool #

max :: OccName -> OccName -> OccName #

min :: OccName -> OccName -> OccName #

Ord Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Overlap -> Overlap -> Ordering #

(<) :: Overlap -> Overlap -> Bool #

(<=) :: Overlap -> Overlap -> Bool #

(>) :: Overlap -> Overlap -> Bool #

(>=) :: Overlap -> Overlap -> Bool #

max :: Overlap -> Overlap -> Overlap #

min :: Overlap -> Overlap -> Overlap #

Ord Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Pat -> Pat -> Ordering #

(<) :: Pat -> Pat -> Bool #

(<=) :: Pat -> Pat -> Bool #

(>) :: Pat -> Pat -> Bool #

(>=) :: Pat -> Pat -> Bool #

max :: Pat -> Pat -> Pat #

min :: Pat -> Pat -> Pat #

Ord PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: PatSynArgs -> PatSynArgs -> Ordering #

(<) :: PatSynArgs -> PatSynArgs -> Bool #

(<=) :: PatSynArgs -> PatSynArgs -> Bool #

(>) :: PatSynArgs -> PatSynArgs -> Bool #

(>=) :: PatSynArgs -> PatSynArgs -> Bool #

max :: PatSynArgs -> PatSynArgs -> PatSynArgs #

min :: PatSynArgs -> PatSynArgs -> PatSynArgs #

Ord PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: PatSynDir -> PatSynDir -> Ordering #

(<) :: PatSynDir -> PatSynDir -> Bool #

(<=) :: PatSynDir -> PatSynDir -> Bool #

(>) :: PatSynDir -> PatSynDir -> Bool #

(>=) :: PatSynDir -> PatSynDir -> Bool #

max :: PatSynDir -> PatSynDir -> PatSynDir #

min :: PatSynDir -> PatSynDir -> PatSynDir #

Ord Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Phases -> Phases -> Ordering #

(<) :: Phases -> Phases -> Bool #

(<=) :: Phases -> Phases -> Bool #

(>) :: Phases -> Phases -> Bool #

(>=) :: Phases -> Phases -> Bool #

max :: Phases -> Phases -> Phases #

min :: Phases -> Phases -> Phases #

Ord PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: PkgName -> PkgName -> Ordering #

(<) :: PkgName -> PkgName -> Bool #

(<=) :: PkgName -> PkgName -> Bool #

(>) :: PkgName -> PkgName -> Bool #

(>=) :: PkgName -> PkgName -> Bool #

max :: PkgName -> PkgName -> PkgName #

min :: PkgName -> PkgName -> PkgName #

Ord Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Pragma -> Pragma -> Ordering #

(<) :: Pragma -> Pragma -> Bool #

(<=) :: Pragma -> Pragma -> Bool #

(>) :: Pragma -> Pragma -> Bool #

(>=) :: Pragma -> Pragma -> Bool #

max :: Pragma -> Pragma -> Pragma #

min :: Pragma -> Pragma -> Pragma #

Ord Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Range -> Range -> Ordering #

(<) :: Range -> Range -> Bool #

(<=) :: Range -> Range -> Bool #

(>) :: Range -> Range -> Bool #

(>=) :: Range -> Range -> Bool #

max :: Range -> Range -> Range #

min :: Range -> Range -> Range #

Ord Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Role -> Role -> Ordering #

(<) :: Role -> Role -> Bool #

(<=) :: Role -> Role -> Bool #

(>) :: Role -> Role -> Bool #

(>=) :: Role -> Role -> Bool #

max :: Role -> Role -> Role #

min :: Role -> Role -> Role #

Ord RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: RuleBndr -> RuleBndr -> Ordering #

(<) :: RuleBndr -> RuleBndr -> Bool #

(<=) :: RuleBndr -> RuleBndr -> Bool #

(>) :: RuleBndr -> RuleBndr -> Bool #

(>=) :: RuleBndr -> RuleBndr -> Bool #

max :: RuleBndr -> RuleBndr -> RuleBndr #

min :: RuleBndr -> RuleBndr -> RuleBndr #

Ord RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: RuleMatch -> RuleMatch -> Ordering #

(<) :: RuleMatch -> RuleMatch -> Bool #

(<=) :: RuleMatch -> RuleMatch -> Bool #

(>) :: RuleMatch -> RuleMatch -> Bool #

(>=) :: RuleMatch -> RuleMatch -> Bool #

max :: RuleMatch -> RuleMatch -> RuleMatch #

min :: RuleMatch -> RuleMatch -> RuleMatch #

Ord Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Safety -> Safety -> Ordering #

(<) :: Safety -> Safety -> Bool #

(<=) :: Safety -> Safety -> Bool #

(>) :: Safety -> Safety -> Bool #

(>=) :: Safety -> Safety -> Bool #

max :: Safety -> Safety -> Safety #

min :: Safety -> Safety -> Safety #

Ord SourceStrictness 
Instance details

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 
Instance details

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 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Specificity -> Specificity -> Ordering #

(<) :: Specificity -> Specificity -> Bool #

(<=) :: Specificity -> Specificity -> Bool #

(>) :: Specificity -> Specificity -> Bool #

(>=) :: Specificity -> Specificity -> Bool #

max :: Specificity -> Specificity -> Specificity #

min :: Specificity -> Specificity -> Specificity #

Ord Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Stmt -> Stmt -> Ordering #

(<) :: Stmt -> Stmt -> Bool #

(<=) :: Stmt -> Stmt -> Bool #

(>) :: Stmt -> Stmt -> Bool #

(>=) :: Stmt -> Stmt -> Bool #

max :: Stmt -> Stmt -> Stmt #

min :: Stmt -> Stmt -> Stmt #

Ord TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: TyLit -> TyLit -> Ordering #

(<) :: TyLit -> TyLit -> Bool #

(<=) :: TyLit -> TyLit -> Bool #

(>) :: TyLit -> TyLit -> Bool #

(>=) :: TyLit -> TyLit -> Bool #

max :: TyLit -> TyLit -> TyLit #

min :: TyLit -> TyLit -> TyLit #

Ord TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: TySynEqn -> TySynEqn -> Ordering #

(<) :: TySynEqn -> TySynEqn -> Bool #

(<=) :: TySynEqn -> TySynEqn -> Bool #

(>) :: TySynEqn -> TySynEqn -> Bool #

(>=) :: TySynEqn -> TySynEqn -> Bool #

max :: TySynEqn -> TySynEqn -> TySynEqn #

min :: TySynEqn -> TySynEqn -> TySynEqn #

Ord Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Type -> Type -> Ordering #

(<) :: Type -> Type -> Bool #

(<=) :: Type -> Type -> Bool #

(>) :: Type -> Type -> Bool #

(>=) :: Type -> Type -> Bool #

max :: Type -> Type -> Type #

min :: Type -> Type -> Type #

Ord TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: TypeFamilyHead -> TypeFamilyHead -> Ordering #

(<) :: TypeFamilyHead -> TypeFamilyHead -> Bool #

(<=) :: TypeFamilyHead -> TypeFamilyHead -> Bool #

(>) :: TypeFamilyHead -> TypeFamilyHead -> Bool #

(>=) :: TypeFamilyHead -> TypeFamilyHead -> Bool #

max :: TypeFamilyHead -> TypeFamilyHead -> TypeFamilyHead #

min :: TypeFamilyHead -> TypeFamilyHead -> TypeFamilyHead #

Ord Color 
Instance details

Defined in System.Console.Terminfo.Color

Methods

compare :: Color -> Color -> Ordering #

(<) :: Color -> Color -> Bool #

(<=) :: Color -> Color -> Bool #

(>) :: Color -> Color -> Bool #

(>=) :: Color -> Color -> Bool #

max :: Color -> Color -> Color #

min :: Color -> Color -> Color #

Ord Builder 
Instance details

Defined in Data.Text.Internal.Builder

Methods

compare :: Builder -> Builder -> Ordering #

(<) :: Builder -> Builder -> Bool #

(<=) :: Builder -> Builder -> Bool #

(>) :: Builder -> Builder -> Bool #

(>=) :: Builder -> Builder -> Bool #

max :: Builder -> Builder -> Builder #

min :: Builder -> Builder -> Builder #

Ord B 
Instance details

Defined in Data.Text.Short.Internal

Methods

compare :: B -> B -> Ordering #

(<) :: B -> B -> Bool #

(<=) :: B -> B -> Bool #

(>) :: B -> B -> Bool #

(>=) :: B -> B -> Bool #

max :: B -> B -> B #

min :: B -> B -> B #

Ord ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

compare :: ShortText -> ShortText -> Ordering #

(<) :: ShortText -> ShortText -> Bool #

(<=) :: ShortText -> ShortText -> Bool #

(>) :: ShortText -> ShortText -> Bool #

(>=) :: ShortText -> ShortText -> Bool #

max :: ShortText -> ShortText -> ShortText #

min :: ShortText -> ShortText -> ShortText #

Ord ConstructorVariant 
Instance details

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 
Instance details

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 
Instance details

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 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

compare :: Strictness -> Strictness -> Ordering #

(<) :: Strictness -> Strictness -> Bool #

(<=) :: Strictness -> Strictness -> Bool #

(>) :: Strictness -> Strictness -> Bool #

(>=) :: Strictness -> Strictness -> Bool #

max :: Strictness -> Strictness -> Strictness #

min :: Strictness -> Strictness -> Strictness #

Ord Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

compare :: Unpackedness -> Unpackedness -> Ordering #

(<) :: Unpackedness -> Unpackedness -> Bool #

(<=) :: Unpackedness -> Unpackedness -> Bool #

(>) :: Unpackedness -> Unpackedness -> Bool #

(>=) :: Unpackedness -> Unpackedness -> Bool #

max :: Unpackedness -> Unpackedness -> Unpackedness #

min :: Unpackedness -> Unpackedness -> Unpackedness #

Ord Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

compare :: Day -> Day -> Ordering #

(<) :: Day -> Day -> Bool #

(<=) :: Day -> Day -> Bool #

(>) :: Day -> Day -> Bool #

(>=) :: Day -> Day -> Bool #

max :: Day -> Day -> Day #

min :: Day -> Day -> Day #

Ord DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Ord DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

compare :: DiffTime -> DiffTime -> Ordering #

(<) :: DiffTime -> DiffTime -> Bool #

(<=) :: DiffTime -> DiffTime -> Bool #

(>) :: DiffTime -> DiffTime -> Bool #

(>=) :: DiffTime -> DiffTime -> Bool #

max :: DiffTime -> DiffTime -> DiffTime #

min :: DiffTime -> DiffTime -> DiffTime #

Ord NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Ord SystemTime 
Instance details

Defined in Data.Time.Clock.Internal.SystemTime

Methods

compare :: SystemTime -> SystemTime -> Ordering #

(<) :: SystemTime -> SystemTime -> Bool #

(<=) :: SystemTime -> SystemTime -> Bool #

(>) :: SystemTime -> SystemTime -> Bool #

(>=) :: SystemTime -> SystemTime -> Bool #

max :: SystemTime -> SystemTime -> SystemTime #

min :: SystemTime -> SystemTime -> SystemTime #

Ord UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

compare :: UTCTime -> UTCTime -> Ordering #

(<) :: UTCTime -> UTCTime -> Bool #

(<=) :: UTCTime -> UTCTime -> Bool #

(>) :: UTCTime -> UTCTime -> Bool #

(>=) :: UTCTime -> UTCTime -> Bool #

max :: UTCTime -> UTCTime -> UTCTime #

min :: UTCTime -> UTCTime -> UTCTime #

Ord UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Ord TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Ord LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Ord TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Ord TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Methods

compare :: TimeZone -> TimeZone -> Ordering #

(<) :: TimeZone -> TimeZone -> Bool #

(<=) :: TimeZone -> TimeZone -> Bool #

(>) :: TimeZone -> TimeZone -> Bool #

(>=) :: TimeZone -> TimeZone -> Bool #

max :: TimeZone -> TimeZone -> TimeZone #

min :: TimeZone -> TimeZone -> TimeZone #

Ord UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

compare :: UUID -> UUID -> Ordering #

(<) :: UUID -> UUID -> Bool #

(<=) :: UUID -> UUID -> Bool #

(>) :: UUID -> UUID -> Bool #

(>=) :: UUID -> UUID -> Bool #

max :: UUID -> UUID -> UUID #

min :: UUID -> UUID -> UUID #

Ord UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

compare :: UnpackedUUID -> UnpackedUUID -> Ordering #

(<) :: UnpackedUUID -> UnpackedUUID -> Bool #

(<=) :: UnpackedUUID -> UnpackedUUID -> Bool #

(>) :: UnpackedUUID -> UnpackedUUID -> Bool #

(>=) :: UnpackedUUID -> UnpackedUUID -> Bool #

max :: UnpackedUUID -> UnpackedUUID -> UnpackedUUID #

min :: UnpackedUUID -> UnpackedUUID -> UnpackedUUID #

Ord Integer 
Instance details

Defined in GHC.Num.Integer

Methods

compare :: Integer -> Integer -> Ordering #

(<) :: Integer -> Integer -> Bool #

(<=) :: Integer -> Integer -> Bool #

(>) :: Integer -> Integer -> Bool #

(>=) :: Integer -> Integer -> Bool #

max :: Integer -> Integer -> Integer #

min :: Integer -> Integer -> Integer #

Ord () 
Instance details

Defined in GHC.Classes

Methods

compare :: () -> () -> Ordering #

(<) :: () -> () -> Bool #

(<=) :: () -> () -> Bool #

(>) :: () -> () -> Bool #

(>=) :: () -> () -> Bool #

max :: () -> () -> () #

min :: () -> () -> () #

Ord Bool 
Instance details

Defined in GHC.Classes

Methods

compare :: Bool -> Bool -> Ordering #

(<) :: Bool -> Bool -> Bool #

(<=) :: Bool -> Bool -> Bool #

(>) :: Bool -> Bool -> Bool #

(>=) :: Bool -> Bool -> Bool #

max :: Bool -> Bool -> Bool #

min :: Bool -> Bool -> Bool #

Ord Char 
Instance details

Defined in GHC.Classes

Methods

compare :: Char -> Char -> Ordering #

(<) :: Char -> Char -> Bool #

(<=) :: Char -> Char -> Bool #

(>) :: Char -> Char -> Bool #

(>=) :: Char -> Char -> Bool #

max :: Char -> Char -> Char #

min :: Char -> Char -> Char #

Ord Double 
Instance details

Defined in GHC.Classes

Methods

compare :: Double -> Double -> Ordering #

(<) :: Double -> Double -> Bool #

(<=) :: Double -> Double -> Bool #

(>) :: Double -> Double -> Bool #

(>=) :: Double -> Double -> Bool #

max :: Double -> Double -> Double #

min :: Double -> Double -> Double #

Ord Float 
Instance details

Defined in GHC.Classes

Methods

compare :: Float -> Float -> Ordering #

(<) :: Float -> Float -> Bool #

(<=) :: Float -> Float -> Bool #

(>) :: Float -> Float -> Bool #

(>=) :: Float -> Float -> Bool #

max :: Float -> Float -> Float #

min :: Float -> Float -> Float #

Ord Int 
Instance details

Defined in GHC.Classes

Methods

compare :: Int -> Int -> Ordering #

(<) :: Int -> Int -> Bool #

(<=) :: Int -> Int -> Bool #

(>) :: Int -> Int -> Bool #

(>=) :: Int -> Int -> Bool #

max :: Int -> Int -> Int #

min :: Int -> Int -> Int #

Ord Word 
Instance details

Defined in GHC.Classes

Methods

compare :: Word -> Word -> Ordering #

(<) :: Word -> Word -> Bool #

(<=) :: Word -> Word -> Bool #

(>) :: Word -> Word -> Bool #

(>=) :: Word -> Word -> Bool #

max :: Word -> Word -> Word #

min :: Word -> Word -> Word #

Integral i => Ord (DecimalRaw i) 
Instance details

Defined in Data.Decimal

Methods

compare :: DecimalRaw i -> DecimalRaw i -> Ordering #

(<) :: DecimalRaw i -> DecimalRaw i -> Bool #

(<=) :: DecimalRaw i -> DecimalRaw i -> Bool #

(>) :: DecimalRaw i -> DecimalRaw i -> Bool #

(>=) :: DecimalRaw i -> DecimalRaw i -> Bool #

max :: DecimalRaw i -> DecimalRaw i -> DecimalRaw i #

min :: DecimalRaw i -> DecimalRaw i -> DecimalRaw i #

Ord a => Ord (Only a) 
Instance details

Defined in Data.Tuple.Only

Methods

compare :: Only a -> Only a -> Ordering #

(<) :: Only a -> Only a -> Bool #

(<=) :: Only a -> Only a -> Bool #

(>) :: Only a -> Only a -> Bool #

(>=) :: Only a -> Only a -> Bool #

max :: Only a -> Only a -> Only a #

min :: Only a -> Only a -> Only a #

Ord v => Ord (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

compare :: KeyMap v -> KeyMap v -> Ordering #

(<) :: KeyMap v -> KeyMap v -> Bool #

(<=) :: KeyMap v -> KeyMap v -> Bool #

(>) :: KeyMap v -> KeyMap v -> Bool #

(>=) :: KeyMap v -> KeyMap v -> Bool #

max :: KeyMap v -> KeyMap v -> KeyMap v #

min :: KeyMap v -> KeyMap v -> KeyMap v #

Ord a => Ord (ZipList a) 
Instance details

Defined in Control.Applicative

Methods

compare :: ZipList a -> ZipList a -> Ordering #

(<) :: ZipList a -> ZipList a -> Bool #

(<=) :: ZipList a -> ZipList a -> Bool #

(>) :: ZipList a -> ZipList a -> Bool #

(>=) :: ZipList a -> ZipList a -> Bool #

max :: ZipList a -> ZipList a -> ZipList a #

min :: ZipList a -> ZipList a -> ZipList a #

Ord a => Ord (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

compare :: Identity a -> Identity a -> Ordering #

(<) :: Identity a -> Identity a -> Bool #

(<=) :: Identity a -> Identity a -> Bool #

(>) :: Identity a -> Identity a -> Bool #

(>=) :: Identity a -> Identity a -> Bool #

max :: Identity a -> Identity a -> Identity a #

min :: Identity a -> Identity a -> Identity a #

Ord a => Ord (Down a) 
Instance details

Defined in Data.Ord

Methods

compare :: Down a -> Down a -> Ordering #

(<) :: Down a -> Down a -> Bool #

(<=) :: Down a -> Down a -> Bool #

(>) :: Down a -> Down a -> Bool #

(>=) :: Down a -> Down a -> Bool #

max :: Down a -> Down a -> Down a #

min :: Down a -> Down a -> Down a #

Ord a => Ord (First a) 
Instance details

Defined in Data.Semigroup

Methods

compare :: First a -> First a -> Ordering #

(<) :: First a -> First a -> Bool #

(<=) :: First a -> First a -> Bool #

(>) :: First a -> First a -> Bool #

(>=) :: First a -> First a -> Bool #

max :: First a -> First a -> First a #

min :: First a -> First a -> First a #

Ord a => Ord (Last a) 
Instance details

Defined in Data.Semigroup

Methods

compare :: Last a -> Last a -> Ordering #

(<) :: Last a -> Last a -> Bool #

(<=) :: Last a -> Last a -> Bool #

(>) :: Last a -> Last a -> Bool #

(>=) :: Last a -> Last a -> Bool #

max :: Last a -> Last a -> Last a #

min :: Last a -> Last a -> Last a #

Ord a => Ord (Max a) 
Instance details

Defined in Data.Semigroup

Methods

compare :: Max a -> Max a -> Ordering #

(<) :: Max a -> Max a -> Bool #

(<=) :: Max a -> Max a -> Bool #

(>) :: Max a -> Max a -> Bool #

(>=) :: Max a -> Max a -> Bool #

max :: Max a -> Max a -> Max a #

min :: Max a -> Max a -> Max a #

Ord a => Ord (Min a) 
Instance details

Defined in Data.Semigroup

Methods

compare :: Min a -> Min a -> Ordering #

(<) :: Min a -> Min a -> Bool #

(<=) :: Min a -> Min a -> Bool #

(>) :: Min a -> Min a -> Bool #

(>=) :: Min a -> Min a -> Bool #

max :: Min a -> Min a -> Min a #

min :: Min a -> Min a -> Min a #

Ord m => Ord (WrappedMonoid m) 
Instance details

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 a => Ord (Dual a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Dual a -> Dual a -> Ordering #

(<) :: Dual a -> Dual a -> Bool #

(<=) :: Dual a -> Dual a -> Bool #

(>) :: Dual a -> Dual a -> Bool #

(>=) :: Dual a -> Dual a -> Bool #

max :: Dual a -> Dual a -> Dual a #

min :: Dual a -> Dual a -> Dual a #

Ord a => Ord (Product a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Product a -> Product a -> Ordering #

(<) :: Product a -> Product a -> Bool #

(<=) :: Product a -> Product a -> Bool #

(>) :: Product a -> Product a -> Bool #

(>=) :: Product a -> Product a -> Bool #

max :: Product a -> Product a -> Product a #

min :: Product a -> Product a -> Product a #

Ord a => Ord (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Sum a -> Sum a -> Ordering #

(<) :: Sum a -> Sum a -> Bool #

(<=) :: Sum a -> Sum a -> Bool #

(>) :: Sum a -> Sum a -> Bool #

(>=) :: Sum a -> Sum a -> Bool #

max :: Sum a -> Sum a -> Sum a #

min :: Sum a -> Sum a -> Sum a #

Ord (ForeignPtr a) 
Instance details

Defined in GHC.ForeignPtr

Methods

compare :: ForeignPtr a -> ForeignPtr a -> Ordering #

(<) :: ForeignPtr a -> ForeignPtr a -> Bool #

(<=) :: ForeignPtr a -> ForeignPtr a -> Bool #

(>) :: ForeignPtr a -> ForeignPtr a -> Bool #

(>=) :: ForeignPtr a -> ForeignPtr a -> Bool #

max :: ForeignPtr a -> ForeignPtr a -> ForeignPtr a #

min :: ForeignPtr a -> ForeignPtr a -> ForeignPtr a #

Ord p => Ord (Par1 p) 
Instance details

Defined in GHC.Generics

Methods

compare :: Par1 p -> Par1 p -> Ordering #

(<) :: Par1 p -> Par1 p -> Bool #

(<=) :: Par1 p -> Par1 p -> Bool #

(>) :: Par1 p -> Par1 p -> Bool #

(>=) :: Par1 p -> Par1 p -> Bool #

max :: Par1 p -> Par1 p -> Par1 p #

min :: Par1 p -> Par1 p -> Par1 p #

Ord (FunPtr a) 
Instance details

Defined in GHC.Ptr

Methods

compare :: FunPtr a -> FunPtr a -> Ordering #

(<) :: FunPtr a -> FunPtr a -> Bool #

(<=) :: FunPtr a -> FunPtr a -> Bool #

(>) :: FunPtr a -> FunPtr a -> Bool #

(>=) :: FunPtr a -> FunPtr a -> Bool #

max :: FunPtr a -> FunPtr a -> FunPtr a #

min :: FunPtr a -> FunPtr a -> FunPtr a #

Ord (Ptr a) 
Instance details

Defined in GHC.Ptr

Methods

compare :: Ptr a -> Ptr a -> Ordering #

(<) :: Ptr a -> Ptr a -> Bool #

(<=) :: Ptr a -> Ptr a -> Bool #

(>) :: Ptr a -> Ptr a -> Bool #

(>=) :: Ptr a -> Ptr a -> Bool #

max :: Ptr a -> Ptr a -> Ptr a #

min :: Ptr a -> Ptr a -> Ptr a #

Integral a => Ord (Ratio a) 
Instance details

Defined in GHC.Real

Methods

compare :: Ratio a -> Ratio a -> Ordering #

(<) :: Ratio a -> Ratio a -> Bool #

(<=) :: Ratio a -> Ratio a -> Bool #

(>) :: Ratio a -> Ratio a -> Bool #

(>=) :: Ratio a -> Ratio a -> Bool #

max :: Ratio a -> Ratio a -> Ratio a #

min :: Ratio a -> Ratio a -> Ratio a #

Ord a => Ord (CmdArgs a) 
Instance details

Defined in System.Console.CmdArgs.Implicit.Type

Methods

compare :: CmdArgs a -> CmdArgs a -> Ordering #

(<) :: CmdArgs a -> CmdArgs a -> Bool #

(<=) :: CmdArgs a -> CmdArgs a -> Bool #

(>) :: CmdArgs a -> CmdArgs a -> Bool #

(>=) :: CmdArgs a -> CmdArgs a -> Bool #

max :: CmdArgs a -> CmdArgs a -> CmdArgs a #

min :: CmdArgs a -> CmdArgs a -> CmdArgs a #

Ord a => Ord (Flush a) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

compare :: Flush a -> Flush a -> Ordering #

(<) :: Flush a -> Flush a -> Bool #

(<=) :: Flush a -> Flush a -> Bool #

(>) :: Flush a -> Flush a -> Bool #

(>=) :: Flush a -> Flush a -> Bool #

max :: Flush a -> Flush a -> Flush a #

min :: Flush a -> Flush a -> Flush a #

Ord a => Ord (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

compare :: IntMap a -> IntMap a -> Ordering #

(<) :: IntMap a -> IntMap a -> Bool #

(<=) :: IntMap a -> IntMap a -> Bool #

(>) :: IntMap a -> IntMap a -> Bool #

(>=) :: IntMap a -> IntMap a -> Bool #

max :: IntMap a -> IntMap a -> IntMap a #

min :: IntMap a -> IntMap a -> IntMap a #

Ord a => Ord (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: Seq a -> Seq a -> Ordering #

(<) :: Seq a -> Seq a -> Bool #

(<=) :: Seq a -> Seq a -> Bool #

(>) :: Seq a -> Seq a -> Bool #

(>=) :: Seq a -> Seq a -> Bool #

max :: Seq a -> Seq a -> Seq a #

min :: Seq a -> Seq a -> Seq a #

Ord a => Ord (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: ViewL a -> ViewL a -> Ordering #

(<) :: ViewL a -> ViewL a -> Bool #

(<=) :: ViewL a -> ViewL a -> Bool #

(>) :: ViewL a -> ViewL a -> Bool #

(>=) :: ViewL a -> ViewL a -> Bool #

max :: ViewL a -> ViewL a -> ViewL a #

min :: ViewL a -> ViewL a -> ViewL a #

Ord a => Ord (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: ViewR a -> ViewR a -> Ordering #

(<) :: ViewR a -> ViewR a -> Bool #

(<=) :: ViewR a -> ViewR a -> Bool #

(>) :: ViewR a -> ViewR a -> Bool #

(>=) :: ViewR a -> ViewR a -> Bool #

max :: ViewR a -> ViewR a -> ViewR a #

min :: ViewR a -> ViewR a -> ViewR a #

Ord a => Ord (Intersection a) 
Instance details

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 #

max :: Intersection a -> Intersection a -> Intersection a #

min :: Intersection a -> Intersection a -> Intersection a #

Ord a => Ord (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

compare :: Set a -> Set a -> Ordering #

(<) :: Set a -> Set a -> Bool #

(<=) :: Set a -> Set a -> Bool #

(>) :: Set a -> Set a -> Bool #

(>=) :: Set a -> Set a -> Bool #

max :: Set a -> Set a -> Set a #

min :: Set a -> Set a -> Set a #

Ord a => Ord (Tree a) 
Instance details

Defined in Data.Tree

Methods

compare :: Tree a -> Tree a -> Ordering #

(<) :: Tree a -> Tree a -> Bool #

(<=) :: Tree a -> Tree a -> Bool #

(>) :: Tree a -> Tree a -> Bool #

(>=) :: Tree a -> Tree a -> Bool #

max :: Tree a -> Tree a -> Tree a #

min :: Tree a -> Tree a -> Tree a #

Ord1 f => Ord (Fix f) 
Instance details

Defined in Data.Fix

Methods

compare :: Fix f -> Fix f -> Ordering #

(<) :: Fix f -> Fix f -> Bool #

(<=) :: Fix f -> Fix f -> Bool #

(>) :: Fix f -> Fix f -> Bool #

(>=) :: Fix f -> Fix f -> Bool #

max :: Fix f -> Fix f -> Fix f #

min :: Fix f -> Fix f -> Fix f #

(Functor f, Ord1 f) => Ord (Mu f) 
Instance details

Defined in Data.Fix

Methods

compare :: Mu f -> Mu f -> Ordering #

(<) :: Mu f -> Mu f -> Bool #

(<=) :: Mu f -> Mu f -> Bool #

(>) :: Mu f -> Mu f -> Bool #

(>=) :: Mu f -> Mu f -> Bool #

max :: Mu f -> Mu f -> Mu f #

min :: Mu f -> Mu f -> Mu f #

(Functor f, Ord1 f) => Ord (Nu f) 
Instance details

Defined in Data.Fix

Methods

compare :: Nu f -> Nu f -> Ordering #

(<) :: Nu f -> Nu f -> Bool #

(<=) :: Nu f -> Nu f -> Bool #

(>) :: Nu f -> Nu f -> Bool #

(>=) :: Nu f -> Nu f -> Bool #

max :: Nu f -> Nu f -> Nu f #

min :: Nu f -> Nu f -> Nu f #

Ord a => Ord (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

compare :: DNonEmpty a -> DNonEmpty a -> Ordering #

(<) :: DNonEmpty a -> DNonEmpty a -> Bool #

(<=) :: DNonEmpty a -> DNonEmpty a -> Bool #

(>) :: DNonEmpty a -> DNonEmpty a -> Bool #

(>=) :: DNonEmpty a -> DNonEmpty a -> Bool #

max :: DNonEmpty a -> DNonEmpty a -> DNonEmpty a #

min :: DNonEmpty a -> DNonEmpty a -> DNonEmpty a #

Ord a => Ord (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

compare :: DList a -> DList a -> Ordering #

(<) :: DList a -> DList a -> Bool #

(<=) :: DList a -> DList a -> Bool #

(>) :: DList a -> DList a -> Bool #

(>=) :: DList a -> DList a -> Bool #

max :: DList a -> DList a -> DList a #

min :: DList a -> DList a -> DList a #

Ord a => Ord (Doc a) 
Instance details

Defined in Text.DocLayout

Methods

compare :: Doc a -> Doc a -> Ordering #

(<) :: Doc a -> Doc a -> Bool #

(<=) :: Doc a -> Doc a -> Bool #

(>) :: Doc a -> Doc a -> Bool #

(>=) :: Doc a -> Doc a -> Bool #

max :: Doc a -> Doc a -> Doc a #

min :: Doc a -> Doc a -> Doc a #

Ord a => Ord (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

compare :: Hashed a -> Hashed a -> Ordering #

(<) :: Hashed a -> Hashed a -> Bool #

(<=) :: Hashed a -> Hashed a -> Bool #

(>) :: Hashed a -> Hashed a -> Bool #

(>=) :: Hashed a -> Hashed a -> Bool #

max :: Hashed a -> Hashed a -> Hashed a #

min :: Hashed a -> Hashed a -> Hashed a #

Ord a => Ord (FastTree a) 
Instance details

Defined in Hledger.Data.Account

Methods

compare :: FastTree a -> FastTree a -> Ordering #

(<) :: FastTree a -> FastTree a -> Bool #

(<=) :: FastTree a -> FastTree a -> Bool #

(>) :: FastTree a -> FastTree a -> Bool #

(>=) :: FastTree a -> FastTree a -> Bool #

max :: FastTree a -> FastTree a -> FastTree a #

min :: FastTree a -> FastTree a -> FastTree a #

Ord e => Ord (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

compare :: ErrorFancy e -> ErrorFancy e -> Ordering #

(<) :: ErrorFancy e -> ErrorFancy e -> Bool #

(<=) :: ErrorFancy e -> ErrorFancy e -> Bool #

(>) :: ErrorFancy e -> ErrorFancy e -> Bool #

(>=) :: ErrorFancy e -> ErrorFancy e -> Bool #

max :: ErrorFancy e -> ErrorFancy e -> ErrorFancy e #

min :: ErrorFancy e -> ErrorFancy e -> ErrorFancy e #

Ord t => Ord (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Methods

compare :: ErrorItem t -> ErrorItem t -> Ordering #

(<) :: ErrorItem t -> ErrorItem t -> Bool #

(<=) :: ErrorItem t -> ErrorItem t -> Bool #

(>) :: ErrorItem t -> ErrorItem t -> Bool #

(>=) :: ErrorItem t -> ErrorItem t -> Bool #

max :: ErrorItem t -> ErrorItem t -> ErrorItem t #

min :: ErrorItem t -> ErrorItem t -> ErrorItem t #

Ord mono => Ord (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

compare :: NonNull mono -> NonNull mono -> Ordering #

(<) :: NonNull mono -> NonNull mono -> Bool #

(<=) :: NonNull mono -> NonNull mono -> Bool #

(>) :: NonNull mono -> NonNull mono -> Bool #

(>=) :: NonNull mono -> NonNull mono -> Bool #

max :: NonNull mono -> NonNull mono -> NonNull mono #

min :: NonNull mono -> NonNull mono -> NonNull mono #

Ord ann => Ord (SimpleDocStream ann) 
Instance details

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) 
Instance details

Defined in Data.Primitive.Array

Methods

compare :: Array a -> Array a -> Ordering #

(<) :: Array a -> Array a -> Bool #

(<=) :: Array a -> Array a -> Bool #

(>) :: Array a -> Array a -> Bool #

(>=) :: Array a -> Array a -> Bool #

max :: Array a -> Array a -> Array a #

min :: Array a -> Array a -> Array a #

(Ord a, Prim a) => Ord (PrimArray a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

compare :: PrimArray a -> PrimArray a -> Ordering #

(<) :: PrimArray a -> PrimArray a -> Bool #

(<=) :: PrimArray a -> PrimArray a -> Bool #

(>) :: PrimArray a -> PrimArray a -> Bool #

(>=) :: PrimArray a -> PrimArray a -> Bool #

max :: PrimArray a -> PrimArray a -> PrimArray a #

min :: PrimArray a -> PrimArray a -> PrimArray a #

Ord a => Ord (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

compare :: SmallArray a -> SmallArray a -> Ordering #

(<) :: SmallArray a -> SmallArray a -> Bool #

(<=) :: SmallArray a -> SmallArray a -> Bool #

(>) :: SmallArray a -> SmallArray a -> Bool #

(>=) :: SmallArray a -> SmallArray a -> Bool #

max :: SmallArray a -> SmallArray a -> SmallArray a #

min :: SmallArray a -> SmallArray a -> SmallArray a #

Ord g => Ord (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

compare :: StateGen g -> StateGen g -> Ordering #

(<) :: StateGen g -> StateGen g -> Bool #

(<=) :: StateGen g -> StateGen g -> Bool #

(>) :: StateGen g -> StateGen g -> Bool #

(>=) :: StateGen g -> StateGen g -> Bool #

max :: StateGen g -> StateGen g -> StateGen g #

min :: StateGen g -> StateGen g -> StateGen g #

Ord g => Ord (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: AtomicGen g -> AtomicGen g -> Ordering #

(<) :: AtomicGen g -> AtomicGen g -> Bool #

(<=) :: AtomicGen g -> AtomicGen g -> Bool #

(>) :: AtomicGen g -> AtomicGen g -> Bool #

(>=) :: AtomicGen g -> AtomicGen g -> Bool #

max :: AtomicGen g -> AtomicGen g -> AtomicGen g #

min :: AtomicGen g -> AtomicGen g -> AtomicGen g #

Ord g => Ord (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: IOGen g -> IOGen g -> Ordering #

(<) :: IOGen g -> IOGen g -> Bool #

(<=) :: IOGen g -> IOGen g -> Bool #

(>) :: IOGen g -> IOGen g -> Bool #

(>=) :: IOGen g -> IOGen g -> Bool #

max :: IOGen g -> IOGen g -> IOGen g #

min :: IOGen g -> IOGen g -> IOGen g #

Ord g => Ord (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: STGen g -> STGen g -> Ordering #

(<) :: STGen g -> STGen g -> Bool #

(<=) :: STGen g -> STGen g -> Bool #

(>) :: STGen g -> STGen g -> Bool #

(>=) :: STGen g -> STGen g -> Bool #

max :: STGen g -> STGen g -> STGen g #

min :: STGen g -> STGen g -> STGen g #

Ord g => Ord (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: TGen g -> TGen g -> Ordering #

(<) :: TGen g -> TGen g -> Bool #

(<=) :: TGen g -> TGen g -> Bool #

(>) :: TGen g -> TGen g -> Bool #

(>=) :: TGen g -> TGen g -> Bool #

max :: TGen g -> TGen g -> TGen g #

min :: TGen g -> TGen g -> TGen g #

Ord a => Ord (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

compare :: Maybe a -> Maybe a -> Ordering #

(<) :: Maybe a -> Maybe a -> Bool #

(<=) :: Maybe a -> Maybe a -> Bool #

(>) :: Maybe a -> Maybe a -> Bool #

(>=) :: Maybe a -> Maybe a -> Bool #

max :: Maybe a -> Maybe a -> Maybe a #

min :: Maybe a -> Maybe a -> Maybe a #

Ord flag => Ord (TyVarBndr flag) 
Instance details

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 #

max :: TyVarBndr flag -> TyVarBndr flag -> TyVarBndr flag #

min :: TyVarBndr flag -> TyVarBndr flag -> TyVarBndr flag #

Ord a => Ord (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

compare :: HashSet a -> HashSet a -> Ordering #

(<) :: HashSet a -> HashSet a -> Bool #

(<=) :: HashSet a -> HashSet a -> Bool #

(>) :: HashSet a -> HashSet a -> Bool #

(>=) :: HashSet a -> HashSet a -> Bool #

max :: HashSet a -> HashSet a -> HashSet a #

min :: HashSet a -> HashSet a -> HashSet a #

Ord a => Ord (Vector a) 
Instance details

Defined in Data.Vector

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

(Prim a, Ord a) => Ord (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

(Storable a, Ord a) => Ord (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

Ord a => Ord (NonEmpty a) 
Instance details

Defined in GHC.Base

Methods

compare :: NonEmpty a -> NonEmpty a -> Ordering #

(<) :: NonEmpty a -> NonEmpty a -> Bool #

(<=) :: NonEmpty a -> NonEmpty a -> Bool #

(>) :: NonEmpty a -> NonEmpty a -> Bool #

(>=) :: NonEmpty a -> NonEmpty a -> Bool #

max :: NonEmpty a -> NonEmpty a -> NonEmpty a #

min :: NonEmpty a -> NonEmpty a -> NonEmpty a #

Ord a => Ord (Maybe a) 
Instance details

Defined in GHC.Maybe

Methods

compare :: Maybe a -> Maybe a -> Ordering #

(<) :: Maybe a -> Maybe a -> Bool #

(<=) :: Maybe a -> Maybe a -> Bool #

(>) :: Maybe a -> Maybe a -> Bool #

(>=) :: Maybe a -> Maybe a -> Bool #

max :: Maybe a -> Maybe a -> Maybe a #

min :: Maybe a -> Maybe a -> Maybe a #

Ord a => Ord (a) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a) -> (a) -> Ordering #

(<) :: (a) -> (a) -> Bool #

(<=) :: (a) -> (a) -> Bool #

(>) :: (a) -> (a) -> Bool #

(>=) :: (a) -> (a) -> Bool #

max :: (a) -> (a) -> (a) #

min :: (a) -> (a) -> (a) #

Ord a => Ord [a] 
Instance details

Defined in GHC.Classes

Methods

compare :: [a] -> [a] -> Ordering #

(<) :: [a] -> [a] -> Bool #

(<=) :: [a] -> [a] -> Bool #

(>) :: [a] -> [a] -> Bool #

(>=) :: [a] -> [a] -> Bool #

max :: [a] -> [a] -> [a] #

min :: [a] -> [a] -> [a] #

(Ord a, Ord b) => Ord (Either a b) 
Instance details

Defined in Data.Either

Methods

compare :: Either a b -> Either a b -> Ordering #

(<) :: Either a b -> Either a b -> Bool #

(<=) :: Either a b -> Either a b -> Bool #

(>) :: Either a b -> Either a b -> Bool #

(>=) :: Either a b -> Either a b -> Bool #

max :: Either a b -> Either a b -> Either a b #

min :: Either a b -> Either a b -> Either a b #

Ord (Fixed a) 
Instance details

Defined in Data.Fixed

Methods

compare :: Fixed a -> Fixed a -> Ordering #

(<) :: Fixed a -> Fixed a -> Bool #

(<=) :: Fixed a -> Fixed a -> Bool #

(>) :: Fixed a -> Fixed a -> Bool #

(>=) :: Fixed a -> Fixed a -> Bool #

max :: Fixed a -> Fixed a -> Fixed a #

min :: Fixed a -> Fixed a -> Fixed a #

Ord a => Ord (Arg a b) 
Instance details

Defined in Data.Semigroup

Methods

compare :: Arg a b -> Arg a b -> Ordering #

(<) :: Arg a b -> Arg a b -> Bool #

(<=) :: Arg a b -> Arg a b -> Bool #

(>) :: Arg a b -> Arg a b -> Bool #

(>=) :: Arg a b -> Arg a b -> Bool #

max :: Arg a b -> Arg a b -> Arg a b #

min :: Arg a b -> Arg a b -> Arg a b #

Ord (TypeRep a) 
Instance details

Defined in Data.Typeable.Internal

Methods

compare :: TypeRep a -> TypeRep a -> Ordering #

(<) :: TypeRep a -> TypeRep a -> Bool #

(<=) :: TypeRep a -> TypeRep a -> Bool #

(>) :: TypeRep a -> TypeRep a -> Bool #

(>=) :: TypeRep a -> TypeRep a -> Bool #

max :: TypeRep a -> TypeRep a -> TypeRep a #

min :: TypeRep a -> TypeRep a -> TypeRep a #

Ord (U1 p) 
Instance details

Defined in GHC.Generics

Methods

compare :: U1 p -> U1 p -> Ordering #

(<) :: U1 p -> U1 p -> Bool #

(<=) :: U1 p -> U1 p -> Bool #

(>) :: U1 p -> U1 p -> Bool #

(>=) :: U1 p -> U1 p -> Bool #

max :: U1 p -> U1 p -> U1 p #

min :: U1 p -> U1 p -> U1 p #

Ord (V1 p) 
Instance details

Defined in GHC.Generics

Methods

compare :: V1 p -> V1 p -> Ordering #

(<) :: V1 p -> V1 p -> Bool #

(<=) :: V1 p -> V1 p -> Bool #

(>) :: V1 p -> V1 p -> Bool #

(>=) :: V1 p -> V1 p -> Bool #

max :: V1 p -> V1 p -> V1 p #

min :: V1 p -> V1 p -> V1 p #

(Ord k, Ord v) => Ord (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

compare :: Map k v -> Map k v -> Ordering #

(<) :: Map k v -> Map k v -> Bool #

(<=) :: Map k v -> Map k v -> Bool #

(>) :: Map k v -> Map k v -> Bool #

(>=) :: Map k v -> Map k v -> Bool #

max :: Map k v -> Map k v -> Map k v #

min :: Map k v -> Map k v -> Map k v #

(Ord a, Ord1 f) => Ord (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

compare :: Free f a -> Free f a -> Ordering #

(<) :: Free f a -> Free f a -> Bool #

(<=) :: Free f a -> Free f a -> Bool #

(>) :: Free f a -> Free f a -> Bool #

(>=) :: Free f a -> Free f a -> Bool #

max :: Free f a -> Free f a -> Free f a #

min :: Free f a -> Free f a -> Free f a #

Ord (ParseError Text HledgerParseErrorData) 
Instance details

Defined in Text.Megaparsec.Custom

Methods

compare :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Ordering #

(<) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool #

(<=) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool #

(>) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool #

(>=) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool #

max :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData #

min :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData #

(Ord a, Ord b) => Ord (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

compare :: Either a b -> Either a b -> Ordering #

(<) :: Either a b -> Either a b -> Bool #

(<=) :: Either a b -> Either a b -> Bool #

(>) :: Either a b -> Either a b -> Bool #

(>=) :: Either a b -> Either a b -> Bool #

max :: Either a b -> Either a b -> Either a b #

min :: Either a b -> Either a b -> Either a b #

(Ord a, Ord b) => Ord (These a b) 
Instance details

Defined in Data.Strict.These

Methods

compare :: These a b -> These a b -> Ordering #

(<) :: These a b -> These a b -> Bool #

(<=) :: These a b -> These a b -> Bool #

(>) :: These a b -> These a b -> Bool #

(>=) :: These a b -> These a b -> Bool #

max :: These a b -> These a b -> These a b #

min :: These a b -> These a b -> These a b #

(Ord a, Ord b) => Ord (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

compare :: Pair a b -> Pair a b -> Ordering #

(<) :: Pair a b -> Pair a b -> Bool #

(<=) :: Pair a b -> Pair a b -> Bool #

(>) :: Pair a b -> Pair a b -> Bool #

(>=) :: Pair a b -> Pair a b -> Bool #

max :: Pair a b -> Pair a b -> Pair a b #

min :: Pair a b -> Pair a b -> Pair a b #

(Ord a, Ord b) => Ord (These a b) 
Instance details

Defined in Data.These

Methods

compare :: These a b -> These a b -> Ordering #

(<) :: These a b -> These a b -> Bool #

(<=) :: These a b -> These a b -> Bool #

(>) :: These a b -> These a b -> Bool #

(>=) :: These a b -> These a b -> Bool #

max :: These a b -> These a b -> These a b #

min :: These a b -> These a b -> These a b #

(Ord1 m, Ord a) => Ord (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

compare :: MaybeT m a -> MaybeT m a -> Ordering #

(<) :: MaybeT m a -> MaybeT m a -> Bool #

(<=) :: MaybeT m a -> MaybeT m a -> Bool #

(>) :: MaybeT m a -> MaybeT m a -> Bool #

(>=) :: MaybeT m a -> MaybeT m a -> Bool #

max :: MaybeT m a -> MaybeT m a -> MaybeT m a #

min :: MaybeT m a -> MaybeT m a -> MaybeT m a #

(Ord k, Ord v) => Ord (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

compare :: HashMap k v -> HashMap k v -> Ordering #

(<) :: HashMap k v -> HashMap k v -> Bool #

(<=) :: HashMap k v -> HashMap k v -> Bool #

(>) :: HashMap k v -> HashMap k v -> Bool #

(>=) :: HashMap k v -> HashMap k v -> Bool #

max :: HashMap k v -> HashMap k v -> HashMap k v #

min :: HashMap k v -> HashMap k v -> HashMap k v #

(Ord a, Ord b) => Ord (a, b) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b) -> (a, b) -> Ordering #

(<) :: (a, b) -> (a, b) -> Bool #

(<=) :: (a, b) -> (a, b) -> Bool #

(>) :: (a, b) -> (a, b) -> Bool #

(>=) :: (a, b) -> (a, b) -> Bool #

max :: (a, b) -> (a, b) -> (a, b) #

min :: (a, b) -> (a, b) -> (a, b) #

Ord a => Ord (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

compare :: Const a b -> Const a b -> Ordering #

(<) :: Const a b -> Const a b -> Bool #

(<=) :: Const a b -> Const a b -> Bool #

(>) :: Const a b -> Const a b -> Bool #

(>=) :: Const a b -> Const a b -> Bool #

max :: Const a b -> Const a b -> Const a b #

min :: Const a b -> Const a b -> Const a b #

Ord (f a) => Ord (Alt f a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Alt f a -> Alt f a -> Ordering #

(<) :: Alt f a -> Alt f a -> Bool #

(<=) :: Alt f a -> Alt f a -> Bool #

(>) :: Alt f a -> Alt f a -> Bool #

(>=) :: Alt f a -> Alt f a -> Bool #

max :: Alt f a -> Alt f a -> Alt f a #

min :: Alt f a -> Alt f a -> Alt f a #

Ord (a :~: b) 
Instance details

Defined in Data.Type.Equality

Methods

compare :: (a :~: b) -> (a :~: b) -> Ordering #

(<) :: (a :~: b) -> (a :~: b) -> Bool #

(<=) :: (a :~: b) -> (a :~: b) -> Bool #

(>) :: (a :~: b) -> (a :~: b) -> Bool #

(>=) :: (a :~: b) -> (a :~: b) -> Bool #

max :: (a :~: b) -> (a :~: b) -> a :~: b #

min :: (a :~: b) -> (a :~: b) -> a :~: b #

Ord (f p) => Ord (Rec1 f p) 
Instance details

Defined in GHC.Generics

Methods

compare :: Rec1 f p -> Rec1 f p -> Ordering #

(<) :: Rec1 f p -> Rec1 f p -> Bool #

(<=) :: Rec1 f p -> Rec1 f p -> Bool #

(>) :: Rec1 f p -> Rec1 f p -> Bool #

(>=) :: Rec1 f p -> Rec1 f p -> Bool #

max :: Rec1 f p -> Rec1 f p -> Rec1 f p #

min :: Rec1 f p -> Rec1 f p -> Rec1 f p #

Ord (URec (Ptr ()) p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec (Ptr ()) p -> URec (Ptr ()) p -> Ordering #

(<) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(<=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(>) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(>=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

max :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p #

min :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p #

Ord (URec Char p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Char p -> URec Char p -> Ordering #

(<) :: URec Char p -> URec Char p -> Bool #

(<=) :: URec Char p -> URec Char p -> Bool #

(>) :: URec Char p -> URec Char p -> Bool #

(>=) :: URec Char p -> URec Char p -> Bool #

max :: URec Char p -> URec Char p -> URec Char p #

min :: URec Char p -> URec Char p -> URec Char p #

Ord (URec Double p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Double p -> URec Double p -> Ordering #

(<) :: URec Double p -> URec Double p -> Bool #

(<=) :: URec Double p -> URec Double p -> Bool #

(>) :: URec Double p -> URec Double p -> Bool #

(>=) :: URec Double p -> URec Double p -> Bool #

max :: URec Double p -> URec Double p -> URec Double p #

min :: URec Double p -> URec Double p -> URec Double p #

Ord (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Float p -> URec Float p -> Ordering #

(<) :: URec Float p -> URec Float p -> Bool #

(<=) :: URec Float p -> URec Float p -> Bool #

(>) :: URec Float p -> URec Float p -> Bool #

(>=) :: URec Float p -> URec Float p -> Bool #

max :: URec Float p -> URec Float p -> URec Float p #

min :: URec Float p -> URec Float p -> URec Float p #

Ord (URec Int p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Int p -> URec Int p -> Ordering #

(<) :: URec Int p -> URec Int p -> Bool #

(<=) :: URec Int p -> URec Int p -> Bool #

(>) :: URec Int p -> URec Int p -> Bool #

(>=) :: URec Int p -> URec Int p -> Bool #

max :: URec Int p -> URec Int p -> URec Int p #

min :: URec Int p -> URec Int p -> URec Int p #

Ord (URec Word p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Word p -> URec Word p -> Ordering #

(<) :: URec Word p -> URec Word p -> Bool #

(<=) :: URec Word p -> URec Word p -> Bool #

(>) :: URec Word p -> URec Word p -> Bool #

(>=) :: URec Word p -> URec Word p -> Bool #

max :: URec Word p -> URec Word p -> URec Word p #

min :: URec Word p -> URec Word p -> URec Word p #

Ord (p a a) => Ord (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

compare :: Join p a -> Join p a -> Ordering #

(<) :: Join p a -> Join p a -> Bool #

(<=) :: Join p a -> Join p a -> Bool #

(>) :: Join p a -> Join p a -> Bool #

(>=) :: Join p a -> Join p a -> Bool #

max :: Join p a -> Join p a -> Join p a #

min :: Join p a -> Join p a -> Join p a #

Ord b => Ord (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

compare :: Tagged s b -> Tagged s b -> Ordering #

(<) :: Tagged s b -> Tagged s b -> Bool #

(<=) :: Tagged s b -> Tagged s b -> Bool #

(>) :: Tagged s b -> Tagged s b -> Bool #

(>=) :: Tagged s b -> Tagged s b -> Bool #

max :: Tagged s b -> Tagged s b -> Tagged s b #

min :: Tagged s b -> Tagged s b -> Tagged s b #

(Ord (f a), Ord (g a), Ord a) => Ord (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

compare :: These1 f g a -> These1 f g a -> Ordering #

(<) :: These1 f g a -> These1 f g a -> Bool #

(<=) :: These1 f g a -> These1 f g a -> Bool #

(>) :: These1 f g a -> These1 f g a -> Bool #

(>=) :: These1 f g a -> These1 f g a -> Bool #

max :: These1 f g a -> These1 f g a -> These1 f g a #

min :: These1 f g a -> These1 f g a -> These1 f g a #

(Ord e, Ord1 m, Ord a) => Ord (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

compare :: ErrorT e m a -> ErrorT e m a -> Ordering #

(<) :: ErrorT e m a -> ErrorT e m a -> Bool #

(<=) :: ErrorT e m a -> ErrorT e m a -> Bool #

(>) :: ErrorT e m a -> ErrorT e m a -> Bool #

(>=) :: ErrorT e m a -> ErrorT e m a -> Bool #

max :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

min :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

(Ord e, Ord1 m, Ord a) => Ord (ExceptT e m a) 
Instance details

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 #

max :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

min :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

(Ord a, Ord b, Ord c) => Ord (a, b, c) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c) -> (a, b, c) -> Ordering #

(<) :: (a, b, c) -> (a, b, c) -> Bool #

(<=) :: (a, b, c) -> (a, b, c) -> Bool #

(>) :: (a, b, c) -> (a, b, c) -> Bool #

(>=) :: (a, b, c) -> (a, b, c) -> Bool #

max :: (a, b, c) -> (a, b, c) -> (a, b, c) #

min :: (a, b, c) -> (a, b, c) -> (a, b, c) #

Ord (a :~~: b) 
Instance details

Defined in Data.Type.Equality

Methods

compare :: (a :~~: b) -> (a :~~: b) -> Ordering #

(<) :: (a :~~: b) -> (a :~~: b) -> Bool #

(<=) :: (a :~~: b) -> (a :~~: b) -> Bool #

(>) :: (a :~~: b) -> (a :~~: b) -> Bool #

(>=) :: (a :~~: b) -> (a :~~: b) -> Bool #

max :: (a :~~: b) -> (a :~~: b) -> a :~~: b #

min :: (a :~~: b) -> (a :~~: b) -> a :~~: b #

(Ord (f p), Ord (g p)) => Ord ((f :*: g) p) 
Instance details

Defined in GHC.Generics

Methods

compare :: (f :*: g) p -> (f :*: g) p -> Ordering #

(<) :: (f :*: g) p -> (f :*: g) p -> Bool #

(<=) :: (f :*: g) p -> (f :*: g) p -> Bool #

(>) :: (f :*: g) p -> (f :*: g) p -> Bool #

(>=) :: (f :*: g) p -> (f :*: g) p -> Bool #

max :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

min :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

(Ord (f p), Ord (g p)) => Ord ((f :+: g) p) 
Instance details

Defined in GHC.Generics

Methods

compare :: (f :+: g) p -> (f :+: g) p -> Ordering #

(<) :: (f :+: g) p -> (f :+: g) p -> Bool #

(<=) :: (f :+: g) p -> (f :+: g) p -> Bool #

(>) :: (f :+: g) p -> (f :+: g) p -> Bool #

(>=) :: (f :+: g) p -> (f :+: g) p -> Bool #

max :: (f :+: g) p -> (f :+: g) p -> (f :+: g) p #

min :: (f :+: g) p -> (f :+: g) p -> (f :+: g) p #

Ord c => Ord (K1 i c p) 
Instance details

Defined in GHC.Generics

Methods

compare :: K1 i c p -> K1 i c p -> Ordering #

(<) :: K1 i c p -> K1 i c p -> Bool #

(<=) :: K1 i c p -> K1 i c p -> Bool #

(>) :: K1 i c p -> K1 i c p -> Bool #

(>=) :: K1 i c p -> K1 i c p -> Bool #

max :: K1 i c p -> K1 i c p -> K1 i c p #

min :: K1 i c p -> K1 i c p -> K1 i c p #

(Ord a, Ord b, Ord c, Ord d) => Ord (a, b, c, d) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d) -> (a, b, c, d) -> Ordering #

(<) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(<=) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(>) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(>=) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

max :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

min :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

Ord (f (g p)) => Ord ((f :.: g) p) 
Instance details

Defined in GHC.Generics

Methods

compare :: (f :.: g) p -> (f :.: g) p -> Ordering #

(<) :: (f :.: g) p -> (f :.: g) p -> Bool #

(<=) :: (f :.: g) p -> (f :.: g) p -> Bool #

(>) :: (f :.: g) p -> (f :.: g) p -> Bool #

(>=) :: (f :.: g) p -> (f :.: g) p -> Bool #

max :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

min :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

Ord (f p) => Ord (M1 i c f p) 
Instance details

Defined in GHC.Generics

Methods

compare :: M1 i c f p -> M1 i c f p -> Ordering #

(<) :: M1 i c f p -> M1 i c f p -> Bool #

(<=) :: M1 i c f p -> M1 i c f p -> Bool #

(>) :: M1 i c f p -> M1 i c f p -> Bool #

(>=) :: M1 i c f p -> M1 i c f p -> Bool #

max :: M1 i c f p -> M1 i c f p -> M1 i c f p #

min :: M1 i c f p -> M1 i c f p -> M1 i c f p #

Ord (f a) => Ord (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

compare :: Clown f a b -> Clown f a b -> Ordering #

(<) :: Clown f a b -> Clown f a b -> Bool #

(<=) :: Clown f a b -> Clown f a b -> Bool #

(>) :: Clown f a b -> Clown f a b -> Bool #

(>=) :: Clown f a b -> Clown f a b -> Bool #

max :: Clown f a b -> Clown f a b -> Clown f a b #

min :: Clown f a b -> Clown f a b -> Clown f a b #

Ord (p b a) => Ord (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

compare :: Flip p a b -> Flip p a b -> Ordering #

(<) :: Flip p a b -> Flip p a b -> Bool #

(<=) :: Flip p a b -> Flip p a b -> Bool #

(>) :: Flip p a b -> Flip p a b -> Bool #

(>=) :: Flip p a b -> Flip p a b -> Bool #

max :: Flip p a b -> Flip p a b -> Flip p a b #

min :: Flip p a b -> Flip p a b -> Flip p a b #

Ord (g b) => Ord (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

compare :: Joker g a b -> Joker g a b -> Ordering #

(<) :: Joker g a b -> Joker g a b -> Bool #

(<=) :: Joker g a b -> Joker g a b -> Bool #

(>) :: Joker g a b -> Joker g a b -> Bool #

(>=) :: Joker g a b -> Joker g a b -> Bool #

max :: Joker g a b -> Joker g a b -> Joker g a b #

min :: Joker g a b -> Joker g a b -> Joker g a b #

Ord (p a b) => Ord (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

compare :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Ordering #

(<) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

(<=) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

(>) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

(>=) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

max :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> WrappedBifunctor p a b #

min :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> WrappedBifunctor p a b #

(Ord a, Ord b, Ord c, Ord d, Ord e) => Ord (a, b, c, d, e) 
Instance details

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 (f a b), Ord (g a b)) => Ord (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

compare :: Product f g a b -> Product f g a b -> Ordering #

(<) :: Product f g a b -> Product f g a b -> Bool #

(<=) :: Product f g a b -> Product f g a b -> Bool #

(>) :: Product f g a b -> Product f g a b -> Bool #

(>=) :: Product f g a b -> Product f g a b -> Bool #

max :: Product f g a b -> Product f g a b -> Product f g a b #

min :: Product f g a b -> Product f g a b -> Product f g a b #

(Ord (p a b), Ord (q a b)) => Ord (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

compare :: Sum p q a b -> Sum p q a b -> Ordering #

(<) :: Sum p q a b -> Sum p q a b -> Bool #

(<=) :: Sum p q a b -> Sum p q a b -> Bool #

(>) :: Sum p q a b -> Sum p q a b -> Bool #

(>=) :: Sum p q a b -> Sum p q a b -> Bool #

max :: Sum p q a b -> Sum p q a b -> Sum p q a b #

min :: Sum p q a b -> Sum p q a b -> Sum p q a b #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f) => Ord (a, b, c, d, e, f) 
Instance details

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 (f (p a b)) => Ord (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

compare :: Tannen f p a b -> Tannen f p a b -> Ordering #

(<) :: Tannen f p a b -> Tannen f p a b -> Bool #

(<=) :: Tannen f p a b -> Tannen f p a b -> Bool #

(>) :: Tannen f p a b -> Tannen f p a b -> Bool #

(>=) :: Tannen f p a b -> Tannen f p a b -> Bool #

max :: Tannen f p a b -> Tannen f p a b -> Tannen f p a b #

min :: Tannen f p a b -> Tannen f p a b -> Tannen f p a b #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g) => Ord (a, b, c, d, e, f, g) 
Instance details

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) 
Instance details

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 (p (f a) (g b)) => Ord (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

compare :: Biff p f g a b -> Biff p f g a b -> Ordering #

(<) :: Biff p f g a b -> Biff p f g a b -> Bool #

(<=) :: Biff p f g a b -> Biff p f g a b -> Bool #

(>) :: Biff p f g a b -> Biff p f g a b -> Bool #

(>=) :: Biff p f g a b -> Biff p f g a b -> Bool #

max :: Biff p f g a b -> Biff p f g a b -> Biff p f g a b #

min :: Biff p f g a b -> Biff p f g a b -> Biff p f g a b #

(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) 
Instance details

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) 
Instance details

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) 
Instance details

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) 
Instance details

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) 
Instance details

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) 
Instance details

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) 
Instance details

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) #

type FilePath = String #

data CliOpts Source #

Command line options, used in the hledger package and above. This is the "opts" used throughout hledger CLI code. representing the options and arguments that were provided at startup on the command-line.

Constructors

CliOpts 

Fields

Instances

Instances details
Show CliOpts Source # 
Instance details

Defined in Hledger.Cli.CliOptions

Methods

showsPrec :: Int -> CliOpts -> ShowS

show :: CliOpts -> String

showList :: [CliOpts] -> ShowS

Default CliOpts Source # 
Instance details

Defined in Hledger.Cli.CliOptions

Methods

def :: CliOpts

HasCliOpts CliOpts Source # 
Instance details

Defined in Hledger.Cli.CliOptions

HasBalancingOpts CliOpts Source # 
Instance details

Defined in Hledger.Cli.CliOptions

HasInputOpts CliOpts Source # 
Instance details

Defined in Hledger.Cli.CliOptions

Methods

inputOpts :: Lens' CliOpts InputOpts #

aliases :: Lens' CliOpts [String] #

anon__ :: Lens' CliOpts Bool #

auto__ :: Lens' CliOpts Bool #

balancingopts :: Lens' CliOpts BalancingOpts #

forecast :: Lens' CliOpts (Maybe DateSpan) #

infer_costs :: Lens' CliOpts Bool #

infer_equity :: Lens' CliOpts Bool #

ioDay :: Lens' CliOpts Day #

mformat :: Lens' CliOpts (Maybe StorageFormat) #

mrules_file :: Lens' CliOpts (Maybe FilePath) #

new__ :: Lens' CliOpts Bool #

new_save :: Lens' CliOpts Bool #

pivot :: Lens' CliOpts String #

reportspan :: Lens' CliOpts DateSpan #

strict :: Lens' CliOpts Bool #

verbose_tags :: Lens' CliOpts Bool #

HasReportOpts CliOpts Source # 
Instance details

Defined in Hledger.Cli.CliOptions

Methods

reportOpts :: ReportableLens' CliOpts ReportOpts #

period :: ReportableLens' CliOpts Period #

statuses :: ReportableLens' CliOpts [Status] #

depth :: ReportableLens' CliOpts (Maybe Int) #

date2 :: ReportableLens' CliOpts Bool #

real :: ReportableLens' CliOpts Bool #

querystring :: ReportableLens' CliOpts [Text] #

HasReportOptsNoUpdate CliOpts Source # 
Instance details

Defined in Hledger.Cli.CliOptions

HasReportSpec CliOpts Source # 
Instance details

Defined in Hledger.Cli.CliOptions

class HasCliOpts c where Source #

Minimal complete definition

cliOpts

Methods

cliOpts :: Lens' c CliOpts Source #

available_width :: Lens' c Int Source #

command :: Lens' c String Source #

debug__ :: Lens' c Int Source #

file__ :: Lens' c [FilePath] Source #

inputopts :: Lens' c InputOpts Source #

no_new_accounts :: Lens' c Bool Source #

output_file :: Lens' c (Maybe FilePath) Source #

output_format :: Lens' c (Maybe String) Source #

progstarttime :: Lens' c POSIXTime Source #

rawopts__ :: Lens' c RawOpts Source #

reportspec :: Lens' c ReportSpec Source #

width__ :: Lens' c (Maybe String) Source #

Instances

Instances details
HasCliOpts CliOpts Source # 
Instance details

Defined in Hledger.Cli.CliOptions

type CommandDoc = String Source #

A command's documentation. Used both as part of CLI help, and as part of the hledger manual. See parseCommandDoc.

data Either a b #

Constructors

Left a 
Right b 

Instances

Instances details
FromJSON2 Either 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON2 :: (Value -> Parser a) -> (Value -> Parser [a]) -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser (Either a b)

liftParseJSONList2 :: (Value -> Parser a) -> (Value -> Parser [a]) -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser [Either a b]

ToJSON2 Either 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON2 :: (a -> Value) -> ([a] -> Value) -> (b -> Value) -> ([b] -> Value) -> Either a b -> Value

liftToJSONList2 :: (a -> Value) -> ([a] -> Value) -> (b -> Value) -> ([b] -> Value) -> [Either a b] -> Value

liftToEncoding2 :: (a -> Encoding) -> ([a] -> Encoding) -> (b -> Encoding) -> ([b] -> Encoding) -> Either a b -> Encoding

liftToEncodingList2 :: (a -> Encoding) -> ([a] -> Encoding) -> (b -> Encoding) -> ([b] -> Encoding) -> [Either a b] -> Encoding

Bifunctor Either 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Either a c -> Either b d

first :: (a -> b) -> Either a c -> Either b c

second :: (b -> c) -> Either a b -> Either a c

NFData2 Either 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> Either a b -> ()

Hashable2 Either 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> Either a b -> Int

Generic1 (Either a :: Type -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (Either a) :: k -> Type

Methods

from1 :: forall (a0 :: k). Either a a0 -> Rep1 (Either a) a0

to1 :: forall (a0 :: k). Rep1 (Either a) a0 -> Either a a0

(Lift a, Lift b) => Lift (Either a b :: Type) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Either a b -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Either a b -> Code m (Either a b)

FromJSON a => FromJSON1 (Either a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser (Either a a0)

liftParseJSONList :: (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser [Either a a0]

ToJSON a => ToJSON1 (Either a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a0 -> Value) -> ([a0] -> Value) -> Either a a0 -> Value

liftToJSONList :: (a0 -> Value) -> ([a0] -> Value) -> [Either a a0] -> Value

liftToEncoding :: (a0 -> Encoding) -> ([a0] -> Encoding) -> Either a a0 -> Encoding

liftToEncodingList :: (a0 -> Encoding) -> ([a0] -> Encoding) -> [Either a a0] -> Encoding

Foldable (Either a) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Either a m -> m

foldMap :: Monoid m => (a0 -> m) -> Either a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> Either a a0 -> m

foldr :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Either a a0 -> b

foldl :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 #

toList :: Either a a0 -> [a0]

null :: Either a a0 -> Bool #

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 #

sum :: Num a0 => Either a a0 -> a0 #

product :: Num a0 => Either a a0 -> a0 #

Traversable (Either a) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a0 -> f b) -> Either a a0 -> f (Either a b)

sequenceA :: Applicative f => Either a (f a0) -> f (Either a a0)

mapM :: Monad m => (a0 -> m b) -> Either a a0 -> m (Either a b) #

sequence :: Monad m => Either a (m a0) -> m (Either a a0) #

Applicative (Either e) 
Instance details

Defined in Data.Either

Methods

pure :: a -> Either e a #

(<*>) :: Either e (a -> b) -> Either e a -> Either e b #

liftA2 :: (a -> b -> c) -> Either e a -> Either e b -> Either e c #

(*>) :: Either e a -> Either e b -> Either e b #

(<*) :: Either e a -> Either e b -> Either e a #

Functor (Either a) 
Instance details

Defined in Data.Either

Methods

fmap :: (a0 -> b) -> Either a a0 -> Either a b #

(<$) :: a0 -> Either a b -> Either a a0 #

Monad (Either e) 
Instance details

Defined in Data.Either

Methods

(>>=) :: Either e a -> (a -> Either e b) -> Either e b #

(>>) :: Either e a -> Either e b -> Either e b #

return :: a -> Either e a #

NFData a => NFData1 (Either a) 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a0 -> ()) -> Either a a0 -> ()

e ~ SomeException => MonadCatch (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e0 => Either e a -> (e0 -> Either e a) -> Either e a

e ~ SomeException => MonadMask (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b

uninterruptibleMask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b

generalBracket :: Either e a -> (a -> ExitCase b -> Either e c) -> (a -> Either e b) -> Either e (b, c)

e ~ SomeException => MonadThrow (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> Either e a

Hashable a => Hashable1 (Either a) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> Either a a0 -> Int

e ~ a => Reportable (Either a) e 
Instance details

Defined in Hledger.Reports.ReportOptions

Methods

report :: a0 -> Either a (Either e a0) -> Either a a0

(FromJSON a, FromJSON b) => FromJSON (Either a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Either a b)

parseJSONList :: Value -> Parser [Either a b]

(ToJSON a, ToJSON b) => ToJSON (Either a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Either a b -> Value

toEncoding :: Either a b -> Encoding

toJSONList :: [Either a b] -> Value

toEncodingList :: [Either a b] -> Encoding

(Data a, Data b) => Data (Either a b) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Either a b -> c (Either a b)

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Either a b)

toConstr :: Either a b -> Constr

dataTypeOf :: Either a b -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Either a b))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Either a b))

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Either a b -> Either a b

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r

gmapQ :: (forall d. Data d => d -> u) -> Either a b -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Either a b -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b)

Semigroup (Either a b) 
Instance details

Defined in Data.Either

Methods

(<>) :: Either a b -> Either a b -> Either a b

sconcat :: NonEmpty (Either a b) -> Either a b

stimes :: Integral b0 => b0 -> Either a b -> Either a b

Generic (Either a b) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Either a b) :: Type -> Type

Methods

from :: Either a b -> Rep (Either a b) x

to :: Rep (Either a b) x -> Either a b

(Read a, Read b) => Read (Either a b) 
Instance details

Defined in Data.Either

Methods

readsPrec :: Int -> ReadS (Either a b)

readList :: ReadS [Either a b]

readPrec :: ReadPrec (Either a b)

readListPrec :: ReadPrec [Either a b]

(Show a, Show b) => Show (Either a b) 
Instance details

Defined in Data.Either

Methods

showsPrec :: Int -> Either a b -> ShowS

show :: Either a b -> String

showList :: [Either a b] -> ShowS

(NFData a, NFData b) => NFData (Either a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Either a b -> ()

(Eq a, Eq b) => Eq (Either a b) 
Instance details

Defined in Data.Either

Methods

(==) :: Either a b -> Either a b -> Bool

(/=) :: Either a b -> Either a b -> Bool

(Ord a, Ord b) => Ord (Either a b) 
Instance details

Defined in Data.Either

Methods

compare :: Either a b -> Either a b -> Ordering #

(<) :: Either a b -> Either a b -> Bool #

(<=) :: Either a b -> Either a b -> Bool #

(>) :: Either a b -> Either a b -> Bool #

(>=) :: Either a b -> Either a b -> Bool #

max :: Either a b -> Either a b -> Either a b #

min :: Either a b -> Either a b -> Either a b #

(Hashable a, Hashable b) => Hashable (Either a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Either a b -> Int

hash :: Either a b -> Int

MonoFoldable (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Either a b) -> m) -> Either a b -> m

ofoldr :: (Element (Either a b) -> b0 -> b0) -> b0 -> Either a b -> b0

ofoldl' :: (a0 -> Element (Either a b) -> a0) -> a0 -> Either a b -> a0

otoList :: Either a b -> [Element (Either a b)]

oall :: (Element (Either a b) -> Bool) -> Either a b -> Bool

oany :: (Element (Either a b) -> Bool) -> Either a b -> Bool

onull :: Either a b -> Bool

olength :: Either a b -> Int

olength64 :: Either a b -> Int64

ocompareLength :: Integral i => Either a b -> i -> Ordering

otraverse_ :: Applicative f => (Element (Either a b) -> f b0) -> Either a b -> f ()

ofor_ :: Applicative f => Either a b -> (Element (Either a b) -> f b0) -> f ()

omapM_ :: Applicative m => (Element (Either a b) -> m ()) -> Either a b -> m ()

oforM_ :: Applicative m => Either a b -> (Element (Either a b) -> m ()) -> m ()

ofoldlM :: Monad m => (a0 -> Element (Either a b) -> m a0) -> a0 -> Either a b -> m a0

ofoldMap1Ex :: Semigroup m => (Element (Either a b) -> m) -> Either a b -> m

ofoldr1Ex :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b)

ofoldl1Ex' :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b)

headEx :: Either a b -> Element (Either a b)

lastEx :: Either a b -> Element (Either a b)

unsafeHead :: Either a b -> Element (Either a b)

unsafeLast :: Either a b -> Element (Either a b)

maximumByEx :: (Element (Either a b) -> Element (Either a b) -> Ordering) -> Either a b -> Element (Either a b)

minimumByEx :: (Element (Either a b) -> Element (Either a b) -> Ordering) -> Either a b -> Element (Either a b)

oelem :: Element (Either a b) -> Either a b -> Bool

onotElem :: Element (Either a b) -> Either a b -> Bool

MonoFunctor (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Either a b) -> Element (Either a b)) -> Either a b -> Either a b

MonoPointed (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Either a b) -> Either a b

MonoTraversable (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Either a b) -> f (Element (Either a b))) -> Either a b -> f (Either a b)

omapM :: Applicative m => (Element (Either a b) -> m (Element (Either a b))) -> Either a b -> m (Either a b)

(a ~ a', b ~ b') => Each (Either a a') (Either b b') a b 
Instance details

Defined in Lens.Micro.Internal

Methods

each :: Traversal (Either a a') (Either b b') a b

type Rep1 (Either a :: Type -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (Either a :: Type -> Type) = D1 ('MetaData "Either" "Data.Either" "base" 'False) (C1 ('MetaCons "Left" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Right" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
type Rep (Either a b) 
Instance details

Defined in GHC.Generics

type Rep (Either a b) = D1 ('MetaData "Either" "Data.Either" "base" 'False) (C1 ('MetaCons "Left" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Right" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)))
type Element (Either a b) 
Instance details

Defined in Data.MonoTraversable

type Element (Either a b) = b

type Topic = String Source #

newtype Day #

Constructors

ModifiedJulianDay 

Fields

Instances

Instances details
FromJSON Day 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Day

parseJSONList :: Value -> Parser [Day]

FromJSONKey Day 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Day

fromJSONKeyList :: FromJSONKeyFunction [Day]

ToJSON Day 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Day -> Value

toEncoding :: Day -> Encoding

toJSONList :: [Day] -> Value

toEncodingList :: [Day] -> Encoding

ToJSONKey Day 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Day

toJSONKeyList :: ToJSONKeyFunction [Day]

Data Day 
Instance details

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

toConstr :: Day -> Constr

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 
Instance details

Defined in Data.Time.Calendar.Days

Methods

succ :: Day -> Day

pred :: Day -> Day

toEnum :: Int -> Day

fromEnum :: Day -> Int

enumFrom :: Day -> [Day]

enumFromThen :: Day -> Day -> [Day]

enumFromTo :: Day -> Day -> [Day]

enumFromThenTo :: Day -> Day -> Day -> [Day]

Ix Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

range :: (Day, Day) -> [Day]

index :: (Day, Day) -> Day -> Int

unsafeIndex :: (Day, Day) -> Day -> Int

inRange :: (Day, Day) -> Day -> Bool

rangeSize :: (Day, Day) -> Int

unsafeRangeSize :: (Day, Day) -> Int

NFData Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

rnf :: Day -> ()

Eq Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

(==) :: Day -> Day -> Bool

(/=) :: Day -> Day -> Bool

Ord Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

compare :: Day -> Day -> Ordering #

(<) :: Day -> Day -> Bool #

(<=) :: Day -> Day -> Bool #

(>) :: Day -> Day -> Bool #

(>=) :: Day -> Day -> Bool #

max :: Day -> Day -> Day #

min :: Day -> Day -> Day #

DayPeriod Day 
Instance details

Defined in Data.Time.Calendar.Days

type ProgramName = String Source #

type PackageVersion = String Source #

type VersionString = String Source #

type Help = String #

data Group a #

Constructors

Group 

Fields

Instances

Instances details
Functor Group 
Instance details

Defined in System.Console.CmdArgs.Explicit.Type

Methods

fmap :: (a -> b) -> Group a -> Group b #

(<$) :: a -> Group b -> Group a #

Monoid (Group a) 
Instance details

Defined in System.Console.CmdArgs.Explicit.Type

Methods

mempty :: Group a

mappend :: Group a -> Group a -> Group a

mconcat :: [Group a] -> Group a

Semigroup (Group a) 
Instance details

Defined in System.Console.CmdArgs.Explicit.Type

Methods

(<>) :: Group a -> Group a -> Group a

sconcat :: NonEmpty (Group a) -> Group a

stimes :: Integral b => b -> Group a -> Group a

Show a => Show (Group a) 
Instance details

Defined in System.Console.CmdArgs.Explicit.Type

Methods

showsPrec :: Int -> Group a -> ShowS

show :: Group a -> String

showList :: [Group a] -> ShowS

data Journal #

Instances

Instances details
Generic Journal 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep Journal :: Type -> Type

Methods

from :: Journal -> Rep Journal x

to :: Rep Journal x -> Journal

Eq Journal 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: Journal -> Journal -> Bool

(/=) :: Journal -> Journal -> Bool

Anon Journal Source # 
Instance details

Defined in Hledger.Cli.Anon

Methods

anon :: Journal -> Journal Source #

type Rep Journal 
Instance details

Defined in Hledger.Data.Types

type Rep Journal = D1 ('MetaData "Journal" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "Journal" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "jparsedefaultyear") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Year)) :*: (S1 ('MetaSel ('Just "jparsedefaultcommodity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (CommoditySymbol, AmountStyle))) :*: S1 ('MetaSel ('Just "jparsedecimalmark") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe DecimalMark)))) :*: (S1 ('MetaSel ('Just "jparseparentaccounts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [AccountName]) :*: (S1 ('MetaSel ('Just "jparsealiases") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [AccountAlias]) :*: S1 ('MetaSel ('Just "jparsetimeclockentries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TimeclockEntry])))) :*: ((S1 ('MetaSel ('Just "jincludefilestack") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: (S1 ('MetaSel ('Just "jdeclaredpayees") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Payee, PayeeDeclarationInfo)]) :*: S1 ('MetaSel ('Just "jdeclaredtags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(TagName, TagDeclarationInfo)]))) :*: (S1 ('MetaSel ('Just "jdeclaredaccounts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(AccountName, AccountDeclarationInfo)]) :*: (S1 ('MetaSel ('Just "jdeclaredaccounttags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map AccountName [Tag])) :*: S1 ('MetaSel ('Just "jdeclaredaccounttypes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map AccountType [AccountName])))))) :*: (((S1 ('MetaSel ('Just "jaccounttypes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map AccountName AccountType)) :*: (S1 ('MetaSel ('Just "jglobalcommoditystyles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map CommoditySymbol AmountStyle)) :*: S1 ('MetaSel ('Just "jcommodities") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map CommoditySymbol Commodity)))) :*: (S1 ('MetaSel ('Just "jinferredcommodities") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map CommoditySymbol AmountStyle)) :*: (S1 ('MetaSel ('Just "jpricedirectives") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [PriceDirective]) :*: S1 ('MetaSel ('Just "jinferredmarketprices") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [MarketPrice])))) :*: ((S1 ('MetaSel ('Just "jtxnmodifiers") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TransactionModifier]) :*: (S1 ('MetaSel ('Just "jperiodictxns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [PeriodicTransaction]) :*: S1 ('MetaSel ('Just "jtxns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Transaction]))) :*: (S1 ('MetaSel ('Just "jfinalcommentlines") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "jfiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(FilePath, Text)]) :*: S1 ('MetaSel ('Just "jlastreadtime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 POSIXTime)))))))

data Posting #

Instances

Instances details
Generic Posting 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep Posting :: Type -> Type

Methods

from :: Posting -> Rep Posting x

to :: Rep Posting x -> Posting

Show Posting 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> Posting -> ShowS

show :: Posting -> String

showList :: [Posting] -> ShowS

Eq Posting 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: Posting -> Posting -> Bool

(/=) :: Posting -> Posting -> Bool

Anon Posting Source # 
Instance details

Defined in Hledger.Cli.Anon

Methods

anon :: Posting -> Posting Source #

type Rep Posting 
Instance details

Defined in Hledger.Data.Types

type Rep Posting = D1 ('MetaData "Posting" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "Posting" 'PrefixI 'True) (((S1 ('MetaSel ('Just "pdate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Day)) :*: S1 ('MetaSel ('Just "pdate2") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Day))) :*: (S1 ('MetaSel ('Just "pstatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Status) :*: (S1 ('MetaSel ('Just "paccount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AccountName) :*: S1 ('MetaSel ('Just "pamount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MixedAmount)))) :*: ((S1 ('MetaSel ('Just "pcomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "ptype") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PostingType) :*: S1 ('MetaSel ('Just "ptags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Tag]))) :*: (S1 ('MetaSel ('Just "pbalanceassertion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe BalanceAssertion)) :*: (S1 ('MetaSel ('Just "ptransaction") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Transaction)) :*: S1 ('MetaSel ('Just "poriginal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Posting)))))))

data Transaction #

Instances

Instances details
Generic Transaction 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep Transaction :: Type -> Type

Methods

from :: Transaction -> Rep Transaction x

to :: Rep Transaction x -> Transaction

Show Transaction 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> Transaction -> ShowS

show :: Transaction -> String

showList :: [Transaction] -> ShowS

Eq Transaction 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: Transaction -> Transaction -> Bool

(/=) :: Transaction -> Transaction -> Bool

Anon Transaction Source # 
Instance details

Defined in Hledger.Cli.Anon

type Rep Transaction 
Instance details

Defined in Hledger.Data.Types

type Rep Transaction = D1 ('MetaData "Transaction" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "Transaction" 'PrefixI 'True) (((S1 ('MetaSel ('Just "tindex") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer) :*: S1 ('MetaSel ('Just "tprecedingcomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "tsourcepos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SourcePos, SourcePos)) :*: (S1 ('MetaSel ('Just "tdate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day) :*: S1 ('MetaSel ('Just "tdate2") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Day))))) :*: ((S1 ('MetaSel ('Just "tstatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Status) :*: (S1 ('MetaSel ('Just "tcode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "tdescription") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))) :*: (S1 ('MetaSel ('Just "tcomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "ttags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Tag]) :*: S1 ('MetaSel ('Just "tpostings") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Posting]))))))

type IOError = IOException #

class Applicative f => Alternative (f :: Type -> Type) where #

Minimal complete definition

empty, (<|>)

Methods

empty :: f a #

(<|>) :: f a -> f a -> f a #

some :: f a -> f [a] #

many :: f a -> f [a] #

Instances

Instances details
Alternative IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: IResult a #

(<|>) :: IResult a -> IResult a -> IResult a #

some :: IResult a -> IResult [a] #

many :: IResult a -> IResult [a] #

Alternative Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: Parser a #

(<|>) :: Parser a -> Parser a -> Parser a #

some :: Parser a -> Parser [a] #

many :: Parser a -> Parser [a] #

Alternative Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: Result a #

(<|>) :: Result a -> Result a -> Result a #

some :: Result a -> Result [a] #

many :: Result a -> Result [a] #

Alternative ZipList 
Instance details

Defined in Control.Applicative

Methods

empty :: ZipList a #

(<|>) :: ZipList a -> ZipList a -> ZipList a #

some :: ZipList a -> ZipList [a] #

many :: ZipList a -> ZipList [a] #

Alternative STM 
Instance details

Defined in GHC.Conc.Sync

Methods

empty :: STM a #

(<|>) :: STM a -> STM a -> STM a #

some :: STM a -> STM [a] #

many :: STM a -> STM [a] #

Alternative P 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

empty :: P a #

(<|>) :: P a -> P a -> P a #

some :: P a -> P [a] #

many :: P a -> P [a] #

Alternative ReadP 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

empty :: ReadP a #

(<|>) :: ReadP a -> ReadP a -> ReadP a #

some :: ReadP a -> ReadP [a] #

many :: ReadP a -> ReadP [a] #

Alternative ReadPrec 
Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

empty :: ReadPrec a #

(<|>) :: ReadPrec a -> ReadPrec a -> ReadPrec a #

some :: ReadPrec a -> ReadPrec [a] #

many :: ReadPrec a -> ReadPrec [a] #

Alternative Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

empty :: Seq a #

(<|>) :: Seq a -> Seq a -> Seq a #

some :: Seq a -> Seq [a] #

many :: Seq a -> Seq [a] #

Alternative DList 
Instance details

Defined in Data.DList.Internal

Methods

empty :: DList a #

(<|>) :: DList a -> DList a -> DList a #

some :: DList a -> DList [a] #

many :: DList a -> DList [a] #

Alternative IO 
Instance details

Defined in GHC.Base

Methods

empty :: IO a #

(<|>) :: IO a -> IO a -> IO a #

some :: IO a -> IO [a] #

many :: IO a -> IO [a] #

Alternative Root 
Instance details

Defined in Numeric.RootFinding

Methods

empty :: Root a #

(<|>) :: Root a -> Root a -> Root a #

some :: Root a -> Root [a] #

many :: Root a -> Root [a] #

Alternative Array 
Instance details

Defined in Data.Primitive.Array

Methods

empty :: Array a #

(<|>) :: Array a -> Array a -> Array a #

some :: Array a -> Array [a] #

many :: Array a -> Array [a] #

Alternative SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

empty :: SmallArray a #

(<|>) :: SmallArray a -> SmallArray a -> SmallArray a #

some :: SmallArray a -> SmallArray [a] #

many :: SmallArray a -> SmallArray [a] #

Alternative Capability 
Instance details

Defined in System.Console.Terminfo.Base

Methods

empty :: Capability a #

(<|>) :: Capability a -> Capability a -> Capability a #

some :: Capability a -> Capability [a] #

many :: Capability a -> Capability [a] #

Alternative Vector 
Instance details

Defined in Data.Vector

Methods

empty :: Vector a #

(<|>) :: Vector a -> Vector a -> Vector a #

some :: Vector a -> Vector [a] #

many :: Vector a -> Vector [a] #

Alternative Maybe 
Instance details

Defined in GHC.Base

Methods

empty :: Maybe a #

(<|>) :: Maybe a -> Maybe a -> Maybe a #

some :: Maybe a -> Maybe [a] #

many :: Maybe a -> Maybe [a] #

Alternative [] 
Instance details

Defined in GHC.Base

Methods

empty :: [a] #

(<|>) :: [a] -> [a] -> [a] #

some :: [a] -> [[a]] #

many :: [a] -> [[a]] #

Alternative (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

empty :: Parser i a #

(<|>) :: Parser i a -> Parser i a -> Parser i a #

some :: Parser i a -> Parser i [a] #

many :: Parser i a -> Parser i [a] #

MonadPlus m => Alternative (WrappedMonad m) 
Instance details

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] #

ArrowPlus a => Alternative (ArrowMonad a) 
Instance details

Defined in Control.Arrow

Methods

empty :: ArrowMonad a a0 #

(<|>) :: ArrowMonad a a0 -> ArrowMonad a a0 -> ArrowMonad a a0 #

some :: ArrowMonad a a0 -> ArrowMonad a [a0] #

many :: ArrowMonad a a0 -> ArrowMonad a [a0] #

Alternative (U1 :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

empty :: U1 a #

(<|>) :: U1 a -> U1 a -> U1 a #

some :: U1 a -> U1 [a] #

many :: U1 a -> U1 [a] #

Alternative m => Alternative (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

empty :: ResourceT m a #

(<|>) :: ResourceT m a -> ResourceT m a -> ResourceT m a #

some :: ResourceT m a -> ResourceT m [a] #

many :: ResourceT m a -> ResourceT m [a] #

(Functor m, Monad m) => Alternative (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

empty :: MaybeT m a #

(<|>) :: MaybeT m a -> MaybeT m a -> MaybeT m a #

some :: MaybeT m a -> MaybeT m [a] #

many :: MaybeT m a -> MaybeT m [a] #

Functor backend => Alternative (Wizard backend) 
Instance details

Defined in System.Console.Wizard.Internal

Methods

empty :: Wizard backend a #

(<|>) :: Wizard backend a -> Wizard backend a -> Wizard backend a #

some :: Wizard backend a -> Wizard backend [a] #

many :: Wizard backend a -> Wizard backend [a] #

(ArrowZero a, ArrowPlus a) => Alternative (WrappedArrow a b) 
Instance details

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] #

Alternative m => Alternative (Kleisli m a) 
Instance details

Defined in Control.Arrow

Methods

empty :: Kleisli m a a0 #

(<|>) :: Kleisli m a a0 -> Kleisli m a a0 -> Kleisli m a a0 #

some :: Kleisli m a a0 -> Kleisli m a [a0] #

many :: Kleisli m a a0 -> Kleisli m a [a0] #

Alternative f => Alternative (Alt f) 
Instance details

Defined in Data.Semigroup.Internal

Methods

empty :: Alt f a #

(<|>) :: Alt f a -> Alt f a -> Alt f a #

some :: Alt f a -> Alt f [a] #

many :: Alt f a -> Alt f [a] #

(Generic1 f, Alternative (Rep1 f)) => Alternative (Generically1 f) 
Instance details

Defined in GHC.Generics

Methods

empty :: Generically1 f a #

(<|>) :: Generically1 f a -> Generically1 f a -> Generically1 f a #

some :: Generically1 f a -> Generically1 f [a] #

many :: Generically1 f a -> Generically1 f [a] #

Alternative f => Alternative (Rec1 f) 
Instance details

Defined in GHC.Generics

Methods

empty :: Rec1 f a #

(<|>) :: Rec1 f a -> Rec1 f a -> Rec1 f a #

some :: Rec1 f a -> Rec1 f [a] #

many :: Rec1 f a -> Rec1 f [a] #

(Functor f, Functor m, Monad m, MonadPlus m) => Alternative (FreeT f m) 
Instance details

Defined in Control.Monad.Free

Methods

empty :: FreeT f m a #

(<|>) :: FreeT f m a -> FreeT f m a -> FreeT f m a #

some :: FreeT f m a -> FreeT f m [a] #

many :: FreeT f m a -> FreeT f m [a] #

(Functor m, Monad m, Error e) => Alternative (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

empty :: ErrorT e m a #

(<|>) :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

some :: ErrorT e m a -> ErrorT e m [a] #

many :: ErrorT e m a -> ErrorT e m [a] #

(Functor m, Monad m, Monoid e) => Alternative (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

empty :: ExceptT e m a #

(<|>) :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

some :: ExceptT e m a -> ExceptT e m [a] #

many :: ExceptT e m a -> ExceptT e m [a] #

Alternative m => Alternative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

empty :: ReaderT r m a #

(<|>) :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

some :: ReaderT r m a -> ReaderT r m [a] #

many :: ReaderT r m a -> ReaderT r m [a] #

(Functor m, MonadPlus m) => Alternative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

empty :: StateT s m a #

(<|>) :: StateT s m a -> StateT s m a -> StateT s m a #

some :: StateT s m a -> StateT s m [a] #

many :: StateT s m a -> StateT s m [a] #

(Alternative f, Alternative g) => Alternative (f :*: g) 
Instance details

Defined in GHC.Generics

Methods

empty :: (f :*: g) a #

(<|>) :: (f :*: g) a -> (f :*: g) a -> (f :*: g) a #

some :: (f :*: g) a -> (f :*: g) [a] #

many :: (f :*: g) a -> (f :*: g) [a] #

(Ord e, Stream s) => Alternative (ParsecT e s m) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

empty :: ParsecT e s m a #

(<|>) :: ParsecT e s m a -> ParsecT e s m a -> ParsecT e s m a #

some :: ParsecT e s m a -> ParsecT e s m [a] #

many :: ParsecT e s m a -> ParsecT e s m [a] #

(Alternative f, Applicative g) => Alternative (f :.: g) 
Instance details

Defined in GHC.Generics

Methods

empty :: (f :.: g) a #

(<|>) :: (f :.: g) a -> (f :.: g) a -> (f :.: g) a #

some :: (f :.: g) a -> (f :.: g) [a] #

many :: (f :.: g) a -> (f :.: g) [a] #

Alternative f => Alternative (M1 i c f) 
Instance details

Defined in GHC.Generics

Methods

empty :: M1 i c f a #

(<|>) :: M1 i c f a -> M1 i c f a -> M1 i c f a #

some :: M1 i c f a -> M1 i c f [a] #

many :: M1 i c f a -> M1 i c f [a] #

class (Alternative m, Monad m) => MonadPlus (m :: Type -> Type) where #

Minimal complete definition

Nothing

Methods

mzero :: m a #

mplus :: m a -> m a -> m a #

Instances

Instances details
MonadPlus IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: IResult a #

mplus :: IResult a -> IResult a -> IResult a #

MonadPlus Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: Parser a #

mplus :: Parser a -> Parser a -> Parser a #

MonadPlus Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: Result a #

mplus :: Result a -> Result a -> Result a #

MonadPlus STM 
Instance details

Defined in GHC.Conc.Sync

Methods

mzero :: STM a #

mplus :: STM a -> STM a -> STM a #

MonadPlus P 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

mzero :: P a #

mplus :: P a -> P a -> P a #

MonadPlus ReadP 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

mzero :: ReadP a #

mplus :: ReadP a -> ReadP a -> ReadP a #

MonadPlus ReadPrec 
Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

mzero :: ReadPrec a #

mplus :: ReadPrec a -> ReadPrec a -> ReadPrec a #

MonadPlus Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

mzero :: Seq a #

mplus :: Seq a -> Seq a -> Seq a #

MonadPlus DList 
Instance details

Defined in Data.DList.Internal

Methods

mzero :: DList a #

mplus :: DList a -> DList a -> DList a #

MonadPlus IO 
Instance details

Defined in GHC.Base

Methods

mzero :: IO a #

mplus :: IO a -> IO a -> IO a #

MonadPlus Root 
Instance details

Defined in Numeric.RootFinding

Methods

mzero :: Root a #

mplus :: Root a -> Root a -> Root a #

MonadPlus Array 
Instance details

Defined in Data.Primitive.Array

Methods

mzero :: Array a #

mplus :: Array a -> Array a -> Array a #

MonadPlus SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

mzero :: SmallArray a #

mplus :: SmallArray a -> SmallArray a -> SmallArray a #

MonadPlus Capability 
Instance details

Defined in System.Console.Terminfo.Base

Methods

mzero :: Capability a #

mplus :: Capability a -> Capability a -> Capability a #

MonadPlus Vector 
Instance details

Defined in Data.Vector

Methods

mzero :: Vector a #

mplus :: Vector a -> Vector a -> Vector a #

MonadPlus Maybe 
Instance details

Defined in GHC.Base

Methods

mzero :: Maybe a #

mplus :: Maybe a -> Maybe a -> Maybe a #

MonadPlus [] 
Instance details

Defined in GHC.Base

Methods

mzero :: [a] #

mplus :: [a] -> [a] -> [a] #

MonadPlus (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mzero :: Parser i a #

mplus :: Parser i a -> Parser i a -> Parser i a #

(ArrowApply a, ArrowPlus a) => MonadPlus (ArrowMonad a) 
Instance details

Defined in Control.Arrow

Methods

mzero :: ArrowMonad a a0 #

mplus :: ArrowMonad a a0 -> ArrowMonad a a0 -> ArrowMonad a a0 #

MonadPlus (U1 :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

mzero :: U1 a #

mplus :: U1 a -> U1 a -> U1 a #

MonadPlus m => MonadPlus (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

mzero :: ResourceT m a #

mplus :: ResourceT m a -> ResourceT m a -> ResourceT m a #

Monad m => MonadPlus (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

mzero :: MaybeT m a #

mplus :: MaybeT m a -> MaybeT m a -> MaybeT m a #

Functor backend => MonadPlus (Wizard backend) 
Instance details

Defined in System.Console.Wizard.Internal

Methods

mzero :: Wizard backend a #

mplus :: Wizard backend a -> Wizard backend a -> Wizard backend a #

MonadPlus m => MonadPlus (Kleisli m a) 
Instance details

Defined in Control.Arrow

Methods

mzero :: Kleisli m a a0 #

mplus :: Kleisli m a a0 -> Kleisli m a a0 -> Kleisli m a a0 #

MonadPlus f => MonadPlus (Alt f) 
Instance details

Defined in Data.Semigroup.Internal

Methods

mzero :: Alt f a #

mplus :: Alt f a -> Alt f a -> Alt f a #

MonadPlus f => MonadPlus (Rec1 f) 
Instance details

Defined in GHC.Generics

Methods

mzero :: Rec1 f a #

mplus :: Rec1 f a -> Rec1 f a -> Rec1 f a #

(Functor f, Monad m, MonadPlus m) => MonadPlus (FreeT f m) 
Instance details

Defined in Control.Monad.Free

Methods

mzero :: FreeT f m a #

mplus :: FreeT f m a -> FreeT f m a -> FreeT f m a #

(Monad m, Error e) => MonadPlus (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

mzero :: ErrorT e m a #

mplus :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

(Monad m, Monoid e) => MonadPlus (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

mzero :: ExceptT e m a #

mplus :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

MonadPlus m => MonadPlus (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mzero :: ReaderT r m a #

mplus :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

MonadPlus m => MonadPlus (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

mzero :: StateT s m a #

mplus :: StateT s m a -> StateT s m a -> StateT s m a #

(MonadPlus f, MonadPlus g) => MonadPlus (f :*: g) 
Instance details

Defined in GHC.Generics

Methods

mzero :: (f :*: g) a #

mplus :: (f :*: g) a -> (f :*: g) a -> (f :*: g) a #

(Ord e, Stream s) => MonadPlus (ParsecT e s m) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

mzero :: ParsecT e s m a #

mplus :: ParsecT e s m a -> ParsecT e s m a -> ParsecT e s m a #

MonadPlus f => MonadPlus (M1 i c f) 
Instance details

Defined in GHC.Generics

Methods

mzero :: M1 i c f a #

mplus :: M1 i c f a -> M1 i c f a -> M1 i c f a #

class PrintfArg a where #

Minimal complete definition

formatArg

Instances

Instances details
PrintfArg Int16 
Instance details

Defined in Text.Printf

Methods

formatArg :: Int16 -> FieldFormatter #

parseFormat :: Int16 -> ModifierParser #

PrintfArg Int32 
Instance details

Defined in Text.Printf

Methods

formatArg :: Int32 -> FieldFormatter #

parseFormat :: Int32 -> ModifierParser #

PrintfArg Int64 
Instance details

Defined in Text.Printf

Methods

formatArg :: Int64 -> FieldFormatter #

parseFormat :: Int64 -> ModifierParser #

PrintfArg Int8 
Instance details

Defined in Text.Printf

PrintfArg Word16 
Instance details

Defined in Text.Printf

Methods

formatArg :: Word16 -> FieldFormatter #

parseFormat :: Word16 -> ModifierParser #

PrintfArg Word32 
Instance details

Defined in Text.Printf

Methods

formatArg :: Word32 -> FieldFormatter #

parseFormat :: Word32 -> ModifierParser #

PrintfArg Word64 
Instance details

Defined in Text.Printf

Methods

formatArg :: Word64 -> FieldFormatter #

parseFormat :: Word64 -> ModifierParser #

PrintfArg Word8 
Instance details

Defined in Text.Printf

Methods

formatArg :: Word8 -> FieldFormatter #

parseFormat :: Word8 -> ModifierParser #

PrintfArg ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

formatArg :: ShortText -> FieldFormatter #

parseFormat :: ShortText -> ModifierParser #

PrintfArg Integer 
Instance details

Defined in Text.Printf

Methods

formatArg :: Integer -> FieldFormatter #

parseFormat :: Integer -> ModifierParser #

PrintfArg Natural 
Instance details

Defined in Text.Printf

Methods

formatArg :: Natural -> FieldFormatter #

parseFormat :: Natural -> ModifierParser #

PrintfArg Char 
Instance details

Defined in Text.Printf

PrintfArg Double 
Instance details

Defined in Text.Printf

Methods

formatArg :: Double -> FieldFormatter #

parseFormat :: Double -> ModifierParser #

PrintfArg Float 
Instance details

Defined in Text.Printf

Methods

formatArg :: Float -> FieldFormatter #

parseFormat :: Float -> ModifierParser #

PrintfArg Int 
Instance details

Defined in Text.Printf

PrintfArg Word 
Instance details

Defined in Text.Printf

IsChar c => PrintfArg [c] 
Instance details

Defined in Text.Printf

type FieldFormatter = FieldFormat -> ShowS #

type ModifierParser = String -> FormatParse #

data FormatParse #

Constructors

FormatParse 

Fields

type HasCallStack = ?callStack :: CallStack #

data AmountDisplayOpts #

Instances

Instances details
Show AmountDisplayOpts 
Instance details

Defined in Hledger.Data.Amount

Methods

showsPrec :: Int -> AmountDisplayOpts -> ShowS

show :: AmountDisplayOpts -> String

showList :: [AmountDisplayOpts] -> ShowS

Default AmountDisplayOpts 
Instance details

Defined in Hledger.Data.Amount

type ErroringJournalParser (m :: Type -> Type) a = StateT Journal (ParsecT HledgerParseErrorData Text (ExceptT FinalParseError m)) a #

type JournalParser (m :: Type -> Type) a = StateT Journal (ParsecT HledgerParseErrorData Text m) a #

data RawOpts #

Instances

Instances details
Show RawOpts 
Instance details

Defined in Hledger.Data.RawOptions

Methods

showsPrec :: Int -> RawOpts -> ShowS

show :: RawOpts -> String

showList :: [RawOpts] -> ShowS

Default RawOpts 
Instance details

Defined in Hledger.Data.RawOptions

Methods

def :: RawOpts

data ReportItemField #

Instances

Instances details
Show ReportItemField 
Instance details

Defined in Hledger.Data.StringFormat

Methods

showsPrec :: Int -> ReportItemField -> ShowS

show :: ReportItemField -> String

showList :: [ReportItemField] -> ShowS

Eq ReportItemField 
Instance details

Defined in Hledger.Data.StringFormat

data StringFormat #

Instances

Instances details
Show StringFormat 
Instance details

Defined in Hledger.Data.StringFormat

Methods

showsPrec :: Int -> StringFormat -> ShowS

show :: StringFormat -> String

showList :: [StringFormat] -> ShowS

Default StringFormat 
Instance details

Defined in Hledger.Data.StringFormat

Methods

def :: StringFormat

Eq StringFormat 
Instance details

Defined in Hledger.Data.StringFormat

Methods

(==) :: StringFormat -> StringFormat -> Bool

(/=) :: StringFormat -> StringFormat -> Bool

data StringFormatComponent #

Constructors

FormatLiteral Text 
FormatField Bool (Maybe Int) (Maybe Int) ReportItemField 

Instances

Instances details
Show StringFormatComponent 
Instance details

Defined in Hledger.Data.StringFormat

Methods

showsPrec :: Int -> StringFormatComponent -> ShowS

show :: StringFormatComponent -> String

showList :: [StringFormatComponent] -> ShowS

Eq StringFormatComponent 
Instance details

Defined in Hledger.Data.StringFormat

data Account #

Instances

Instances details
Generic Account 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep Account :: Type -> Type

Methods

from :: Account -> Rep Account x

to :: Rep Account x -> Account

type Rep Account 
Instance details

Defined in Hledger.Data.Types

type Rep Account = D1 ('MetaData "Account" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "Account" 'PrefixI 'True) (((S1 ('MetaSel ('Just "aname") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AccountName) :*: S1 ('MetaSel ('Just "adeclarationinfo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe AccountDeclarationInfo))) :*: (S1 ('MetaSel ('Just "asubs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Account]) :*: S1 ('MetaSel ('Just "aparent") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Account)))) :*: ((S1 ('MetaSel ('Just "aboring") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "anumpostings") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :*: (S1 ('MetaSel ('Just "aebalance") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MixedAmount) :*: S1 ('MetaSel ('Just "aibalance") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MixedAmount)))))

data AccountAlias #

Instances

Instances details
Generic AccountAlias 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep AccountAlias :: Type -> Type

Read AccountAlias 
Instance details

Defined in Hledger.Data.Types

Methods

readsPrec :: Int -> ReadS AccountAlias

readList :: ReadS [AccountAlias]

readPrec :: ReadPrec AccountAlias

readListPrec :: ReadPrec [AccountAlias]

Show AccountAlias 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> AccountAlias -> ShowS

show :: AccountAlias -> String

showList :: [AccountAlias] -> ShowS

Eq AccountAlias 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: AccountAlias -> AccountAlias -> Bool

(/=) :: AccountAlias -> AccountAlias -> Bool

Ord AccountAlias 
Instance details

Defined in Hledger.Data.Types

type Rep AccountAlias 
Instance details

Defined in Hledger.Data.Types

type Rep AccountAlias = D1 ('MetaData "AccountAlias" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "BasicAlias" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AccountName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AccountName)) :+: C1 ('MetaCons "RegexAlias" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Regexp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Replacement)))

data AccountDeclarationInfo #

Instances

Instances details
Generic AccountDeclarationInfo 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep AccountDeclarationInfo :: Type -> Type

Show AccountDeclarationInfo 
Instance details

Defined in Hledger.Data.Types

Eq AccountDeclarationInfo 
Instance details

Defined in Hledger.Data.Types

type Rep AccountDeclarationInfo 
Instance details

Defined in Hledger.Data.Types

type Rep AccountDeclarationInfo = D1 ('MetaData "AccountDeclarationInfo" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "AccountDeclarationInfo" 'PrefixI 'True) ((S1 ('MetaSel ('Just "adicomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "aditags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Tag])) :*: (S1 ('MetaSel ('Just "adideclarationorder") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "adisourcepos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourcePos))))

data AccountType #

Instances

Instances details
Generic AccountType 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep AccountType :: Type -> Type

Methods

from :: AccountType -> Rep AccountType x

to :: Rep AccountType x -> AccountType

Show AccountType 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> AccountType -> ShowS

show :: AccountType -> String

showList :: [AccountType] -> ShowS

Eq AccountType 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: AccountType -> AccountType -> Bool

(/=) :: AccountType -> AccountType -> Bool

Ord AccountType 
Instance details

Defined in Hledger.Data.Types

type Rep AccountType 
Instance details

Defined in Hledger.Data.Types

type Rep AccountType = D1 ('MetaData "AccountType" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" '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))))

data Amount #

Instances

Instances details
Generic Amount 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep Amount :: Type -> Type

Methods

from :: Amount -> Rep Amount x

to :: Rep Amount x -> Amount

Show Amount 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> Amount -> ShowS

show :: Amount -> String

showList :: [Amount] -> ShowS

Eq Amount 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: Amount -> Amount -> Bool

(/=) :: Amount -> Amount -> Bool

Ord Amount 
Instance details

Defined in Hledger.Data.Types

Methods

compare :: Amount -> Amount -> Ordering #

(<) :: Amount -> Amount -> Bool #

(<=) :: Amount -> Amount -> Bool #

(>) :: Amount -> Amount -> Bool #

(>=) :: Amount -> Amount -> Bool #

max :: Amount -> Amount -> Amount #

min :: Amount -> Amount -> Amount #

type Rep Amount 
Instance details

Defined in Hledger.Data.Types

type Rep Amount = D1 ('MetaData "Amount" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "Amount" 'PrefixI 'True) ((S1 ('MetaSel ('Just "acommodity") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 CommoditySymbol) :*: S1 ('MetaSel ('Just "aquantity") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Quantity)) :*: (S1 ('MetaSel ('Just "astyle") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 AmountStyle) :*: S1 ('MetaSel ('Just "aprice") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe AmountPrice)))))

data AmountPrecision #

Constructors

Precision !Word8 
NaturalPrecision 

Instances

Instances details
Generic AmountPrecision 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep AmountPrecision :: Type -> Type

Read AmountPrecision 
Instance details

Defined in Hledger.Data.Types

Show AmountPrecision 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> AmountPrecision -> ShowS

show :: AmountPrecision -> String

showList :: [AmountPrecision] -> ShowS

Eq AmountPrecision 
Instance details

Defined in Hledger.Data.Types

Ord AmountPrecision 
Instance details

Defined in Hledger.Data.Types

type Rep AmountPrecision 
Instance details

Defined in Hledger.Data.Types

type Rep AmountPrecision = D1 ('MetaData "AmountPrecision" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" '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 AmountPrice #

Instances

Instances details
Generic AmountPrice 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep AmountPrice :: Type -> Type

Methods

from :: AmountPrice -> Rep AmountPrice x

to :: Rep AmountPrice x -> AmountPrice

Show AmountPrice 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> AmountPrice -> ShowS

show :: AmountPrice -> String

showList :: [AmountPrice] -> ShowS

Eq AmountPrice 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: AmountPrice -> AmountPrice -> Bool

(/=) :: AmountPrice -> AmountPrice -> Bool

Ord AmountPrice 
Instance details

Defined in Hledger.Data.Types

type Rep AmountPrice 
Instance details

Defined in Hledger.Data.Types

type Rep AmountPrice = D1 ('MetaData "AmountPrice" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "UnitPrice" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Amount)) :+: C1 ('MetaCons "TotalPrice" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Amount)))

data AmountStyle #

Instances

Instances details
Generic AmountStyle 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep AmountStyle :: Type -> Type

Methods

from :: AmountStyle -> Rep AmountStyle x

to :: Rep AmountStyle x -> AmountStyle

Read AmountStyle 
Instance details

Defined in Hledger.Data.Types

Methods

readsPrec :: Int -> ReadS AmountStyle

readList :: ReadS [AmountStyle]

readPrec :: ReadPrec AmountStyle

readListPrec :: ReadPrec [AmountStyle]

Show AmountStyle 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> AmountStyle -> ShowS

show :: AmountStyle -> String

showList :: [AmountStyle] -> ShowS

Eq AmountStyle 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: AmountStyle -> AmountStyle -> Bool

(/=) :: AmountStyle -> AmountStyle -> Bool

Ord AmountStyle 
Instance details

Defined in Hledger.Data.Types

type Rep AmountStyle 
Instance details

Defined in Hledger.Data.Types

type Rep AmountStyle = D1 ('MetaData "AmountStyle" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" '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 "asprecision") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 AmountPrecision) :*: (S1 ('MetaSel ('Just "asdecimalpoint") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Char)) :*: S1 ('MetaSel ('Just "asdigitgroups") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe DigitGroupStyle))))))

data BalanceAssertion #

Constructors

BalanceAssertion 

Fields

Instances

Instances details
Generic BalanceAssertion 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep BalanceAssertion :: Type -> Type

Show BalanceAssertion 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> BalanceAssertion -> ShowS

show :: BalanceAssertion -> String

showList :: [BalanceAssertion] -> ShowS

Eq BalanceAssertion 
Instance details

Defined in Hledger.Data.Types

type Rep BalanceAssertion 
Instance details

Defined in Hledger.Data.Types

type Rep BalanceAssertion = D1 ('MetaData "BalanceAssertion" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "BalanceAssertion" 'PrefixI 'True) ((S1 ('MetaSel ('Just "baamount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Amount) :*: S1 ('MetaSel ('Just "batotal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "bainclusive") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "baposition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourcePos))))

data Commodity #

Instances

Instances details
Generic Commodity 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep Commodity :: Type -> Type

Methods

from :: Commodity -> Rep Commodity x

to :: Rep Commodity x -> Commodity

Show Commodity 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> Commodity -> ShowS

show :: Commodity -> String

showList :: [Commodity] -> ShowS

Eq Commodity 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: Commodity -> Commodity -> Bool

(/=) :: Commodity -> Commodity -> Bool

type Rep Commodity 
Instance details

Defined in Hledger.Data.Types

type Rep Commodity = D1 ('MetaData "Commodity" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "Commodity" 'PrefixI 'True) (S1 ('MetaSel ('Just "csymbol") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CommoditySymbol) :*: S1 ('MetaSel ('Just "cformat") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe AmountStyle))))

data DateSpan #

Constructors

DateSpan (Maybe EFDay) (Maybe EFDay) 

Instances

Instances details
Generic DateSpan 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep DateSpan :: Type -> Type

Methods

from :: DateSpan -> Rep DateSpan x

to :: Rep DateSpan x -> DateSpan

Default DateSpan 
Instance details

Defined in Hledger.Data.Types

Methods

def :: DateSpan

Eq DateSpan 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: DateSpan -> DateSpan -> Bool

(/=) :: DateSpan -> DateSpan -> Bool

Ord DateSpan 
Instance details

Defined in Hledger.Data.Types

Methods

compare :: DateSpan -> DateSpan -> Ordering #

(<) :: DateSpan -> DateSpan -> Bool #

(<=) :: DateSpan -> DateSpan -> Bool #

(>) :: DateSpan -> DateSpan -> Bool #

(>=) :: DateSpan -> DateSpan -> Bool #

max :: DateSpan -> DateSpan -> DateSpan #

min :: DateSpan -> DateSpan -> DateSpan #

type Rep DateSpan 
Instance details

Defined in Hledger.Data.Types

type Rep DateSpan = D1 ('MetaData "DateSpan" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "DateSpan" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe EFDay)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe EFDay))))

type DateTag = (TagName, Day) #

type DayOfMonth = Int #

class Ord p => DayPeriod p where #

Methods

periodFirstDay :: p -> Day #

periodLastDay :: p -> Day #

dayPeriod :: Day -> p #

Instances

Instances details
DayPeriod Day 
Instance details

Defined in Data.Time.Calendar.Days

data DigitGroupStyle #

Constructors

DigitGroups !Char ![Word8] 

Instances

Instances details
Generic DigitGroupStyle 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep DigitGroupStyle :: Type -> Type

Read DigitGroupStyle 
Instance details

Defined in Hledger.Data.Types

Show DigitGroupStyle 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> DigitGroupStyle -> ShowS

show :: DigitGroupStyle -> String

showList :: [DigitGroupStyle] -> ShowS

Eq DigitGroupStyle 
Instance details

Defined in Hledger.Data.Types

Ord DigitGroupStyle 
Instance details

Defined in Hledger.Data.Types

type Rep DigitGroupStyle 
Instance details

Defined in Hledger.Data.Types

type Rep DigitGroupStyle = D1 ('MetaData "DigitGroupStyle" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" '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])))

data EFDay #

Constructors

Exact Day 
Flex Day 

Instances

Instances details
Generic EFDay 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep EFDay :: Type -> Type

Methods

from :: EFDay -> Rep EFDay x

to :: Rep EFDay x -> EFDay

Show EFDay 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> EFDay -> ShowS

show :: EFDay -> String

showList :: [EFDay] -> ShowS

Eq EFDay 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: EFDay -> EFDay -> Bool

(/=) :: EFDay -> EFDay -> Bool

Ord EFDay 
Instance details

Defined in Hledger.Data.Types

Methods

compare :: EFDay -> EFDay -> Ordering #

(<) :: EFDay -> EFDay -> Bool #

(<=) :: EFDay -> EFDay -> Bool #

(>) :: EFDay -> EFDay -> Bool #

(>=) :: EFDay -> EFDay -> Bool #

max :: EFDay -> EFDay -> EFDay #

min :: EFDay -> EFDay -> EFDay #

type Rep EFDay 
Instance details

Defined in Hledger.Data.Types

type Rep EFDay = D1 ('MetaData "EFDay" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "Exact" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day)) :+: C1 ('MetaCons "Flex" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day)))

data Interval #

Constructors

NoInterval 
Days Int 
Weeks Int 
Months Int 
Quarters Int 
Years Int 
DayOfMonth Int 
WeekdayOfMonth Int Int 
DaysOfWeek [Int] 
DayOfYear Int Int 

Instances

Instances details
Generic Interval 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep Interval :: Type -> Type

Methods

from :: Interval -> Rep Interval x

to :: Rep Interval x -> Interval

Show Interval 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> Interval -> ShowS

show :: Interval -> String

showList :: [Interval] -> ShowS

Default Interval 
Instance details

Defined in Hledger.Data.Types

Methods

def :: Interval

Eq Interval 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: Interval -> Interval -> Bool

(/=) :: Interval -> Interval -> Bool

Ord Interval 
Instance details

Defined in Hledger.Data.Types

Methods

compare :: Interval -> Interval -> Ordering #

(<) :: Interval -> Interval -> Bool #

(<=) :: Interval -> Interval -> Bool #

(>) :: Interval -> Interval -> Bool #

(>=) :: Interval -> Interval -> Bool #

max :: Interval -> Interval -> Interval #

min :: Interval -> Interval -> Interval #

type Rep Interval 
Instance details

Defined in Hledger.Data.Types

type Rep Interval = D1 ('MetaData "Interval" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (((C1 ('MetaCons "NoInterval" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Days" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :+: (C1 ('MetaCons "Weeks" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :+: (C1 ('MetaCons "Months" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :+: C1 ('MetaCons "Quarters" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))))) :+: ((C1 ('MetaCons "Years" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :+: C1 ('MetaCons "DayOfMonth" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :+: (C1 ('MetaCons "WeekdayOfMonth" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :+: (C1 ('MetaCons "DaysOfWeek" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Int])) :+: C1 ('MetaCons "DayOfYear" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))))))

data Ledger #

Constructors

Ledger 

Instances

Instances details
Generic Ledger 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep Ledger :: Type -> Type

Methods

from :: Ledger -> Rep Ledger x

to :: Rep Ledger x -> Ledger

type Rep Ledger 
Instance details

Defined in Hledger.Data.Types

type Rep Ledger = D1 ('MetaData "Ledger" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "Ledger" 'PrefixI 'True) (S1 ('MetaSel ('Just "ljournal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Journal) :*: S1 ('MetaSel ('Just "laccounts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Account])))

data MarketPrice #

Instances

Instances details
Generic MarketPrice 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep MarketPrice :: Type -> Type

Methods

from :: MarketPrice -> Rep MarketPrice x

to :: Rep MarketPrice x -> MarketPrice

Show MarketPrice 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> MarketPrice -> ShowS

show :: MarketPrice -> String

showList :: [MarketPrice] -> ShowS

Eq MarketPrice 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: MarketPrice -> MarketPrice -> Bool

(/=) :: MarketPrice -> MarketPrice -> Bool

Ord MarketPrice 
Instance details

Defined in Hledger.Data.Types

type Rep MarketPrice 
Instance details

Defined in Hledger.Data.Types

type Rep MarketPrice = D1 ('MetaData "MarketPrice" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "MarketPrice" 'PrefixI 'True) ((S1 ('MetaSel ('Just "mpdate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day) :*: S1 ('MetaSel ('Just "mpfrom") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CommoditySymbol)) :*: (S1 ('MetaSel ('Just "mpto") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CommoditySymbol) :*: S1 ('MetaSel ('Just "mprate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Quantity))))

data MixedAmount #

Instances

Instances details
Generic MixedAmount 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep MixedAmount :: Type -> Type

Methods

from :: MixedAmount -> Rep MixedAmount x

to :: Rep MixedAmount x -> MixedAmount

Show MixedAmount 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> MixedAmount -> ShowS

show :: MixedAmount -> String

showList :: [MixedAmount] -> ShowS

Eq MixedAmount 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: MixedAmount -> MixedAmount -> Bool

(/=) :: MixedAmount -> MixedAmount -> Bool

Ord MixedAmount 
Instance details

Defined in Hledger.Data.Types

type Rep MixedAmount 
Instance details

Defined in Hledger.Data.Types

type Rep MixedAmount = D1 ('MetaData "MixedAmount" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'True) (C1 ('MetaCons "Mixed" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map MixedAmountKey Amount))))

type Month = Int #

type MonthDay = Int #

type MonthWeek = Int #

data NormalSign #

Instances

Instances details
Show NormalSign 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> NormalSign -> ShowS

show :: NormalSign -> String

showList :: [NormalSign] -> ShowS

Eq NormalSign 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: NormalSign -> NormalSign -> Bool

(/=) :: NormalSign -> NormalSign -> Bool

type Payee = Text #

data PayeeDeclarationInfo #

Constructors

PayeeDeclarationInfo 

Fields

Instances

Instances details
Generic PayeeDeclarationInfo 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep PayeeDeclarationInfo :: Type -> Type

Show PayeeDeclarationInfo 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> PayeeDeclarationInfo -> ShowS

show :: PayeeDeclarationInfo -> String

showList :: [PayeeDeclarationInfo] -> ShowS

Eq PayeeDeclarationInfo 
Instance details

Defined in Hledger.Data.Types

type Rep PayeeDeclarationInfo 
Instance details

Defined in Hledger.Data.Types

type Rep PayeeDeclarationInfo = D1 ('MetaData "PayeeDeclarationInfo" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "PayeeDeclarationInfo" 'PrefixI 'True) (S1 ('MetaSel ('Just "pdicomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "pditags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Tag])))

data Period #

Instances

Instances details
Generic Period 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep Period :: Type -> Type

Methods

from :: Period -> Rep Period x

to :: Rep Period x -> Period

Show Period 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> Period -> ShowS

show :: Period -> String

showList :: [Period] -> ShowS

Default Period 
Instance details

Defined in Hledger.Data.Types

Methods

def :: Period

Eq Period 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: Period -> Period -> Bool

(/=) :: Period -> Period -> Bool

Ord Period 
Instance details

Defined in Hledger.Data.Types

Methods

compare :: Period -> Period -> Ordering #

(<) :: Period -> Period -> Bool #

(<=) :: Period -> Period -> Bool #

(>) :: Period -> Period -> Bool #

(>=) :: Period -> Period -> Bool #

max :: Period -> Period -> Period #

min :: Period -> Period -> Period #

type Rep Period 
Instance details

Defined in Hledger.Data.Types

type Rep Period = D1 ('MetaData "Period" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (((C1 ('MetaCons "DayPeriod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day)) :+: C1 ('MetaCons "WeekPeriod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day))) :+: (C1 ('MetaCons "MonthPeriod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Year) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Month)) :+: C1 ('MetaCons "QuarterPeriod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Year) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Quarter)))) :+: ((C1 ('MetaCons "YearPeriod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Year)) :+: C1 ('MetaCons "PeriodBetween" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day))) :+: (C1 ('MetaCons "PeriodFrom" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day)) :+: (C1 ('MetaCons "PeriodTo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day)) :+: C1 ('MetaCons "PeriodAll" 'PrefixI 'False) (U1 :: Type -> Type)))))

data PeriodicTransaction #

Instances

Instances details
Generic PeriodicTransaction 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep PeriodicTransaction :: Type -> Type

Eq PeriodicTransaction 
Instance details

Defined in Hledger.Data.Types

type Rep PeriodicTransaction 
Instance details

Defined in Hledger.Data.Types

type Rep PeriodicTransaction = D1 ('MetaData "PeriodicTransaction" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "PeriodicTransaction" 'PrefixI 'True) (((S1 ('MetaSel ('Just "ptperiodexpr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "ptinterval") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Interval)) :*: (S1 ('MetaSel ('Just "ptspan") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DateSpan) :*: (S1 ('MetaSel ('Just "ptsourcepos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SourcePos, SourcePos)) :*: S1 ('MetaSel ('Just "ptstatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Status)))) :*: ((S1 ('MetaSel ('Just "ptcode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "ptdescription") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "ptcomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "pttags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Tag]) :*: S1 ('MetaSel ('Just "ptpostings") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Posting]))))))

data PostingType #

Instances

Instances details
Generic PostingType 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep PostingType :: Type -> Type

Methods

from :: PostingType -> Rep PostingType x

to :: Rep PostingType x -> PostingType

Show PostingType 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> PostingType -> ShowS

show :: PostingType -> String

showList :: [PostingType] -> ShowS

Eq PostingType 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: PostingType -> PostingType -> Bool

(/=) :: PostingType -> PostingType -> Bool

type Rep PostingType 
Instance details

Defined in Hledger.Data.Types

type Rep PostingType = D1 ('MetaData "PostingType" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "RegularPosting" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "VirtualPosting" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BalancedVirtualPosting" 'PrefixI 'False) (U1 :: Type -> Type)))

data PriceDirective #

Instances

Instances details
Generic PriceDirective 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep PriceDirective :: Type -> Type

Show PriceDirective 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> PriceDirective -> ShowS

show :: PriceDirective -> String

showList :: [PriceDirective] -> ShowS

Eq PriceDirective 
Instance details

Defined in Hledger.Data.Types

Ord PriceDirective 
Instance details

Defined in Hledger.Data.Types

type Rep PriceDirective 
Instance details

Defined in Hledger.Data.Types

type Rep PriceDirective = D1 ('MetaData "PriceDirective" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "PriceDirective" 'PrefixI 'True) (S1 ('MetaSel ('Just "pddate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Day) :*: (S1 ('MetaSel ('Just "pdcommodity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CommoditySymbol) :*: S1 ('MetaSel ('Just "pdamount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Amount))))

type Quantity = Decimal #

type Quarter = Int #

data Side #

Constructors

L 
R 

Instances

Instances details
Generic Side 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep Side :: Type -> Type

Methods

from :: Side -> Rep Side x

to :: Rep Side x -> Side

Read Side 
Instance details

Defined in Hledger.Data.Types

Methods

readsPrec :: Int -> ReadS Side

readList :: ReadS [Side]

readPrec :: ReadPrec Side

readListPrec :: ReadPrec [Side]

Show Side 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> Side -> ShowS

show :: Side -> String

showList :: [Side] -> ShowS

Eq Side 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: Side -> Side -> Bool

(/=) :: Side -> Side -> Bool

Ord Side 
Instance details

Defined in Hledger.Data.Types

Methods

compare :: Side -> Side -> Ordering #

(<) :: Side -> Side -> Bool #

(<=) :: Side -> Side -> Bool #

(>) :: Side -> Side -> Bool #

(>=) :: Side -> Side -> Bool #

max :: Side -> Side -> Side #

min :: Side -> Side -> Side #

type Rep Side 
Instance details

Defined in Hledger.Data.Types

type Rep Side = D1 ('MetaData "Side" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "L" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "R" 'PrefixI 'False) (U1 :: Type -> Type))

data SmartDate #

Instances

Instances details
Show SmartDate 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> SmartDate -> ShowS

show :: SmartDate -> String

showList :: [SmartDate] -> ShowS

data SmartInterval #

Constructors

Day 
Week 
Month 
Quarter 
Year 

Instances

Instances details
Show SmartInterval 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> SmartInterval -> ShowS

show :: SmartInterval -> String

showList :: [SmartInterval] -> ShowS

data Status #

Constructors

Unmarked 
Pending 
Cleared 

Instances

Instances details
Bounded Status 
Instance details

Defined in Hledger.Data.Types

Enum Status 
Instance details

Defined in Hledger.Data.Types

Generic Status 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep Status :: Type -> Type

Methods

from :: Status -> Rep Status x

to :: Rep Status x -> Status

Show Status 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> Status -> ShowS

show :: Status -> String

showList :: [Status] -> ShowS

Eq Status 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: Status -> Status -> Bool

(/=) :: Status -> Status -> Bool

Ord Status 
Instance details

Defined in Hledger.Data.Types

Methods

compare :: Status -> Status -> Ordering #

(<) :: Status -> Status -> Bool #

(<=) :: Status -> Status -> Bool #

(>) :: Status -> Status -> Bool #

(>=) :: Status -> Status -> Bool #

max :: Status -> Status -> Status #

min :: Status -> Status -> Status #

type Rep Status 
Instance details

Defined in Hledger.Data.Types

type Rep Status = D1 ('MetaData "Status" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "Unmarked" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Pending" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Cleared" 'PrefixI 'False) (U1 :: Type -> Type)))

type StorageFormat = String #

data TMPostingRule #

Constructors

TMPostingRule 

Instances

Instances details
Generic TMPostingRule 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep TMPostingRule :: Type -> Type

Show TMPostingRule 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> TMPostingRule -> ShowS

show :: TMPostingRule -> String

showList :: [TMPostingRule] -> ShowS

Eq TMPostingRule 
Instance details

Defined in Hledger.Data.Types

type Rep TMPostingRule 
Instance details

Defined in Hledger.Data.Types

type Rep TMPostingRule = D1 ('MetaData "TMPostingRule" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "TMPostingRule" 'PrefixI 'True) (S1 ('MetaSel ('Just "tmprPosting") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Posting) :*: S1 ('MetaSel ('Just "tmprIsMultiplier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))

type Tag = (TagName, TagValue) #

newtype TagDeclarationInfo #

Constructors

TagDeclarationInfo 

Fields

Instances

Instances details
Generic TagDeclarationInfo 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep TagDeclarationInfo :: Type -> Type

Show TagDeclarationInfo 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> TagDeclarationInfo -> ShowS

show :: TagDeclarationInfo -> String

showList :: [TagDeclarationInfo] -> ShowS

Eq TagDeclarationInfo 
Instance details

Defined in Hledger.Data.Types

type Rep TagDeclarationInfo 
Instance details

Defined in Hledger.Data.Types

type Rep TagDeclarationInfo = D1 ('MetaData "TagDeclarationInfo" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'True) (C1 ('MetaCons "TagDeclarationInfo" 'PrefixI 'True) (S1 ('MetaSel ('Just "tdicomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

type TagName = Text #

type TagValue = Text #

data TimeclockCode #

Instances

Instances details
Generic TimeclockCode 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep TimeclockCode :: Type -> Type

Eq TimeclockCode 
Instance details

Defined in Hledger.Data.Types

Ord TimeclockCode 
Instance details

Defined in Hledger.Data.Types

type Rep TimeclockCode 
Instance details

Defined in Hledger.Data.Types

type Rep TimeclockCode = D1 ('MetaData "TimeclockCode" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" '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 #

Instances

Instances details
Generic TimeclockEntry 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep TimeclockEntry :: Type -> Type

Eq TimeclockEntry 
Instance details

Defined in Hledger.Data.Types

Ord TimeclockEntry 
Instance details

Defined in Hledger.Data.Types

type Rep TimeclockEntry 
Instance details

Defined in Hledger.Data.Types

type Rep TimeclockEntry = D1 ('MetaData "TimeclockEntry" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "TimeclockEntry" 'PrefixI 'True) ((S1 ('MetaSel ('Just "tlsourcepos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourcePos) :*: (S1 ('MetaSel ('Just "tlcode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TimeclockCode) :*: S1 ('MetaSel ('Just "tldatetime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LocalTime))) :*: ((S1 ('MetaSel ('Just "tlaccount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AccountName) :*: S1 ('MetaSel ('Just "tldescription") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "tlcomment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "tltags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Tag])))))

data TransactionModifier #

Instances

Instances details
Generic TransactionModifier 
Instance details

Defined in Hledger.Data.Types

Associated Types

type Rep TransactionModifier :: Type -> Type

Show TransactionModifier 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> TransactionModifier -> ShowS

show :: TransactionModifier -> String

showList :: [TransactionModifier] -> ShowS

Eq TransactionModifier 
Instance details

Defined in Hledger.Data.Types

type Rep TransactionModifier 
Instance details

Defined in Hledger.Data.Types

type Rep TransactionModifier = D1 ('MetaData "TransactionModifier" "Hledger.Data.Types" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" 'False) (C1 ('MetaCons "TransactionModifier" 'PrefixI 'True) (S1 ('MetaSel ('Just "tmquerytxt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "tmpostingrules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TMPostingRule])))

type WeekDay = Int #

data WhichDate #

Constructors

PrimaryDate 
SecondaryDate 

Instances

Instances details
Show WhichDate 
Instance details

Defined in Hledger.Data.Types

Methods

showsPrec :: Int -> WhichDate -> ShowS

show :: WhichDate -> String

showList :: [WhichDate] -> ShowS

Eq WhichDate 
Instance details

Defined in Hledger.Data.Types

Methods

(==) :: WhichDate -> WhichDate -> Bool

(/=) :: WhichDate -> WhichDate -> Bool

type Year = Integer #

type YearDay = Int #

type YearWeek = Int #

data ConversionOp #

Constructors

NoConversionOp 
ToCost 

Instances

Instances details
Show ConversionOp 
Instance details

Defined in Hledger.Data.Valuation

Methods

showsPrec :: Int -> ConversionOp -> ShowS

show :: ConversionOp -> String

showList :: [ConversionOp] -> ShowS

Eq ConversionOp 
Instance details

Defined in Hledger.Data.Valuation

Methods

(==) :: ConversionOp -> ConversionOp -> Bool

(/=) :: ConversionOp -> ConversionOp -> Bool

data ValuationType #

Instances

Instances details
Show ValuationType 
Instance details

Defined in Hledger.Data.Valuation

Methods

showsPrec :: Int -> ValuationType -> ShowS

show :: ValuationType -> String

showList :: [ValuationType] -> ShowS

Eq ValuationType 
Instance details

Defined in Hledger.Data.Valuation

data TestTree #

data Complete #

Constructors

CompleteValue String 
CompleteFile String FilePath 
CompleteDir String FilePath 

Instances

Instances details
Show Complete 
Instance details

Defined in System.Console.CmdArgs.Explicit.Complete

Methods

showsPrec :: Int -> Complete -> ShowS

show :: Complete -> String

showList :: [Complete] -> ShowS

Eq Complete 
Instance details

Defined in System.Console.CmdArgs.Explicit.Complete

Methods

(==) :: Complete -> Complete -> Bool

(/=) :: Complete -> Complete -> Bool

Ord Complete 
Instance details

Defined in System.Console.CmdArgs.Explicit.Complete

Methods

compare :: Complete -> Complete -> Ordering #

(<) :: Complete -> Complete -> Bool #

(<=) :: Complete -> Complete -> Bool #

(>) :: Complete -> Complete -> Bool #

(>=) :: Complete -> Complete -> Bool #

max :: Complete -> Complete -> Complete #

min :: Complete -> Complete -> Complete #

newtype Down a #

Constructors

Down 

Fields

Instances

Instances details
Foldable Down 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Down m -> m

foldMap :: Monoid m => (a -> m) -> Down a -> m

foldMap' :: Monoid m => (a -> m) -> Down a -> m

foldr :: (a -> b -> b) -> b -> Down a -> b #

foldr' :: (a -> b -> b) -> b -> Down a -> b

foldl :: (b -> a -> b) -> b -> Down a -> b #

foldl' :: (b -> a -> b) -> b -> Down a -> b #

foldr1 :: (a -> a -> a) -> Down a -> a #

foldl1 :: (a -> a -> a) -> Down a -> a #

toList :: Down a -> [a]

null :: Down a -> Bool #

length :: Down a -> Int #

elem :: Eq a => a -> Down a -> Bool #

maximum :: Ord a => Down a -> a #

minimum :: Ord a => Down a -> a #

sum :: Num a => Down a -> a #

product :: Num a => Down a -> a #

Traversable Down 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Down a -> f (Down b)

sequenceA :: Applicative f => Down (f a) -> f (Down a)

mapM :: Monad m => (a -> m b) -> Down a -> m (Down b) #

sequence :: Monad m => Down (m a) -> m (Down a) #

Applicative Down 
Instance details

Defined in Data.Ord

Methods

pure :: a -> Down a #

(<*>) :: Down (a -> b) -> Down a -> Down b #

liftA2 :: (a -> b -> c) -> Down a -> Down b -> Down c #

(*>) :: Down a -> Down b -> Down b #

(<*) :: Down a -> Down b -> Down a #

Functor Down 
Instance details

Defined in Data.Ord

Methods

fmap :: (a -> b) -> Down a -> Down b #

(<$) :: a -> Down b -> Down a #

Monad Down 
Instance details

Defined in Data.Ord

Methods

(>>=) :: Down a -> (a -> Down b) -> Down b #

(>>) :: Down a -> Down b -> Down b #

return :: a -> Down a #

NFData1 Down 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Down a -> ()

Generic1 Down 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Down :: k -> Type

Methods

from1 :: forall (a :: k). Down a -> Rep1 Down a

to1 :: forall (a :: k). Rep1 Down a -> Down a

Unbox a => Vector Vector (Down a) 
Instance details

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 ()

elemseq :: Vector (Down a) -> Down a -> b -> b

Unbox a => MVector MVector (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Down a) -> Int

basicUnsafeSlice :: Int -> Int -> MVector s (Down a) -> MVector s (Down a)

basicOverlaps :: MVector s (Down a) -> MVector s (Down a) -> Bool

basicUnsafeNew :: Int -> ST s (MVector s (Down a))

basicInitialize :: MVector s (Down a) -> ST s ()

basicUnsafeReplicate :: Int -> Down a -> ST s (MVector s (Down a))

basicUnsafeRead :: MVector s (Down a) -> Int -> ST s (Down a)

basicUnsafeWrite :: MVector s (Down a) -> Int -> Down a -> ST s ()

basicClear :: MVector s (Down a) -> ST s ()

basicSet :: MVector s (Down a) -> Down a -> ST s ()

basicUnsafeCopy :: MVector s (Down a) -> MVector s (Down a) -> ST s ()

basicUnsafeMove :: MVector s (Down a) -> MVector s (Down a) -> ST s ()

basicUnsafeGrow :: MVector s (Down a) -> Int -> ST s (MVector s (Down a))

Data a => Data (Down a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Down a -> c (Down a)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Down a)

toConstr :: Down a -> Constr

dataTypeOf :: Down a -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Down a))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Down a))

gmapT :: (forall b. Data b => b -> b) -> Down a -> Down a

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Down a -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Down a -> r

gmapQ :: (forall d. Data d => d -> u) -> Down a -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Down a -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Down a -> m (Down a)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Down a -> m (Down a)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Down a -> m (Down a)

Storable a => Storable (Down a) 
Instance details

Defined in Data.Ord

Methods

sizeOf :: Down a -> Int

alignment :: Down a -> Int

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 ()

peek :: Ptr (Down a) -> IO (Down a)

poke :: Ptr (Down a) -> Down a -> IO ()

Monoid a => Monoid (Down a) 
Instance details

Defined in Data.Ord

Methods

mempty :: Down a

mappend :: Down a -> Down a -> Down a

mconcat :: [Down a] -> Down a

Semigroup a => Semigroup (Down a) 
Instance details

Defined in Data.Ord

Methods

(<>) :: Down a -> Down a -> Down a

sconcat :: NonEmpty (Down a) -> Down a

stimes :: Integral b => b -> Down a -> Down a

Bits a => Bits (Down a) 
Instance details

Defined in Data.Ord

Methods

(.&.) :: Down a -> Down a -> Down a

(.|.) :: Down a -> Down a -> Down a

xor :: Down a -> Down a -> Down a

complement :: Down a -> Down a

shift :: Down a -> Int -> Down a

rotate :: Down a -> Int -> Down a

zeroBits :: Down a

bit :: 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

bitSize :: Down a -> Int

isSigned :: Down a -> Bool

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

rotateR :: Down a -> Int -> Down a

popCount :: Down a -> Int

FiniteBits a => FiniteBits (Down a) 
Instance details

Defined in Data.Ord

Methods

finiteBitSize :: Down a -> Int

countLeadingZeros :: Down a -> Int

countTrailingZeros :: Down a -> Int

Bounded a => Bounded (Down a) 
Instance details

Defined in Data.Ord

Methods

minBound :: Down a

maxBound :: Down a

Floating a => Floating (Down a) 
Instance details

Defined in Data.Ord

Methods

pi :: Down a

exp :: Down a -> Down a

log :: Down a -> Down a

sqrt :: Down a -> Down a

(**) :: Down a -> Down a -> Down a

logBase :: Down a -> Down a -> Down a

sin :: Down a -> Down a

cos :: Down a -> Down a

tan :: Down a -> Down a

asin :: Down a -> Down a

acos :: Down a -> Down a

atan :: Down a -> Down a

sinh :: Down a -> Down a

cosh :: Down a -> Down a

tanh :: Down a -> Down a

asinh :: Down a -> Down a

acosh :: Down a -> Down a

atanh :: Down a -> Down a

log1p :: Down a -> Down a

expm1 :: Down a -> Down a

log1pexp :: Down a -> Down a

log1mexp :: Down a -> Down a

RealFloat a => RealFloat (Down a) 
Instance details

Defined in Data.Ord

Methods

floatRadix :: Down a -> Integer

floatDigits :: Down a -> Int

floatRange :: Down a -> (Int, Int)

decodeFloat :: Down a -> (Integer, Int)

encodeFloat :: Integer -> Int -> Down a

exponent :: Down a -> Int

significand :: Down a -> Down a

scaleFloat :: Int -> Down a -> Down a

isNaN :: Down a -> Bool

isInfinite :: Down a -> Bool

isDenormalized :: Down a -> Bool

isNegativeZero :: Down a -> Bool

isIEEE :: Down a -> Bool

atan2 :: Down a -> Down a -> Down a

Generic (Down a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Down a) :: Type -> Type

Methods

from :: Down a -> Rep (Down a) x

to :: Rep (Down a) x -> Down a

Ix a => Ix (Down a) 
Instance details

Defined in Data.Ord

Methods

range :: (Down a, Down a) -> [Down a]

index :: (Down a, Down a) -> Down a -> Int

unsafeIndex :: (Down a, Down a) -> Down a -> Int

inRange :: (Down a, Down a) -> Down a -> Bool

rangeSize :: (Down a, Down a) -> Int

unsafeRangeSize :: (Down a, Down a) -> Int

Num a => Num (Down a) 
Instance details

Defined in Data.Ord

Methods

(+) :: Down a -> Down a -> Down a

(-) :: Down a -> Down a -> Down a

(*) :: Down a -> Down a -> Down a

negate :: Down a -> Down a

abs :: Down a -> Down a

signum :: Down a -> Down a

fromInteger :: Integer -> Down a

Read a => Read (Down a) 
Instance details

Defined in Data.Ord

Methods

readsPrec :: Int -> ReadS (Down a)

readList :: ReadS [Down a]

readPrec :: ReadPrec (Down a)

readListPrec :: ReadPrec [Down a]

Fractional a => Fractional (Down a) 
Instance details

Defined in Data.Ord

Methods

(/) :: Down a -> Down a -> Down a

recip :: Down a -> Down a

fromRational :: Rational -> Down a

Real a => Real (Down a) 
Instance details

Defined in Data.Ord

Methods

toRational :: Down a -> Rational

RealFrac a => RealFrac (Down a) 
Instance details

Defined in Data.Ord

Methods

properFraction :: Integral b => Down a -> (b, Down a)

truncate :: Integral b => Down a -> b

round :: Integral b => Down a -> b

ceiling :: Integral b => Down a -> b

floor :: Integral b => Down a -> b

Show a => Show (Down a) 
Instance details

Defined in Data.Ord

Methods

showsPrec :: Int -> Down a -> ShowS

show :: Down a -> String

showList :: [Down a] -> ShowS

NFData a => NFData (Down a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Down a -> ()

Eq a => Eq (Down a) 
Instance details

Defined in Data.Ord

Methods

(==) :: Down a -> Down a -> Bool

(/=) :: Down a -> Down a -> Bool

Ord a => Ord (Down a) 
Instance details

Defined in Data.Ord

Methods

compare :: Down a -> Down a -> Ordering #

(<) :: Down a -> Down a -> Bool #

(<=) :: Down a -> Down a -> Bool #

(>) :: Down a -> Down a -> Bool #

(>=) :: Down a -> Down a -> Bool #

max :: Down a -> Down a -> Down a #

min :: Down a -> Down a -> Down a #

Unbox a => Unbox (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

type Rep1 Down 
Instance details

Defined in GHC.Generics

type Rep1 Down = D1 ('MetaData "Down" "Data.Ord" "base" 'True) (C1 ('MetaCons "Down" 'PrefixI 'True) (S1 ('MetaSel ('Just "getDown") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
newtype MVector s (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Down a) = MV_Down (MVector s a)
type Rep (Down a) 
Instance details

Defined in GHC.Generics

type Rep (Down a) = D1 ('MetaData "Down" "Data.Ord" "base" 'True) (C1 ('MetaCons "Down" 'PrefixI 'True) (S1 ('MetaSel ('Just "getDown") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
newtype Vector (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Down a) = V_Down (Vector a)

data Handle #

Instances

Instances details
Show Handle 
Instance details

Defined in GHC.IO.Handle.Types

Methods

showsPrec :: Int -> Handle -> ShowS

show :: Handle -> String

showList :: [Handle] -> ShowS

Eq Handle 
Instance details

Defined in GHC.IO.Handle.Types

Methods

(==) :: Handle -> Handle -> Bool

(/=) :: Handle -> Handle -> Bool

data TimeLocale #

Constructors

TimeLocale 

Fields

Instances

Instances details
Show TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Methods

showsPrec :: Int -> TimeLocale -> ShowS

show :: TimeLocale -> String

showList :: [TimeLocale] -> ShowS

Eq TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Methods

(==) :: TimeLocale -> TimeLocale -> Bool

(/=) :: TimeLocale -> TimeLocale -> Bool

Ord TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

data WideBuilder #

Constructors

WideBuilder 

Fields

Instances

Instances details
Monoid WideBuilder 
Instance details

Defined in Text.WideString

Semigroup WideBuilder 
Instance details

Defined in Text.WideString

Methods

(<>) :: WideBuilder -> WideBuilder -> WideBuilder

sconcat :: NonEmpty WideBuilder -> WideBuilder

stimes :: Integral b => b -> WideBuilder -> WideBuilder

Show WideBuilder 
Instance details

Defined in Text.WideString

Methods

showsPrec :: Int -> WideBuilder -> ShowS

show :: WideBuilder -> String

showList :: [WideBuilder] -> ShowS

type TextParser (m :: Type -> Type) a = ParsecT HledgerParseErrorData Text m a #

data HledgerParseErrorData #

Instances

Instances details
Show HledgerParseErrorData 
Instance details

Defined in Text.Megaparsec.Custom

Methods

showsPrec :: Int -> HledgerParseErrorData -> ShowS

show :: HledgerParseErrorData -> String

showList :: [HledgerParseErrorData] -> ShowS

Eq HledgerParseErrorData 
Instance details

Defined in Text.Megaparsec.Custom

Ord HledgerParseErrorData 
Instance details

Defined in Text.Megaparsec.Custom

ShowErrorComponent HledgerParseErrorData 
Instance details

Defined in Text.Megaparsec.Custom

Ord (ParseError Text HledgerParseErrorData) 
Instance details

Defined in Text.Megaparsec.Custom

Methods

compare :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Ordering #

(<) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool #

(<=) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool #

(>) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool #

(>=) :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> Bool #

max :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData #

min :: ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData -> ParseError Text HledgerParseErrorData #

data UTCTime #

Constructors

UTCTime 

Instances

Instances details
FromJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser UTCTime

parseJSONList :: Value -> Parser [UTCTime]

FromJSONKey UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction UTCTime

fromJSONKeyList :: FromJSONKeyFunction [UTCTime]

ToJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: UTCTime -> Value

toEncoding :: UTCTime -> Encoding

toJSONList :: [UTCTime] -> Value

toEncodingList :: [UTCTime] -> Encoding

ToJSONKey UTCTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction UTCTime

toJSONKeyList :: ToJSONKeyFunction [UTCTime]

Data UTCTime 
Instance details

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

toConstr :: UTCTime -> Constr

dataTypeOf :: UTCTime -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UTCTime)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UTCTime)

gmapT :: (forall b. Data b => b -> b) -> UTCTime -> UTCTime

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UTCTime -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UTCTime -> r

gmapQ :: (forall d. Data d => d -> u) -> UTCTime -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> UTCTime -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime

NFData UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

rnf :: UTCTime -> ()

Eq UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

(==) :: UTCTime -> UTCTime -> Bool

(/=) :: UTCTime -> UTCTime -> Bool

Ord UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

compare :: UTCTime -> UTCTime -> Ordering #

(<) :: UTCTime -> UTCTime -> Bool #

(<=) :: UTCTime -> UTCTime -> Bool #

(>) :: UTCTime -> UTCTime -> Bool #

(>=) :: UTCTime -> UTCTime -> Bool #

max :: UTCTime -> UTCTime -> UTCTime #

min :: UTCTime -> UTCTime -> UTCTime #

data SourcePos #

Constructors

SourcePos 

Fields

Instances

Instances details
Data SourcePos 
Instance details

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 
Instance details

Defined in Text.Megaparsec.Pos

Associated Types

type Rep SourcePos :: Type -> Type

Methods

from :: SourcePos -> Rep SourcePos x

to :: Rep SourcePos x -> SourcePos

Read SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

readsPrec :: Int -> ReadS SourcePos

readList :: ReadS [SourcePos]

readPrec :: ReadPrec SourcePos

readListPrec :: ReadPrec [SourcePos]

Show SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

showsPrec :: Int -> SourcePos -> ShowS

show :: SourcePos -> String

showList :: [SourcePos] -> ShowS

NFData SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

rnf :: SourcePos -> ()

Eq SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

(==) :: SourcePos -> SourcePos -> Bool

(/=) :: SourcePos -> SourcePos -> Bool

Ord SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

type Rep SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

type Rep SourcePos = D1 ('MetaData "SourcePos" "Text.Megaparsec.Pos" "megaparsec-9.3.1-ERDjI2v4kmMC2kpf7sry0n" '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))))

data ZonedTime #

Instances

Instances details
FromJSON ZonedTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser ZonedTime

parseJSONList :: Value -> Parser [ZonedTime]

FromJSONKey ZonedTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction ZonedTime

fromJSONKeyList :: FromJSONKeyFunction [ZonedTime]

ToJSON ZonedTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: ZonedTime -> Value

toEncoding :: ZonedTime -> Encoding

toJSONList :: [ZonedTime] -> Value

toEncodingList :: [ZonedTime] -> Encoding

ToJSONKey ZonedTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction ZonedTime

toJSONKeyList :: ToJSONKeyFunction [ZonedTime]

Data ZonedTime 
Instance details

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 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

showsPrec :: Int -> ZonedTime -> ShowS

show :: ZonedTime -> String

showList :: [ZonedTime] -> ShowS

NFData ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

rnf :: ZonedTime -> ()

data LocalTime #

Constructors

LocalTime 

Instances

Instances details
FromJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser LocalTime

parseJSONList :: Value -> Parser [LocalTime]

FromJSONKey LocalTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction LocalTime

fromJSONKeyList :: FromJSONKeyFunction [LocalTime]

ToJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: LocalTime -> Value

toEncoding :: LocalTime -> Encoding

toJSONList :: [LocalTime] -> Value

toEncodingList :: [LocalTime] -> Encoding

ToJSONKey LocalTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction LocalTime

toJSONKeyList :: ToJSONKeyFunction [LocalTime]

Data LocalTime 
Instance details

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 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

showsPrec :: Int -> LocalTime -> ShowS

show :: LocalTime -> String

showList :: [LocalTime] -> ShowS

NFData LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

rnf :: LocalTime -> ()

Eq LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

(==) :: LocalTime -> LocalTime -> Bool

(/=) :: LocalTime -> LocalTime -> Bool

Ord LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

class Monad m => MonadFail (m :: Type -> Type) where #

Methods

fail :: String -> m a #

Instances

Instances details
MonadFail IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> IResult a #

MonadFail Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> Parser a #

MonadFail Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> Result a #

MonadFail P 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fail :: String -> P a #

MonadFail ReadP 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fail :: String -> ReadP a #

MonadFail ReadPrec 
Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

fail :: String -> ReadPrec a #

MonadFail DList 
Instance details

Defined in Data.DList.Internal

Methods

fail :: String -> DList a #

MonadFail IO 
Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> IO a #

MonadFail Array 
Instance details

Defined in Data.Primitive.Array

Methods

fail :: String -> Array a #

MonadFail SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

fail :: String -> SmallArray a #

MonadFail Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

fail :: String -> Q a #

MonadFail Vector 
Instance details

Defined in Data.Vector

Methods

fail :: String -> Vector a #

MonadFail Maybe 
Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> Maybe a #

MonadFail [] 
Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> [a] #

MonadFail (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fail :: String -> Parser i a #

MonadFail m => MonadFail (InputT m) 
Instance details

Defined in System.Console.Haskeline.InputT

Methods

fail :: String -> InputT m a #

MonadFail m => MonadFail (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

fail :: String -> ResourceT m a #

Monad m => MonadFail (QuoteToQuasi m) 
Instance details

Defined in Language.Haskell.TH.Syntax.Compat

Methods

fail :: String -> QuoteToQuasi m a #

Monad m => MonadFail (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fail :: String -> MaybeT m a #

MonadFail m => MonadFail (StateT s m) 
Instance details

Defined in Lens.Micro

Methods

fail :: String -> StateT s m a #

(Monad m, Error e) => MonadFail (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

fail :: String -> ErrorT e m a #

MonadFail m => MonadFail (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fail :: String -> ExceptT e m a #

MonadFail m => MonadFail (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fail :: String -> ReaderT r m a #

MonadFail m => MonadFail (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

fail :: String -> StateT s m a #

MonadFail m => MonadFail (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fail :: String -> ConduitT i o m a #

Stream s => MonadFail (ParsecT e s m) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

fail :: String -> ParsecT e s m a #

data Query #

Instances

Instances details
Show Query 
Instance details

Defined in Hledger.Query

Methods

showsPrec :: Int -> Query -> ShowS

show :: Query -> String

showList :: [Query] -> ShowS

Default Query 
Instance details

Defined in Hledger.Query

Methods

def :: Query

Eq Query 
Instance details

Defined in Hledger.Query

Methods

(==) :: Query -> Query -> Bool

(/=) :: Query -> Query -> Bool

type RegexError = String #

data Regexp #

Instances

Instances details
ToJSON Regexp 
Instance details

Defined in Hledger.Utils.Regex

Methods

toJSON :: Regexp -> Value

toEncoding :: Regexp -> Encoding

toJSONList :: [Regexp] -> Value

toEncodingList :: [Regexp] -> Encoding

Read Regexp 
Instance details

Defined in Hledger.Utils.Regex

Methods

readsPrec :: Int -> ReadS Regexp

readList :: ReadS [Regexp]

readPrec :: ReadPrec Regexp

readListPrec :: ReadPrec [Regexp]

Show Regexp 
Instance details

Defined in Hledger.Utils.Regex

Methods

showsPrec :: Int -> Regexp -> ShowS

show :: Regexp -> String

showList :: [Regexp] -> ShowS

Eq Regexp 
Instance details

Defined in Hledger.Utils.Regex

Methods

(==) :: Regexp -> Regexp -> Bool

(/=) :: Regexp -> Regexp -> Bool

Ord Regexp 
Instance details

Defined in Hledger.Utils.Regex

Methods

compare :: Regexp -> Regexp -> Ordering #

(<) :: Regexp -> Regexp -> Bool #

(<=) :: Regexp -> Regexp -> Bool #

(>) :: Regexp -> Regexp -> Bool #

(>=) :: Regexp -> Regexp -> Bool #

max :: Regexp -> Regexp -> Regexp #

min :: Regexp -> Regexp -> Regexp #

RegexLike Regexp String 
Instance details

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 
Instance details

Defined in Hledger.Utils.Regex

Methods

match :: Regexp -> String -> String

matchM :: MonadFail m => Regexp -> String -> m String

type Replacement = String #

data TimeOfDay #

Constructors

TimeOfDay 

Fields

Instances

Instances details
FromJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser TimeOfDay

parseJSONList :: Value -> Parser [TimeOfDay]

FromJSONKey TimeOfDay 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction TimeOfDay

fromJSONKeyList :: FromJSONKeyFunction [TimeOfDay]

ToJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: TimeOfDay -> Value

toEncoding :: TimeOfDay -> Encoding

toJSONList :: [TimeOfDay] -> Value

toEncodingList :: [TimeOfDay] -> Encoding

ToJSONKey TimeOfDay 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction TimeOfDay

toJSONKeyList :: ToJSONKeyFunction [TimeOfDay]

Data TimeOfDay 
Instance details

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 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Methods

showsPrec :: Int -> TimeOfDay -> ShowS

show :: TimeOfDay -> String

showList :: [TimeOfDay] -> ShowS

NFData TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Methods

rnf :: TimeOfDay -> ()

Eq TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Methods

(==) :: TimeOfDay -> TimeOfDay -> Bool

(/=) :: TimeOfDay -> TimeOfDay -> Bool

Ord TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

newtype Const a (b :: k) #

Constructors

Const 

Fields

Instances

Instances details
Generic1 (Const a :: k -> Type) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep1 (Const a) :: k -> Type

Methods

from1 :: forall (a0 :: k0). Const a a0 -> Rep1 (Const a) a0

to1 :: forall (a0 :: k0). Rep1 (Const a) a0 -> Const a a0

Unbox a => Vector Vector (Const a b) 
Instance details

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 ()

elemseq :: Vector (Const a b) -> Const a b -> b0 -> b0

Unbox a => MVector MVector (Const a b) 
Instance details

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) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON2 :: (Value -> Parser a) -> (Value -> Parser [a]) -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser (Const a b)

liftParseJSONList2 :: (Value -> Parser a) -> (Value -> Parser [a]) -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser [Const a b]

ToJSON2 (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON2 :: (a -> Value) -> ([a] -> Value) -> (b -> Value) -> ([b] -> Value) -> Const a b -> Value

liftToJSONList2 :: (a -> Value) -> ([a] -> Value) -> (b -> Value) -> ([b] -> Value) -> [Const a b] -> Value

liftToEncoding2 :: (a -> Encoding) -> ([a] -> Encoding) -> (b -> Encoding) -> ([b] -> Encoding) -> Const a b -> Encoding

liftToEncodingList2 :: (a -> Encoding) -> ([a] -> Encoding) -> (b -> Encoding) -> ([b] -> Encoding) -> [Const a b] -> Encoding

Bifunctor (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Const a c -> Const b d

first :: (a -> b) -> Const a c -> Const b c

second :: (b -> c) -> Const a b -> Const a c

NFData2 (Const :: Type -> Type -> Type) 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> Const a b -> ()

Hashable2 (Const :: Type -> Type -> Type) 
Instance details

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) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser (Const a a0)

liftParseJSONList :: (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser [Const a a0]

ToJSON a => ToJSON1 (Const a :: Type -> Type) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a0 -> Value) -> ([a0] -> Value) -> Const a a0 -> Value

liftToJSONList :: (a0 -> Value) -> ([a0] -> Value) -> [Const a a0] -> Value

liftToEncoding :: (a0 -> Encoding) -> ([a0] -> Encoding) -> Const a a0 -> Encoding

liftToEncodingList :: (a0 -> Encoding) -> ([a0] -> Encoding) -> [Const a a0] -> Encoding

Foldable (Const m :: Type -> Type) 
Instance details

Defined in Data.Functor.Const

Methods

fold :: Monoid m0 => Const m m0 -> m0

foldMap :: Monoid m0 => (a -> m0) -> Const m a -> m0

foldMap' :: Monoid m0 => (a -> m0) -> Const m a -> m0

foldr :: (a -> b -> b) -> b -> Const m a -> b #

foldr' :: (a -> b -> b) -> b -> Const m a -> b

foldl :: (b -> a -> b) -> b -> Const m a -> b #

foldl' :: (b -> a -> b) -> b -> Const m a -> b #

foldr1 :: (a -> a -> a) -> Const m a -> a #

foldl1 :: (a -> a -> a) -> Const m a -> a #

toList :: Const m a -> [a]

null :: Const m a -> Bool #

length :: Const m a -> Int #

elem :: Eq a => a -> Const m a -> Bool #

maximum :: Ord a => Const m a -> a #

minimum :: Ord a => Const m a -> a #

sum :: Num a => Const m a -> a #

product :: Num a => Const m a -> a #

Traversable (Const m :: Type -> Type) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Const m a -> f (Const m b)

sequenceA :: Applicative f => Const m (f a) -> f (Const m a)

mapM :: Monad m0 => (a -> m0 b) -> Const m a -> m0 (Const m b) #

sequence :: Monad m0 => Const m (m0 a) -> m0 (Const m a) #

Monoid m => Applicative (Const m :: Type -> Type) 
Instance details

Defined in Data.Functor.Const

Methods

pure :: a -> Const m a #

(<*>) :: Const m (a -> b) -> Const m a -> Const m b #

liftA2 :: (a -> b -> c) -> Const m a -> Const m b -> Const m c #

(*>) :: Const m a -> Const m b -> Const m b #

(<*) :: Const m a -> Const m b -> Const m a #

Functor (Const m :: Type -> Type) 
Instance details

Defined in Data.Functor.Const

Methods

fmap :: (a -> b) -> Const m a -> Const m b #

(<$) :: a -> Const m b -> Const m a #

NFData a => NFData1 (Const a :: Type -> Type) 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a0 -> ()) -> Const a a0 -> ()

Hashable a => Hashable1 (Const a :: Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> Const a a0 -> Int

Reportable (Const r :: Type -> Type) e 
Instance details

Defined in Hledger.Reports.ReportOptions

Methods

report :: a -> Const r (Either e a) -> Const r a

FromJSON a => FromJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Const a b)

parseJSONList :: Value -> Parser [Const a b]

(FromJSON a, FromJSONKey a) => FromJSONKey (Const a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction (Const a b)

fromJSONKeyList :: FromJSONKeyFunction [Const a b]

ToJSON a => ToJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Const a b -> Value

toEncoding :: Const a b -> Encoding

toJSONList :: [Const a b] -> Value

toEncodingList :: [Const a b] -> Encoding

(ToJSON a, ToJSONKey a) => ToJSONKey (Const a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction (Const a b)

toJSONKeyList :: ToJSONKeyFunction [Const a b]

(Typeable k, Data a, Typeable b) => Data (Const a b) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Const a b -> c (Const a b)

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Const a b)

toConstr :: Const a b -> Constr

dataTypeOf :: Const a b -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Const a b))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Const a b))

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Const a b -> Const a b

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r

gmapQ :: (forall d. Data d => d -> u) -> Const a b -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Const a b -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b)

IsString a => IsString (Const a b) 
Instance details

Defined in Data.String

Methods

fromString :: String -> Const a b

Storable a => Storable (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

sizeOf :: Const a b -> Int

alignment :: Const a b -> Int

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 ()

peek :: Ptr (Const a b) -> IO (Const a b)

poke :: Ptr (Const a b) -> Const a b -> IO ()

Monoid a => Monoid (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

mempty :: Const a b

mappend :: Const a b -> Const a b -> Const a b

mconcat :: [Const a b] -> Const a b

Semigroup a => Semigroup (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

(<>) :: Const a b -> Const a b -> Const a b

sconcat :: NonEmpty (Const a b) -> Const a b

stimes :: Integral b0 => b0 -> Const a b -> Const a b

Bits a => Bits (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

(.&.) :: Const a b -> Const a b -> Const a b

(.|.) :: Const a b -> Const a b -> Const a b

xor :: Const a b -> Const a b -> Const a b

complement :: Const a b -> Const a b

shift :: Const a b -> Int -> Const a b

rotate :: Const a b -> Int -> Const a b

zeroBits :: Const a b

bit :: 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

bitSize :: Const a b -> Int

isSigned :: Const a b -> Bool

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

rotateR :: Const a b -> Int -> Const a b

popCount :: Const a b -> Int

FiniteBits a => FiniteBits (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

finiteBitSize :: Const a b -> Int

countLeadingZeros :: Const a b -> Int

countTrailingZeros :: Const a b -> Int

Bounded a => Bounded (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

minBound :: Const a b

maxBound :: Const a b

Enum a => Enum (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

succ :: Const a b -> Const a b

pred :: Const a b -> Const a b

toEnum :: Int -> Const a b

fromEnum :: Const a b -> Int

enumFrom :: Const a b -> [Const a b]

enumFromThen :: Const a b -> Const a b -> [Const a b]

enumFromTo :: Const a b -> Const a b -> [Const a b]

enumFromThenTo :: Const a b -> Const a b -> Const a b -> [Const a b]

Floating a => Floating (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

pi :: Const a b

exp :: Const a b -> Const a b

log :: Const a b -> Const a b

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

sin :: Const a b -> Const a b

cos :: Const a b -> Const a b

tan :: 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

log1pexp :: Const a b -> Const a b

log1mexp :: Const a b -> Const a b

RealFloat a => RealFloat (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

floatRadix :: Const a b -> Integer

floatDigits :: Const a b -> Int

floatRange :: Const a b -> (Int, Int)

decodeFloat :: Const a b -> (Integer, Int)

encodeFloat :: Integer -> Int -> Const a b

exponent :: Const a b -> Int

significand :: Const a b -> Const a b

scaleFloat :: Int -> Const a b -> Const a b

isNaN :: Const a b -> Bool

isInfinite :: Const a b -> Bool

isDenormalized :: Const a b -> Bool

isNegativeZero :: Const a b -> Bool

isIEEE :: Const a b -> Bool

atan2 :: Const a b -> Const a b -> Const a b

Generic (Const a b) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep (Const a b) :: Type -> Type

Methods

from :: Const a b -> Rep (Const a b) x

to :: Rep (Const a b) x -> Const a b

Ix a => Ix (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

range :: (Const a b, Const a b) -> [Const a b]

index :: (Const a b, Const a b) -> Const a b -> Int

unsafeIndex :: (Const a b, Const a b) -> Const a b -> Int

inRange :: (Const a b, Const a b) -> Const a b -> Bool

rangeSize :: (Const a b, Const a b) -> Int

unsafeRangeSize :: (Const a b, Const a b) -> Int

Num a => Num (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

(+) :: Const a b -> Const a b -> Const a b

(-) :: Const a b -> Const a b -> Const a b

(*) :: Const a b -> Const a b -> Const a b

negate :: Const a b -> Const a b

abs :: Const a b -> Const a b

signum :: Const a b -> Const a b

fromInteger :: Integer -> Const a b

Read a => Read (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

readsPrec :: Int -> ReadS (Const a b)

readList :: ReadS [Const a b]

readPrec :: ReadPrec (Const a b)

readListPrec :: ReadPrec [Const a b]

Fractional a => Fractional (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

(/) :: Const a b -> Const a b -> Const a b

recip :: Const a b -> Const a b

fromRational :: Rational -> Const a b

Integral a => Integral (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

quot :: Const a b -> Const a b -> Const a b

rem :: Const a b -> Const a b -> Const a b

div :: Const a b -> Const a b -> Const a b

mod :: Const a b -> Const a b -> Const a b

quotRem :: Const a b -> Const a b -> (Const a b, Const a b)

divMod :: Const a b -> Const a b -> (Const a b, Const a b)

toInteger :: Const a b -> Integer

Real a => Real (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

toRational :: Const a b -> Rational

RealFrac a => RealFrac (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

properFraction :: Integral b0 => Const a b -> (b0, Const a b)

truncate :: Integral b0 => Const a b -> b0

round :: Integral b0 => Const a b -> b0

ceiling :: Integral b0 => Const a b -> b0

floor :: Integral b0 => Const a b -> b0

Show a => Show (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

showsPrec :: Int -> Const a b -> ShowS

show :: Const a b -> String

showList :: [Const a b] -> ShowS

NFData a => NFData (Const a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Const a b -> ()

Eq a => Eq (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

(==) :: Const a b -> Const a b -> Bool

(/=) :: Const a b -> Const a b -> Bool

Ord a => Ord (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

compare :: Const a b -> Const a b -> Ordering #

(<) :: Const a b -> Const a b -> Bool #

(<=) :: Const a b -> Const a b -> Bool #

(>) :: Const a b -> Const a b -> Bool #

(>=) :: Const a b -> Const a b -> Bool #

max :: Const a b -> Const a b -> Const a b #

min :: Const a b -> Const a b -> Const a b #

Hashable a => Hashable (Const a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Const a b -> Int

hash :: Const a b -> Int

MonoFoldable (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m0 => (Element (Const m a) -> m0) -> Const m a -> m0

ofoldr :: (Element (Const m a) -> b -> b) -> b -> Const m a -> b

ofoldl' :: (a0 -> Element (Const m a) -> a0) -> a0 -> Const m a -> a0

otoList :: Const m a -> [Element (Const m a)]

oall :: (Element (Const m a) -> Bool) -> Const m a -> Bool

oany :: (Element (Const m a) -> Bool) -> Const m a -> Bool

onull :: Const m a -> Bool

olength :: Const m a -> Int

olength64 :: Const m a -> Int64

ocompareLength :: Integral i => Const m a -> i -> Ordering

otraverse_ :: Applicative f => (Element (Const m a) -> f b) -> Const m a -> f ()

ofor_ :: Applicative f => Const m a -> (Element (Const m a) -> f b) -> f ()

omapM_ :: Applicative m0 => (Element (Const m a) -> m0 ()) -> Const m a -> m0 ()

oforM_ :: Applicative m0 => Const m a -> (Element (Const m a) -> m0 ()) -> m0 ()

ofoldlM :: Monad m0 => (a0 -> Element (Const m a) -> m0 a0) -> a0 -> Const m a -> m0 a0

ofoldMap1Ex :: Semigroup m0 => (Element (Const m a) -> m0) -> Const m a -> m0

ofoldr1Ex :: (Element (Const m a) -> Element (Const m a) -> Element (Const m a)) -> Const m a -> Element (Const m a)

ofoldl1Ex' :: (Element (Const m a) -> Element (Const m a) -> Element (Const m a)) -> Const m a -> Element (Const m a)

headEx :: Const m a -> Element (Const m a)

lastEx :: Const m a -> Element (Const m a)

unsafeHead :: Const m a -> Element (Const m a)

unsafeLast :: Const m a -> Element (Const m a)

maximumByEx :: (Element (Const m a) -> Element (Const m a) -> Ordering) -> Const m a -> Element (Const m a)

minimumByEx :: (Element (Const m a) -> Element (Const m a) -> Ordering) -> Const m a -> Element (Const m a)

oelem :: Element (Const m a) -> Const m a -> Bool

onotElem :: Element (Const m a) -> Const m a -> Bool

MonoFunctor (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Const m a) -> Element (Const m a)) -> Const m a -> Const m a

Monoid m => MonoPointed (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Const m a) -> Const m a

MonoTraversable (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Const m a) -> f (Element (Const m a))) -> Const m a -> f (Const m a)

omapM :: Applicative m0 => (Element (Const m a) -> m0 (Element (Const m a))) -> Const m a -> m0 (Const m a)

Pretty a => Pretty (Const a b) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Const a b -> Doc ann

prettyList :: [Const a b] -> Doc ann

Unbox a => Unbox (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

type Rep1 (Const a :: k -> Type) 
Instance details

Defined in Data.Functor.Const

type Rep1 (Const a :: k -> Type) = D1 ('MetaData "Const" "Data.Functor.Const" "base" 'True) (C1 ('MetaCons "Const" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
newtype MVector s (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Const a b) = MV_Const (MVector s a)
type Rep (Const a b) 
Instance details

Defined in Data.Functor.Const

type Rep (Const a b) = D1 ('MetaData "Const" "Data.Functor.Const" "base" 'True) (C1 ('MetaCons "Const" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
type Element (Const m a) 
Instance details

Defined in Data.MonoTraversable

type Element (Const m a) = a
newtype Vector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Const a b) = V_Const (Vector a)

data CalendarDiffDays #

Constructors

CalendarDiffDays 

Fields

Instances

Instances details
FromJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser CalendarDiffDays

parseJSONList :: Value -> Parser [CalendarDiffDays]

ToJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data CalendarDiffDays 
Instance details

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

Monoid CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Semigroup CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Show CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Methods

showsPrec :: Int -> CalendarDiffDays -> ShowS

show :: CalendarDiffDays -> String

showList :: [CalendarDiffDays] -> ShowS

NFData CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Methods

rnf :: CalendarDiffDays -> ()

Eq CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

type MonthOfYear = Int #

data DiffTime #

Instances

Instances details
FromJSON DiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser DiffTime

parseJSONList :: Value -> Parser [DiffTime]

ToJSON DiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: DiffTime -> Value

toEncoding :: DiffTime -> Encoding

toJSONList :: [DiffTime] -> Value

toEncodingList :: [DiffTime] -> Encoding

Data DiffTime 
Instance details

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 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Num DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Read DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

readsPrec :: Int -> ReadS DiffTime

readList :: ReadS [DiffTime]

readPrec :: ReadPrec DiffTime

readListPrec :: ReadPrec [DiffTime]

Fractional DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Real DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

toRational :: DiffTime -> Rational

RealFrac DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

properFraction :: Integral b => DiffTime -> (b, DiffTime)

truncate :: Integral b => DiffTime -> b

round :: Integral b => DiffTime -> b

ceiling :: Integral b => DiffTime -> b

floor :: Integral b => DiffTime -> b

Show DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

showsPrec :: Int -> DiffTime -> ShowS

show :: DiffTime -> String

showList :: [DiffTime] -> ShowS

NFData DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

rnf :: DiffTime -> ()

Eq DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

(==) :: DiffTime -> DiffTime -> Bool

(/=) :: DiffTime -> DiffTime -> Bool

Ord DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

compare :: DiffTime -> DiffTime -> Ordering #

(<) :: DiffTime -> DiffTime -> Bool #

(<=) :: DiffTime -> DiffTime -> Bool #

(>) :: DiffTime -> DiffTime -> Bool #

(>=) :: DiffTime -> DiffTime -> Bool #

max :: DiffTime -> DiffTime -> DiffTime #

min :: DiffTime -> DiffTime -> DiffTime #

data DayOfWeek #

Instances

Instances details
FromJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser DayOfWeek

parseJSONList :: Value -> Parser [DayOfWeek]

FromJSONKey DayOfWeek 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction DayOfWeek

fromJSONKeyList :: FromJSONKeyFunction [DayOfWeek]

ToJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: DayOfWeek -> Value

toEncoding :: DayOfWeek -> Encoding

toJSONList :: [DayOfWeek] -> Value

toEncodingList :: [DayOfWeek] -> Encoding

ToJSONKey DayOfWeek 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction DayOfWeek

toJSONKeyList :: ToJSONKeyFunction [DayOfWeek]

Data DayOfWeek 
Instance details

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 
Instance details

Defined in Data.Time.Calendar.Week

Ix DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Read DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Methods

readsPrec :: Int -> ReadS DayOfWeek

readList :: ReadS [DayOfWeek]

readPrec :: ReadPrec DayOfWeek

readListPrec :: ReadPrec [DayOfWeek]

Show DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Methods

showsPrec :: Int -> DayOfWeek -> ShowS

show :: DayOfWeek -> String

showList :: [DayOfWeek] -> ShowS

NFData DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Methods

rnf :: DayOfWeek -> ()

Eq DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Methods

(==) :: DayOfWeek -> DayOfWeek -> Bool

(/=) :: DayOfWeek -> DayOfWeek -> Bool

Ord DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

data NominalDiffTime #

Instances

Instances details
FromJSON NominalDiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser NominalDiffTime

parseJSONList :: Value -> Parser [NominalDiffTime]

ToJSON NominalDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: NominalDiffTime -> Value

toEncoding :: NominalDiffTime -> Encoding

toJSONList :: [NominalDiffTime] -> Value

toEncodingList :: [NominalDiffTime] -> Encoding

Data NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NominalDiffTime -> c NominalDiffTime

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NominalDiffTime

toConstr :: NominalDiffTime -> Constr

dataTypeOf :: NominalDiffTime -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NominalDiffTime)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NominalDiffTime)

gmapT :: (forall b. Data b => b -> b) -> NominalDiffTime -> NominalDiffTime

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NominalDiffTime -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NominalDiffTime -> r

gmapQ :: (forall d. Data d => d -> u) -> NominalDiffTime -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> NominalDiffTime -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NominalDiffTime -> m NominalDiffTime

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NominalDiffTime -> m NominalDiffTime

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NominalDiffTime -> m NominalDiffTime

Enum NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Num NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Read NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Fractional NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Real NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

toRational :: NominalDiffTime -> Rational

RealFrac NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

properFraction :: Integral b => NominalDiffTime -> (b, NominalDiffTime)

truncate :: Integral b => NominalDiffTime -> b

round :: Integral b => NominalDiffTime -> b

ceiling :: Integral b => NominalDiffTime -> b

floor :: Integral b => NominalDiffTime -> b

Show NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

showsPrec :: Int -> NominalDiffTime -> ShowS

show :: NominalDiffTime -> String

showList :: [NominalDiffTime] -> ShowS

NFData NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

rnf :: NominalDiffTime -> ()

Eq NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Ord NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

newtype UniversalTime #

Constructors

ModJulianDate 

Fields

Instances

Instances details
Data UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UniversalTime -> c UniversalTime

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UniversalTime

toConstr :: UniversalTime -> Constr

dataTypeOf :: UniversalTime -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UniversalTime)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UniversalTime)

gmapT :: (forall b. Data b => b -> b) -> UniversalTime -> UniversalTime

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UniversalTime -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UniversalTime -> r

gmapQ :: (forall d. Data d => d -> u) -> UniversalTime -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> UniversalTime -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime

NFData UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Methods

rnf :: UniversalTime -> ()

Eq UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Ord UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

class FormatTime t #

Minimal complete definition

formatCharacter

Instances

Instances details
FormatTime DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

formatCharacter :: Bool -> Char -> Maybe (FormatOptions -> DotNetTime -> String)

data CalendarDiffTime #

Constructors

CalendarDiffTime 

Fields

Instances

Instances details
FromJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser CalendarDiffTime

parseJSONList :: Value -> Parser [CalendarDiffTime]

ToJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data CalendarDiffTime 
Instance details

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

Monoid CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Semigroup CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Show CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Methods

showsPrec :: Int -> CalendarDiffTime -> ShowS

show :: CalendarDiffTime -> String

showList :: [CalendarDiffTime] -> ShowS

NFData CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Methods

rnf :: CalendarDiffTime -> ()

Eq CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

data TimeZone #

Constructors

TimeZone 

Fields

Instances

Instances details
Data TimeZone 
Instance details

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 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Methods

showsPrec :: Int -> TimeZone -> ShowS

show :: TimeZone -> String

showList :: [TimeZone] -> ShowS

NFData TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Methods

rnf :: TimeZone -> ()

Eq TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Methods

(==) :: TimeZone -> TimeZone -> Bool

(/=) :: TimeZone -> TimeZone -> Bool

Ord TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Methods

compare :: TimeZone -> TimeZone -> Ordering #

(<) :: TimeZone -> TimeZone -> Bool #

(<=) :: TimeZone -> TimeZone -> Bool #

(>) :: TimeZone -> TimeZone -> Bool #

(>=) :: TimeZone -> TimeZone -> Bool #

max :: TimeZone -> TimeZone -> TimeZone #

min :: TimeZone -> TimeZone -> TimeZone #

class ParseTime t #

Minimal complete definition

parseTimeSpecifier, buildTime

data Arg a #

Constructors

Arg 

Fields

Instances

Instances details
Remap Arg 
Instance details

Defined in System.Console.CmdArgs.Explicit.Type

Methods

remap :: (a -> b) -> (b -> (a, a -> b)) -> Arg a -> Arg b #

data ThreadId #

Instances

Instances details
Show ThreadId 
Instance details

Defined in GHC.Conc.Sync

Methods

showsPrec :: Int -> ThreadId -> ShowS

show :: ThreadId -> String

showList :: [ThreadId] -> ShowS

NFData ThreadId 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: ThreadId -> ()

Eq ThreadId 
Instance details

Defined in GHC.Conc.Sync

Methods

(==) :: ThreadId -> ThreadId -> Bool

(/=) :: ThreadId -> ThreadId -> Bool

Ord ThreadId 
Instance details

Defined in GHC.Conc.Sync

Methods

compare :: ThreadId -> ThreadId -> Ordering #

(<) :: ThreadId -> ThreadId -> Bool #

(<=) :: ThreadId -> ThreadId -> Bool #

(>) :: ThreadId -> ThreadId -> Bool #

(>=) :: ThreadId -> ThreadId -> Bool #

max :: ThreadId -> ThreadId -> ThreadId #

min :: ThreadId -> ThreadId -> ThreadId #

Hashable ThreadId 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> ThreadId -> Int

hash :: ThreadId -> Int

data SeekMode #

Instances

Instances details
Enum SeekMode 
Instance details

Defined in GHC.IO.Device

Ix SeekMode 
Instance details

Defined in GHC.IO.Device

Read SeekMode 
Instance details

Defined in GHC.IO.Device

Methods

readsPrec :: Int -> ReadS SeekMode

readList :: ReadS [SeekMode]

readPrec :: ReadPrec SeekMode

readListPrec :: ReadPrec [SeekMode]

Show SeekMode 
Instance details

Defined in GHC.IO.Device

Methods

showsPrec :: Int -> SeekMode -> ShowS

show :: SeekMode -> String

showList :: [SeekMode] -> ShowS

Eq SeekMode 
Instance details

Defined in GHC.IO.Device

Methods

(==) :: SeekMode -> SeekMode -> Bool

(/=) :: SeekMode -> SeekMode -> Bool

Ord SeekMode 
Instance details

Defined in GHC.IO.Device

Methods

compare :: SeekMode -> SeekMode -> Ordering #

(<) :: SeekMode -> SeekMode -> Bool #

(<=) :: SeekMode -> SeekMode -> Bool #

(>) :: SeekMode -> SeekMode -> Bool #

(>=) :: SeekMode -> SeekMode -> Bool #

max :: SeekMode -> SeekMode -> SeekMode #

min :: SeekMode -> SeekMode -> SeekMode #

data TextEncoding #

Instances

Instances details
Show TextEncoding 
Instance details

Defined in GHC.IO.Encoding.Types

Methods

showsPrec :: Int -> TextEncoding -> ShowS

show :: TextEncoding -> String

showList :: [TextEncoding] -> ShowS

data HandlePosn #

Instances

Instances details
Show HandlePosn 
Instance details

Defined in GHC.IO.Handle

Methods

showsPrec :: Int -> HandlePosn -> ShowS

show :: HandlePosn -> String

showList :: [HandlePosn] -> ShowS

Eq HandlePosn 
Instance details

Defined in GHC.IO.Handle

Methods

(==) :: HandlePosn -> HandlePosn -> Bool

(/=) :: HandlePosn -> HandlePosn -> Bool

data BufferMode #

Instances

Instances details
Read BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

readsPrec :: Int -> ReadS BufferMode

readList :: ReadS [BufferMode]

readPrec :: ReadPrec BufferMode

readListPrec :: ReadPrec [BufferMode]

Show BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

showsPrec :: Int -> BufferMode -> ShowS

show :: BufferMode -> String

showList :: [BufferMode] -> ShowS

Eq BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

(==) :: BufferMode -> BufferMode -> Bool

(/=) :: BufferMode -> BufferMode -> Bool

Ord BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

data Newline #

Constructors

LF 
CRLF 

Instances

Instances details
Read Newline 
Instance details

Defined in GHC.IO.Handle.Types

Methods

readsPrec :: Int -> ReadS Newline

readList :: ReadS [Newline]

readPrec :: ReadPrec Newline

readListPrec :: ReadPrec [Newline]

Show Newline 
Instance details

Defined in GHC.IO.Handle.Types

Methods

showsPrec :: Int -> Newline -> ShowS

show :: Newline -> String

showList :: [Newline] -> ShowS

Eq Newline 
Instance details

Defined in GHC.IO.Handle.Types

Methods

(==) :: Newline -> Newline -> Bool

(/=) :: Newline -> Newline -> Bool

Ord Newline 
Instance details

Defined in GHC.IO.Handle.Types

Methods

compare :: Newline -> Newline -> Ordering #

(<) :: Newline -> Newline -> Bool #

(<=) :: Newline -> Newline -> Bool #

(>) :: Newline -> Newline -> Bool #

(>=) :: Newline -> Newline -> Bool #

max :: Newline -> Newline -> Newline #

min :: Newline -> Newline -> Newline #

data NewlineMode #

Constructors

NewlineMode 

Instances

Instances details
Read NewlineMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

readsPrec :: Int -> ReadS NewlineMode

readList :: ReadS [NewlineMode]

readPrec :: ReadPrec NewlineMode

readListPrec :: ReadPrec [NewlineMode]

Show NewlineMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

showsPrec :: Int -> NewlineMode -> ShowS

show :: NewlineMode -> String

showList :: [NewlineMode] -> ShowS

Eq NewlineMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

(==) :: NewlineMode -> NewlineMode -> Bool

(/=) :: NewlineMode -> NewlineMode -> Bool

Ord NewlineMode 
Instance details

Defined in GHC.IO.Handle.Types

data IOMode #

Instances

Instances details
Enum IOMode 
Instance details

Defined in GHC.IO.IOMode

Ix IOMode 
Instance details

Defined in GHC.IO.IOMode

Methods

range :: (IOMode, IOMode) -> [IOMode]

index :: (IOMode, IOMode) -> IOMode -> Int

unsafeIndex :: (IOMode, IOMode) -> IOMode -> Int

inRange :: (IOMode, IOMode) -> IOMode -> Bool

rangeSize :: (IOMode, IOMode) -> Int

unsafeRangeSize :: (IOMode, IOMode) -> Int

Read IOMode 
Instance details

Defined in GHC.IO.IOMode

Methods

readsPrec :: Int -> ReadS IOMode

readList :: ReadS [IOMode]

readPrec :: ReadPrec IOMode

readListPrec :: ReadPrec [IOMode]

Show IOMode 
Instance details

Defined in GHC.IO.IOMode

Methods

showsPrec :: Int -> IOMode -> ShowS

show :: IOMode -> String

showList :: [IOMode] -> ShowS

Eq IOMode 
Instance details

Defined in GHC.IO.IOMode

Methods

(==) :: IOMode -> IOMode -> Bool

(/=) :: IOMode -> IOMode -> Bool

Ord IOMode 
Instance details

Defined in GHC.IO.IOMode

Methods

compare :: IOMode -> IOMode -> Ordering #

(<) :: IOMode -> IOMode -> Bool #

(<=) :: IOMode -> IOMode -> Bool #

(>) :: IOMode -> IOMode -> Bool #

(>=) :: IOMode -> IOMode -> Bool #

max :: IOMode -> IOMode -> IOMode #

min :: IOMode -> IOMode -> IOMode #

data FormatSign #

Constructors

SignPlus 
SignSpace 

data CmdSpec #

Constructors

ShellCommand String 
RawCommand FilePath [String] 

Instances

Instances details
IsString CmdSpec 
Instance details

Defined in System.Process.Common

Methods

fromString :: String -> CmdSpec

Show CmdSpec 
Instance details

Defined in System.Process.Common

Methods

showsPrec :: Int -> CmdSpec -> ShowS

show :: CmdSpec -> String

showList :: [CmdSpec] -> ShowS

Eq CmdSpec 
Instance details

Defined in System.Process.Common

Methods

(==) :: CmdSpec -> CmdSpec -> Bool

(/=) :: CmdSpec -> CmdSpec -> Bool

data CreateProcess #

Constructors

CreateProcess 

Fields

Instances

Instances details
Show CreateProcess 
Instance details

Defined in System.Process.Common

Methods

showsPrec :: Int -> CreateProcess -> ShowS

show :: CreateProcess -> String

showList :: [CreateProcess] -> ShowS

Eq CreateProcess 
Instance details

Defined in System.Process.Common

data StdStream #

Instances

Instances details
Show StdStream 
Instance details

Defined in System.Process.Common

Methods

showsPrec :: Int -> StdStream -> ShowS

show :: StdStream -> String

showList :: [StdStream] -> ShowS

Eq StdStream 
Instance details

Defined in System.Process.Common

Methods

(==) :: StdStream -> StdStream -> Bool

(/=) :: StdStream -> StdStream -> Bool

type Pid = CPid #

data ExitCode #

Constructors

ExitSuccess 
ExitFailure Int 

Instances

Instances details
Exception ExitCode 
Instance details

Defined in GHC.IO.Exception

Methods

toException :: ExitCode -> SomeException

fromException :: SomeException -> Maybe ExitCode

displayException :: ExitCode -> String

Generic ExitCode 
Instance details

Defined in GHC.IO.Exception

Associated Types

type Rep ExitCode :: Type -> Type

Methods

from :: ExitCode -> Rep ExitCode x

to :: Rep ExitCode x -> ExitCode

Read ExitCode 
Instance details

Defined in GHC.IO.Exception

Methods

readsPrec :: Int -> ReadS ExitCode

readList :: ReadS [ExitCode]

readPrec :: ReadPrec ExitCode

readListPrec :: ReadPrec [ExitCode]

Show ExitCode 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> ExitCode -> ShowS

show :: ExitCode -> String

showList :: [ExitCode] -> ShowS

NFData ExitCode 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: ExitCode -> ()

Eq ExitCode 
Instance details

Defined in GHC.IO.Exception

Methods

(==) :: ExitCode -> ExitCode -> Bool

(/=) :: ExitCode -> ExitCode -> Bool

Ord ExitCode 
Instance details

Defined in GHC.IO.Exception

Methods

compare :: ExitCode -> ExitCode -> Ordering #

(<) :: ExitCode -> ExitCode -> Bool #

(<=) :: ExitCode -> ExitCode -> Bool #

(>) :: ExitCode -> ExitCode -> Bool #

(>=) :: ExitCode -> ExitCode -> Bool #

max :: ExitCode -> ExitCode -> ExitCode #

min :: ExitCode -> ExitCode -> ExitCode #

type Rep ExitCode 
Instance details

Defined in GHC.IO.Exception

type Rep ExitCode = D1 ('MetaData "ExitCode" "GHC.IO.Exception" "base" 'False) (C1 ('MetaCons "ExitSuccess" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ExitFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

type SimpleStringParser a = Parsec HledgerParseErrorData String a #

data DependencyType #

Constructors

AllSucceed 
AllFinish 

Instances

Instances details
Show DependencyType 
Instance details

Defined in Test.Tasty.Core

Methods

showsPrec :: Int -> DependencyType -> ShowS

show :: DependencyType -> String

showList :: [DependencyType] -> ShowS

Eq DependencyType 
Instance details

Defined in Test.Tasty.Core

type TestName = String #

data Timeout #

Constructors

Timeout Integer String 
NoTimeout 

Instances

Instances details
Show Timeout 
Instance details

Defined in Test.Tasty.Options.Core

Methods

showsPrec :: Int -> Timeout -> ShowS

show :: Timeout -> String

showList :: [Timeout] -> ShowS

IsOption Timeout 
Instance details

Defined in Test.Tasty.Options.Core

Methods

defaultValue :: Timeout

parseValue :: String -> Maybe Timeout

optionName :: Tagged Timeout String

optionHelp :: Tagged Timeout String

showDefaultValue :: Timeout -> Maybe String

optionCLParser :: Parser Timeout

class Assertable t where #

Methods

assert :: t -> Assertion #

Instances

Instances details
Assertable String 
Instance details

Defined in Test.Tasty.HUnit.Orig

Methods

assert :: String -> Assertion #

Assertable () 
Instance details

Defined in Test.Tasty.HUnit.Orig

Methods

assert :: () -> Assertion #

Assertable Bool 
Instance details

Defined in Test.Tasty.HUnit.Orig

Methods

assert :: Bool -> Assertion #

Assertable t => Assertable (IO t) 
Instance details

Defined in Test.Tasty.HUnit.Orig

Methods

assert :: IO t -> Assertion #

type Assertion = IO () #

class AssertionPredicable t where #

Methods

assertionPredicate :: t -> IO Bool #

Instances

Instances details
AssertionPredicable Bool 
Instance details

Defined in Test.Tasty.HUnit.Orig

Methods

assertionPredicate :: Bool -> IO Bool #

AssertionPredicable t => AssertionPredicable (IO t) 
Instance details

Defined in Test.Tasty.HUnit.Orig

Methods

assertionPredicate :: IO t -> IO Bool #

type AssertionPredicate = IO Bool #

data HUnitFailure #

Constructors

HUnitFailure (Maybe SrcLoc) String 

Instances

Instances details
Exception HUnitFailure 
Instance details

Defined in Test.Tasty.HUnit.Orig

Methods

toException :: HUnitFailure -> SomeException

fromException :: SomeException -> Maybe HUnitFailure

displayException :: HUnitFailure -> String

Show HUnitFailure 
Instance details

Defined in Test.Tasty.HUnit.Orig

Methods

showsPrec :: Int -> HUnitFailure -> ShowS

show :: HUnitFailure -> String

showList :: [HUnitFailure] -> ShowS

Eq HUnitFailure 
Instance details

Defined in Test.Tasty.HUnit.Orig

Methods

(==) :: HUnitFailure -> HUnitFailure -> Bool

(/=) :: HUnitFailure -> HUnitFailure -> Bool

class HPrintfType t #

Minimal complete definition

hspr

Instances

Instances details
a ~ () => HPrintfType (IO a) 
Instance details

Defined in Text.Printf

Methods

hspr :: Handle -> String -> [UPrintf] -> IO a

(PrintfArg a, HPrintfType r) => HPrintfType (a -> r) 
Instance details

Defined in Text.Printf

Methods

hspr :: Handle -> String -> [UPrintf] -> a -> r

class IsChar c where #

Methods

toChar :: c -> Char #

fromChar :: Char -> c #

Instances

Instances details
IsChar Char 
Instance details

Defined in Text.Printf

Methods

toChar :: Char -> Char #

fromChar :: Char -> Char #

class PrintfType t #

Minimal complete definition

spr

Instances

Instances details
a ~ () => PrintfType (IO a) 
Instance details

Defined in Text.Printf

Methods

spr :: String -> [UPrintf] -> IO a

IsChar c => PrintfType [c] 
Instance details

Defined in Text.Printf

Methods

spr :: String -> [UPrintf] -> [c]

(PrintfArg a, PrintfType r) => PrintfType (a -> r) 
Instance details

Defined in Text.Printf

Methods

spr :: String -> [UPrintf] -> a -> r

data MVar a #

Instances

Instances details
NFData1 MVar 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> MVar a -> ()

NFData (MVar a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: MVar a -> ()

Eq (MVar a) 
Instance details

Defined in GHC.MVar

Methods

(==) :: MVar a -> MVar a -> Bool

(/=) :: MVar a -> MVar a -> Bool

data Flag a #

Constructors

Flag 

Instances

Instances details
Remap Flag 
Instance details

Defined in System.Console.CmdArgs.Explicit.Type

Methods

remap :: (a -> b) -> (b -> (a, a -> b)) -> Flag a -> Flag b #

type FlagHelp = String #

data Mode a #

Constructors

Mode 

Fields

Instances

Instances details
Remap Mode 
Instance details

Defined in System.Console.CmdArgs.Explicit.Type

Methods

remap :: (a -> b) -> (b -> (a, a -> b)) -> Mode a -> Mode b #

data InputOpts #

Constructors

InputOpts 

Fields

Instances

Instances details
Show InputOpts 
Instance details

Defined in Hledger.Read.InputOptions

Methods

showsPrec :: Int -> InputOpts -> ShowS

show :: InputOpts -> String

showList :: [InputOpts] -> ShowS

HasBalancingOpts InputOpts 
Instance details

Defined in Hledger.Read.InputOptions

HasInputOpts InputOpts 
Instance details

Defined in Hledger.Read.InputOptions

Methods

inputOpts :: Lens' InputOpts InputOpts #

aliases :: Lens' InputOpts [String] #

anon__ :: Lens' InputOpts Bool #

auto__ :: Lens' InputOpts Bool #

balancingopts :: Lens' InputOpts BalancingOpts #

forecast :: Lens' InputOpts (Maybe DateSpan) #

infer_costs :: Lens' InputOpts Bool #

infer_equity :: Lens' InputOpts Bool #

ioDay :: Lens' InputOpts Day #

mformat :: Lens' InputOpts (Maybe StorageFormat) #

mrules_file :: Lens' InputOpts (Maybe FilePath) #

new__ :: Lens' InputOpts Bool #

new_save :: Lens' InputOpts Bool #

pivot :: Lens' InputOpts String #

reportspan :: Lens' InputOpts DateSpan #

strict :: Lens' InputOpts Bool #

verbose_tags :: Lens' InputOpts Bool #

data ReportSpec #

Instances

Instances details
Show ReportSpec 
Instance details

Defined in Hledger.Reports.ReportOptions

Methods

showsPrec :: Int -> ReportSpec -> ShowS

show :: ReportSpec -> String

showList :: [ReportSpec] -> ShowS

Default ReportSpec 
Instance details

Defined in Hledger.Reports.ReportOptions

Methods

def :: ReportSpec

HasReportOpts ReportSpec 
Instance details

Defined in Hledger.Reports.ReportOptions

Methods

reportOpts :: ReportableLens' ReportSpec ReportOpts #

period :: ReportableLens' ReportSpec Period #

statuses :: ReportableLens' ReportSpec [Status] #

depth :: ReportableLens' ReportSpec (Maybe Int) #

date2 :: ReportableLens' ReportSpec Bool #

real :: ReportableLens' ReportSpec Bool #

querystring :: ReportableLens' ReportSpec [Text] #

HasReportOptsNoUpdate ReportSpec 
Instance details

Defined in Hledger.Reports.ReportOptions

HasReportSpec ReportSpec 
Instance details

Defined in Hledger.Reports.ReportOptions

class HasInputOpts c where #

Minimal complete definition

inputOpts

Methods

inputOpts :: Lens' c InputOpts #

aliases :: Lens' c [String] #

anon__ :: Lens' c Bool #

auto__ :: Lens' c Bool #

balancingopts :: Lens' c BalancingOpts #

forecast :: Lens' c (Maybe DateSpan) #

infer_costs :: Lens' c Bool #

infer_equity :: Lens' c Bool #

ioDay :: Lens' c Day #

mformat :: Lens' c (Maybe StorageFormat) #

mrules_file :: Lens' c (Maybe FilePath) #

new__ :: Lens' c Bool #

new_save :: Lens' c Bool #

pivot :: Lens' c String #

reportspan :: Lens' c DateSpan #

strict :: Lens' c Bool #

verbose_tags :: Lens' c Bool #

Instances

Instances details
HasInputOpts CliOpts Source # 
Instance details

Defined in Hledger.Cli.CliOptions

Methods

inputOpts :: Lens' CliOpts InputOpts #

aliases :: Lens' CliOpts [String] #

anon__ :: Lens' CliOpts Bool #

auto__ :: Lens' CliOpts Bool #

balancingopts :: Lens' CliOpts BalancingOpts #

forecast :: Lens' CliOpts (Maybe DateSpan) #

infer_costs :: Lens' CliOpts Bool #

infer_equity :: Lens' CliOpts Bool #

ioDay :: Lens' CliOpts Day #

mformat :: Lens' CliOpts (Maybe StorageFormat) #

mrules_file :: Lens' CliOpts (Maybe FilePath) #

new__ :: Lens' CliOpts Bool #

new_save :: Lens' CliOpts Bool #

pivot :: Lens' CliOpts String #

reportspan :: Lens' CliOpts DateSpan #

strict :: Lens' CliOpts Bool #

verbose_tags :: Lens' CliOpts Bool #

HasInputOpts InputOpts 
Instance details

Defined in Hledger.Read.InputOptions

Methods

inputOpts :: Lens' InputOpts InputOpts #

aliases :: Lens' InputOpts [String] #

anon__ :: Lens' InputOpts Bool #

auto__ :: Lens' InputOpts Bool #

balancingopts :: Lens' InputOpts BalancingOpts #

forecast :: Lens' InputOpts (Maybe DateSpan) #

infer_costs :: Lens' InputOpts Bool #

infer_equity :: Lens' InputOpts Bool #

ioDay :: Lens' InputOpts Day #

mformat :: Lens' InputOpts (Maybe StorageFormat) #

mrules_file :: Lens' InputOpts (Maybe FilePath) #

new__ :: Lens' InputOpts Bool #

new_save :: Lens' InputOpts Bool #

pivot :: Lens' InputOpts String #

reportspan :: Lens' InputOpts DateSpan #

strict :: Lens' InputOpts Bool #

verbose_tags :: Lens' InputOpts Bool #

class HasReportSpec c where #

Minimal complete definition

reportSpec

Methods

reportSpec :: Lens' c ReportSpec #

rsDay :: Lens' c Day #

rsQuery :: Lens' c Query #

rsQueryOpts :: Lens' c [QueryOpt] #

rsReportOpts :: Lens' c ReportOpts #

class HasReportOptsNoUpdate c where #

Minimal complete definition

reportOptsNoUpdate

Methods

reportOptsNoUpdate :: Lens' c ReportOpts #

accountlistmode :: Lens' c AccountListMode #

average :: Lens' c Bool #

balanceaccum :: Lens' c BalanceAccumulation #

balancecalc :: Lens' c BalanceCalculation #

budgetpat :: Lens' c (Maybe Text) #

color__ :: Lens' c Bool #

conversionop :: Lens' c (Maybe ConversionOp) #

date2NoUpdate :: Lens' c Bool #

declared :: Lens' c Bool #

depthNoUpdate :: Lens' c (Maybe Int) #

drop__ :: Lens' c Int #

empty__ :: Lens' c Bool #

format :: Lens' c StringFormat #

infer_prices :: Lens' c Bool #

interval :: Lens' c Interval #

invert :: Lens' c Bool #

layout :: Lens' c Layout #

no_elide :: Lens' c Bool #

no_total :: Lens' c Bool #

normalbalance :: Lens' c (Maybe NormalSign) #

percent :: Lens' c Bool #

periodNoUpdate :: Lens' c Period #

pretty :: Lens' c Bool #

querystringNoUpdate :: Lens' c [Text] #

realNoUpdate :: Lens' c Bool #

related :: Lens' c Bool #

row_total :: Lens' c Bool #

show_costs :: Lens' c Bool #

sort_amount :: Lens' c Bool #

statusesNoUpdate :: Lens' c [Status] #

transpose__ :: Lens' c Bool #

txn_dates :: Lens' c Bool #

value :: Lens' c (Maybe ValuationType) #

Instances

Instances details
HasReportOptsNoUpdate CliOpts Source # 
Instance details

Defined in Hledger.Cli.CliOptions

HasReportOptsNoUpdate ReportOpts 
Instance details

Defined in Hledger.Reports.ReportOptions

HasReportOptsNoUpdate ReportSpec 
Instance details

Defined in Hledger.Reports.ReportOptions

class HasReportOptsNoUpdate a => HasReportOpts a where #

Minimal complete definition

Nothing

Methods

reportOpts :: ReportableLens' a ReportOpts #

period :: ReportableLens' a Period #

statuses :: ReportableLens' a [Status] #

depth :: ReportableLens' a (Maybe Int) #

date2 :: ReportableLens' a Bool #

real :: ReportableLens' a Bool #

querystring :: ReportableLens' a [Text] #

Instances

Instances details
HasReportOpts CliOpts Source # 
Instance details

Defined in Hledger.Cli.CliOptions

Methods

reportOpts :: ReportableLens' CliOpts ReportOpts #

period :: ReportableLens' CliOpts Period #

statuses :: ReportableLens' CliOpts [Status] #

depth :: ReportableLens' CliOpts (Maybe Int) #

date2 :: ReportableLens' CliOpts Bool #

real :: ReportableLens' CliOpts Bool #

querystring :: ReportableLens' CliOpts [Text] #

HasReportOpts ReportOpts 
Instance details

Defined in Hledger.Reports.ReportOptions

Methods

reportOpts :: ReportableLens' ReportOpts ReportOpts #

period :: ReportableLens' ReportOpts Period #

statuses :: ReportableLens' ReportOpts [Status] #

depth :: ReportableLens' ReportOpts (Maybe Int) #

date2 :: ReportableLens' ReportOpts Bool #

real :: ReportableLens' ReportOpts Bool #

querystring :: ReportableLens' ReportOpts [Text] #

HasReportOpts ReportSpec 
Instance details

Defined in Hledger.Reports.ReportOptions

Methods

reportOpts :: ReportableLens' ReportSpec ReportOpts #

period :: ReportableLens' ReportSpec Period #

statuses :: ReportableLens' ReportSpec [Status] #

depth :: ReportableLens' ReportSpec (Maybe Int) #

date2 :: ReportableLens' ReportSpec Bool #

real :: ReportableLens' ReportSpec Bool #

querystring :: ReportableLens' ReportSpec [Text] #

data GeneralCategory #

Instances

Instances details
Bounded GeneralCategory 
Instance details

Defined in GHC.Unicode

Enum GeneralCategory 
Instance details

Defined in GHC.Unicode

Generic GeneralCategory 
Instance details

Defined in GHC.Generics

Associated Types

type Rep GeneralCategory :: Type -> Type

Ix GeneralCategory 
Instance details

Defined in GHC.Unicode

Read GeneralCategory 
Instance details

Defined in GHC.Read

Show GeneralCategory 
Instance details

Defined in GHC.Unicode

Methods

showsPrec :: Int -> GeneralCategory -> ShowS

show :: GeneralCategory -> String

showList :: [GeneralCategory] -> ShowS

Eq GeneralCategory 
Instance details

Defined in GHC.Unicode

Ord GeneralCategory 
Instance details

Defined in GHC.Unicode

type Rep GeneralCategory 
Instance details

Defined in GHC.Generics

type Rep GeneralCategory = D1 ('MetaData "GeneralCategory" "GHC.Unicode" "base" 'False) ((((C1 ('MetaCons "UppercaseLetter" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "LowercaseLetter" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TitlecaseLetter" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ModifierLetter" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OtherLetter" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NonSpacingMark" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SpacingCombiningMark" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "EnclosingMark" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DecimalNumber" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LetterNumber" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OtherNumber" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ConnectorPunctuation" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DashPunctuation" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "OpenPunctuation" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ClosePunctuation" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "InitialQuote" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "FinalQuote" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OtherPunctuation" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "MathSymbol" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CurrencySymbol" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ModifierSymbol" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OtherSymbol" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "Space" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LineSeparator" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ParagraphSeparator" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Control" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Format" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Surrogate" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PrivateUse" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NotAssigned" 'PrefixI 'False) (U1 :: Type -> Type))))))

data HelpFormat #

Instances

Instances details
Bounded HelpFormat 
Instance details

Defined in System.Console.CmdArgs.Explicit.Help

Enum HelpFormat 
Instance details

Defined in System.Console.CmdArgs.Explicit.Help

Read HelpFormat 
Instance details

Defined in System.Console.CmdArgs.Explicit.Help

Methods

readsPrec :: Int -> ReadS HelpFormat

readList :: ReadS [HelpFormat]

readPrec :: ReadPrec HelpFormat

readListPrec :: ReadPrec [HelpFormat]

Show HelpFormat 
Instance details

Defined in System.Console.CmdArgs.Explicit.Help

Methods

showsPrec :: Int -> HelpFormat -> ShowS

show :: HelpFormat -> String

showList :: [HelpFormat] -> ShowS

Default HelpFormat 
Instance details

Defined in System.Console.CmdArgs.Explicit.Help

Methods

def :: HelpFormat

Eq HelpFormat 
Instance details

Defined in System.Console.CmdArgs.Explicit.Help

Methods

(==) :: HelpFormat -> HelpFormat -> Bool

(/=) :: HelpFormat -> HelpFormat -> Bool

Ord HelpFormat 
Instance details

Defined in System.Console.CmdArgs.Explicit.Help

data FlagInfo #

Constructors

FlagReq 
FlagOpt String 
FlagOptRare String 
FlagNone 

Instances

Instances details
Show FlagInfo 
Instance details

Defined in System.Console.CmdArgs.Explicit.Type

Methods

showsPrec :: Int -> FlagInfo -> ShowS

show :: FlagInfo -> String

showList :: [FlagInfo] -> ShowS

Eq FlagInfo 
Instance details

Defined in System.Console.CmdArgs.Explicit.Type

Methods

(==) :: FlagInfo -> FlagInfo -> Bool

(/=) :: FlagInfo -> FlagInfo -> Bool

Ord FlagInfo 
Instance details

Defined in System.Console.CmdArgs.Explicit.Type

Methods

compare :: FlagInfo -> FlagInfo -> Ordering #

(<) :: FlagInfo -> FlagInfo -> Bool #

(<=) :: FlagInfo -> FlagInfo -> Bool #

(>) :: FlagInfo -> FlagInfo -> Bool #

(>=) :: FlagInfo -> FlagInfo -> Bool #

max :: FlagInfo -> FlagInfo -> FlagInfo #

min :: FlagInfo -> FlagInfo -> FlagInfo #

class Remap (m :: Type -> Type) where #

Methods

remap :: (a -> b) -> (b -> (a, a -> b)) -> m a -> m b #

Instances

Instances details
Remap Arg 
Instance details

Defined in System.Console.CmdArgs.Explicit.Type

Methods

remap :: (a -> b) -> (b -> (a, a -> b)) -> Arg a -> Arg b #

Remap Flag 
Instance details

Defined in System.Console.CmdArgs.Explicit.Type

Methods

remap :: (a -> b) -> (b -> (a, a -> b)) -> Flag a -> Flag b #

Remap Mode 
Instance details

Defined in System.Console.CmdArgs.Explicit.Type

Methods

remap :: (a -> b) -> (b -> (a, a -> b)) -> Mode a -> Mode b #

type Update a = String -> a -> Either String a #

data Permissions #

Instances

Instances details
Read Permissions 
Instance details

Defined in System.Directory.Internal.Common

Methods

readsPrec :: Int -> ReadS Permissions

readList :: ReadS [Permissions]

readPrec :: ReadPrec Permissions

readListPrec :: ReadPrec [Permissions]

Show Permissions 
Instance details

Defined in System.Directory.Internal.Common

Methods

showsPrec :: Int -> Permissions -> ShowS

show :: Permissions -> String

showList :: [Permissions] -> ShowS

Eq Permissions 
Instance details

Defined in System.Directory.Internal.Common

Methods

(==) :: Permissions -> Permissions -> Bool

(/=) :: Permissions -> Permissions -> Bool

Ord Permissions 
Instance details

Defined in System.Directory.Internal.Common

data XdgDirectory #

Instances

Instances details
Bounded XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Enum XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Read XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

readsPrec :: Int -> ReadS XdgDirectory

readList :: ReadS [XdgDirectory]

readPrec :: ReadPrec XdgDirectory

readListPrec :: ReadPrec [XdgDirectory]

Show XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

showsPrec :: Int -> XdgDirectory -> ShowS

show :: XdgDirectory -> String

showList :: [XdgDirectory] -> ShowS

Eq XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

(==) :: XdgDirectory -> XdgDirectory -> Bool

(/=) :: XdgDirectory -> XdgDirectory -> Bool

Ord XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

data XdgDirectoryList #

Constructors

XdgDataDirs 
XdgConfigDirs 

Instances

Instances details
Bounded XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Enum XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Read XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Show XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Methods

showsPrec :: Int -> XdgDirectoryList -> ShowS

show :: XdgDirectoryList -> String

showList :: [XdgDirectoryList] -> ShowS

Eq XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Ord XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

data OrdPlus #

Constructors

Lt 
LtEq 
Gt 
GtEq 
Eq 
AbsLt 
AbsLtEq 
AbsGt 
AbsGtEq 
AbsEq 

Instances

Instances details
Show OrdPlus 
Instance details

Defined in Hledger.Query

Methods

showsPrec :: Int -> OrdPlus -> ShowS

show :: OrdPlus -> String

showList :: [OrdPlus] -> ShowS

Eq OrdPlus 
Instance details

Defined in Hledger.Query

Methods

(==) :: OrdPlus -> OrdPlus -> Bool

(/=) :: OrdPlus -> OrdPlus -> Bool

data QueryOpt #

Instances

Instances details
Show QueryOpt 
Instance details

Defined in Hledger.Query

Methods

showsPrec :: Int -> QueryOpt -> ShowS

show :: QueryOpt -> String

showList :: [QueryOpt] -> ShowS

Eq QueryOpt 
Instance details

Defined in Hledger.Query

Methods

(==) :: QueryOpt -> QueryOpt -> Bool

(/=) :: QueryOpt -> QueryOpt -> Bool

data Reader (m :: Type -> Type) #

Constructors

Reader 

Fields

Instances

Instances details
Show (Reader m) 
Instance details

Defined in Hledger.Read.Common

Methods

showsPrec :: Int -> Reader m -> ShowS

show :: Reader m -> String

showList :: [Reader m] -> ShowS

data AccountListMode #

Constructors

ALFlat 
ALTree 

Instances

Instances details
Show AccountListMode 
Instance details

Defined in Hledger.Reports.ReportOptions

Methods

showsPrec :: Int -> AccountListMode -> ShowS

show :: AccountListMode -> String

showList :: [AccountListMode] -> ShowS

Default AccountListMode 
Instance details

Defined in Hledger.Reports.ReportOptions

Eq AccountListMode 
Instance details

Defined in Hledger.Reports.ReportOptions

data BalanceAccumulation #

Instances

Instances details
Show BalanceAccumulation 
Instance details

Defined in Hledger.Reports.ReportOptions

Methods

showsPrec :: Int -> BalanceAccumulation -> ShowS

show :: BalanceAccumulation -> String

showList :: [BalanceAccumulation] -> ShowS

Default BalanceAccumulation 
Instance details

Defined in Hledger.Reports.ReportOptions

Eq BalanceAccumulation 
Instance details

Defined in Hledger.Reports.ReportOptions

data BalanceCalculation #

Instances

Instances details
Show BalanceCalculation 
Instance details

Defined in Hledger.Reports.ReportOptions

Methods

showsPrec :: Int -> BalanceCalculation -> ShowS

show :: BalanceCalculation -> String

showList :: [BalanceCalculation] -> ShowS

Default BalanceCalculation 
Instance details

Defined in Hledger.Reports.ReportOptions

Eq BalanceCalculation 
Instance details

Defined in Hledger.Reports.ReportOptions

data Layout #

Instances

Instances details
Show Layout 
Instance details

Defined in Hledger.Reports.ReportOptions

Methods

showsPrec :: Int -> Layout -> ShowS

show :: Layout -> String

showList :: [Layout] -> ShowS

Eq Layout 
Instance details

Defined in Hledger.Reports.ReportOptions

Methods

(==) :: Layout -> Layout -> Bool

(/=) :: Layout -> Layout -> Bool

data ReportOpts #

Instances

Instances details
Show ReportOpts 
Instance details

Defined in Hledger.Reports.ReportOptions

Methods

showsPrec :: Int -> ReportOpts -> ShowS

show :: ReportOpts -> String

showList :: [ReportOpts] -> ShowS

Default ReportOpts 
Instance details

Defined in Hledger.Reports.ReportOptions

Methods

def :: ReportOpts

HasReportOpts ReportOpts 
Instance details

Defined in Hledger.Reports.ReportOptions

Methods

reportOpts :: ReportableLens' ReportOpts ReportOpts #

period :: ReportableLens' ReportOpts Period #

statuses :: ReportableLens' ReportOpts [Status] #

depth :: ReportableLens' ReportOpts (Maybe Int) #

date2 :: ReportableLens' ReportOpts Bool #

real :: ReportableLens' ReportOpts Bool #

querystring :: ReportableLens' ReportOpts [Text] #

HasReportOptsNoUpdate ReportOpts 
Instance details

Defined in Hledger.Reports.ReportOptions

data CompoundPeriodicReport a b #

Instances

Instances details
Functor (CompoundPeriodicReport a) 
Instance details

Defined in Hledger.Reports.ReportTypes

(ToJSON b, ToJSON a) => ToJSON (CompoundPeriodicReport a b) 
Instance details

Defined in Hledger.Reports.ReportTypes

Generic (CompoundPeriodicReport a b) 
Instance details

Defined in Hledger.Reports.ReportTypes

Associated Types

type Rep (CompoundPeriodicReport a b) :: Type -> Type

(Show a, Show b) => Show (CompoundPeriodicReport a b) 
Instance details

Defined in Hledger.Reports.ReportTypes

Methods

showsPrec :: Int -> CompoundPeriodicReport a b -> ShowS

show :: CompoundPeriodicReport a b -> String

showList :: [CompoundPeriodicReport a b] -> ShowS

type Rep (CompoundPeriodicReport a b) 
Instance details

Defined in Hledger.Reports.ReportTypes

type Rep (CompoundPeriodicReport a b) = D1 ('MetaData "CompoundPeriodicReport" "Hledger.Reports.ReportTypes" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" '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 #

Instances

Instances details
ToJSON DisplayName 
Instance details

Defined in Hledger.Reports.ReportTypes

Methods

toJSON :: DisplayName -> Value

toEncoding :: DisplayName -> Encoding

toJSONList :: [DisplayName] -> Value

toEncodingList :: [DisplayName] -> Encoding

Show DisplayName 
Instance details

Defined in Hledger.Reports.ReportTypes

Methods

showsPrec :: Int -> DisplayName -> ShowS

show :: DisplayName -> String

showList :: [DisplayName] -> ShowS

Eq DisplayName 
Instance details

Defined in Hledger.Reports.ReportTypes

Methods

(==) :: DisplayName -> DisplayName -> Bool

(/=) :: DisplayName -> DisplayName -> Bool

Ord DisplayName 
Instance details

Defined in Hledger.Reports.ReportTypes

type Percentage = Decimal #

data PeriodicReport a b #

Instances

Instances details
Bifunctor PeriodicReport 
Instance details

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) 
Instance details

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) 
Instance details

Defined in Hledger.Reports.ReportTypes

Methods

toJSON :: PeriodicReport a b -> Value

toEncoding :: PeriodicReport a b -> Encoding

toJSONList :: [PeriodicReport a b] -> Value

toEncodingList :: [PeriodicReport a b] -> Encoding

Generic (PeriodicReport a b) 
Instance details

Defined in Hledger.Reports.ReportTypes

Associated Types

type Rep (PeriodicReport a b) :: Type -> Type

Methods

from :: PeriodicReport a b -> Rep (PeriodicReport a b) x

to :: Rep (PeriodicReport a b) x -> PeriodicReport a b

(Show a, Show b) => Show (PeriodicReport a b) 
Instance details

Defined in Hledger.Reports.ReportTypes

Methods

showsPrec :: Int -> PeriodicReport a b -> ShowS

show :: PeriodicReport a b -> String

showList :: [PeriodicReport a b] -> ShowS

type Rep (PeriodicReport a b) 
Instance details

Defined in Hledger.Reports.ReportTypes

type Rep (PeriodicReport a b) = D1 ('MetaData "PeriodicReport" "Hledger.Reports.ReportTypes" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" '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

Instances details
Bifunctor PeriodicReportRow 
Instance details

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) 
Instance details

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) 
Instance details

Defined in Hledger.Reports.ReportTypes

Methods

toJSON :: PeriodicReportRow a b -> Value

toEncoding :: PeriodicReportRow a b -> Encoding

toJSONList :: [PeriodicReportRow a b] -> Value

toEncodingList :: [PeriodicReportRow a b] -> Encoding

Semigroup b => Semigroup (PeriodicReportRow a b) 
Instance details

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) 
Instance details

Defined in Hledger.Reports.ReportTypes

Associated Types

type Rep (PeriodicReportRow a b) :: Type -> Type

Methods

from :: PeriodicReportRow a b -> Rep (PeriodicReportRow a b) x

to :: Rep (PeriodicReportRow a b) x -> PeriodicReportRow a b

(Show a, Show b) => Show (PeriodicReportRow a b) 
Instance details

Defined in Hledger.Reports.ReportTypes

Methods

showsPrec :: Int -> PeriodicReportRow a b -> ShowS

show :: PeriodicReportRow a b -> String

showList :: [PeriodicReportRow a b] -> ShowS

type Rep (PeriodicReportRow a b) 
Instance details

Defined in Hledger.Reports.ReportTypes

type Rep (PeriodicReportRow a b) = D1 ('MetaData "PeriodicReportRow" "Hledger.Reports.ReportTypes" "hledger-lib-1.30-6nGnLsUOcWOFygCx9KA4hO" '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))))

newtype ZipList a #

Constructors

ZipList 

Fields

Instances

Instances details
Foldable ZipList 
Instance details

Defined in Control.Applicative

Methods

fold :: Monoid m => ZipList m -> m

foldMap :: Monoid m => (a -> m) -> ZipList a -> m

foldMap' :: Monoid m => (a -> m) -> ZipList a -> m

foldr :: (a -> b -> b) -> b -> ZipList a -> b #

foldr' :: (a -> b -> b) -> b -> ZipList a -> b

foldl :: (b -> a -> b) -> b -> ZipList a -> b #

foldl' :: (b -> a -> b) -> b -> ZipList a -> b #

foldr1 :: (a -> a -> a) -> ZipList a -> a #

foldl1 :: (a -> a -> a) -> ZipList a -> a #

toList :: ZipList a -> [a]

null :: ZipList a -> Bool #

length :: ZipList a -> Int #

elem :: Eq a => a -> ZipList a -> Bool #

maximum :: Ord a => ZipList a -> a #

minimum :: Ord a => ZipList a -> a #

sum :: Num a => ZipList a -> a #

product :: Num a => ZipList a -> a #

Traversable ZipList 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> ZipList a -> f (ZipList b)

sequenceA :: Applicative f => ZipList (f a) -> f (ZipList a)

mapM :: Monad m => (a -> m b) -> ZipList a -> m (ZipList b) #

sequence :: Monad m => ZipList (m a) -> m (ZipList a) #

Alternative ZipList 
Instance details

Defined in Control.Applicative

Methods

empty :: ZipList a #

(<|>) :: ZipList a -> ZipList a -> ZipList a #

some :: ZipList a -> ZipList [a] #

many :: ZipList a -> ZipList [a] #

Applicative ZipList 
Instance details

Defined in Control.Applicative

Methods

pure :: a -> ZipList a #

(<*>) :: ZipList (a -> b) -> ZipList a -> ZipList b #

liftA2 :: (a -> b -> c) -> ZipList a -> ZipList b -> ZipList c #

(*>) :: ZipList a -> ZipList b -> ZipList b #

(<*) :: ZipList a -> ZipList b -> ZipList a #

Functor ZipList 
Instance details

Defined in Control.Applicative

Methods

fmap :: (a -> b) -> ZipList a -> ZipList b #

(<$) :: a -> ZipList b -> ZipList a #

NFData1 ZipList 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> ZipList a -> ()

Generic1 ZipList 
Instance details

Defined in Control.Applicative

Associated Types

type Rep1 ZipList :: k -> Type

Methods

from1 :: forall (a :: k). ZipList a -> Rep1 ZipList a

to1 :: forall (a :: k). Rep1 ZipList a -> ZipList a

Data a => Data (ZipList a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ZipList a -> c (ZipList a)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ZipList a)

toConstr :: ZipList a -> Constr

dataTypeOf :: ZipList a -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ZipList a))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ZipList a))

gmapT :: (forall b. Data b => b -> b) -> ZipList a -> ZipList a

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ZipList a -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ZipList a -> r

gmapQ :: (forall d. Data d => d -> u) -> ZipList a -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> ZipList a -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a)

Generic (ZipList a) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (ZipList a) :: Type -> Type

Methods

from :: ZipList a -> Rep (ZipList a) x

to :: Rep (ZipList a) x -> ZipList a

IsList (ZipList a) 
Instance details

Defined in GHC.IsList

Associated Types

type Item (ZipList a)

Methods

fromList :: [Item (ZipList a)] -> ZipList a

fromListN :: Int -> [Item (ZipList a)] -> ZipList a

toList :: ZipList a -> [Item (ZipList a)]

Read a => Read (ZipList a) 
Instance details

Defined in Control.Applicative

Methods

readsPrec :: Int -> ReadS (ZipList a)

readList :: ReadS [ZipList a]

readPrec :: ReadPrec (ZipList a)

readListPrec :: ReadPrec [ZipList a]

Show a => Show (ZipList a) 
Instance details

Defined in Control.Applicative

Methods

showsPrec :: Int -> ZipList a -> ShowS

show :: ZipList a -> String

showList :: [ZipList a] -> ShowS

NFData a => NFData (ZipList a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: ZipList a -> ()

Eq a => Eq (ZipList a) 
Instance details

Defined in Control.Applicative

Methods

(==) :: ZipList a -> ZipList a -> Bool

(/=) :: ZipList a -> ZipList a -> Bool

Ord a => Ord (ZipList a) 
Instance details

Defined in Control.Applicative

Methods

compare :: ZipList a -> ZipList a -> Ordering #

(<) :: ZipList a -> ZipList a -> Bool #

(<=) :: ZipList a -> ZipList a -> Bool #

(>) :: ZipList a -> ZipList a -> Bool #

(>=) :: ZipList a -> ZipList a -> Bool #

max :: ZipList a -> ZipList a -> ZipList a #

min :: ZipList a -> ZipList a -> ZipList a #

MonoFunctor (ZipList a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ZipList a) -> Element (ZipList a)) -> ZipList a -> ZipList a

MonoPointed (ZipList a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ZipList a) -> ZipList a

type Rep1 ZipList 
Instance details

Defined in Control.Applicative

type Rep1 ZipList = D1 ('MetaData "ZipList" "Control.Applicative" "base" 'True) (C1 ('MetaCons "ZipList" 'PrefixI 'True) (S1 ('MetaSel ('Just "getZipList") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 [])))
type Rep (ZipList a) 
Instance details

Defined in Control.Applicative

type Rep (ZipList a) = D1 ('MetaData "ZipList" "Control.Applicative" "base" 'True) (C1 ('MetaCons "ZipList" 'PrefixI 'True) (S1 ('MetaSel ('Just "getZipList") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a])))
type Item (ZipList a) 
Instance details

Defined in GHC.IsList

type Item (ZipList a) = a
type Element (ZipList a) 
Instance details

Defined in Data.MonoTraversable

type Element (ZipList a) = a

newtype WrappedArrow (a :: Type -> Type -> Type) b c #

Constructors

WrapArrow 

Fields

Instances

Instances details
Generic1 (WrappedArrow a b :: Type -> Type) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep1 (WrappedArrow a b) :: k -> Type

Methods

from1 :: forall (a0 :: k). WrappedArrow a b a0 -> Rep1 (WrappedArrow a b) a0

to1 :: forall (a0 :: k). Rep1 (WrappedArrow a b) a0 -> WrappedArrow a b a0

(ArrowZero a, ArrowPlus a) => Alternative (WrappedArrow a b) 
Instance details

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) 
Instance details

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) 
Instance details

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) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c0 (d -> b0) -> d -> c0 b0) -> (forall g. g -> c0 g) -> WrappedArrow a b c -> c0 (WrappedArrow a b c)

gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (WrappedArrow a b c)

toConstr :: WrappedArrow a b c -> Constr

dataTypeOf :: WrappedArrow a b c -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (WrappedArrow a b c))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (WrappedArrow a b c))

gmapT :: (forall b0. Data b0 => b0 -> b0) -> WrappedArrow a b c -> WrappedArrow a b c

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedArrow a b c -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedArrow a b c -> r

gmapQ :: (forall d. Data d => d -> u) -> WrappedArrow a b c -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedArrow a b c -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c)

Generic (WrappedArrow a b c) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedArrow a b c) :: Type -> Type

Methods

from :: WrappedArrow a b c -> Rep (WrappedArrow a b c) x

to :: Rep (WrappedArrow a b c) x -> WrappedArrow a b c

Arrow a => MonoFunctor (WrappedArrow a b c) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WrappedArrow a b c) -> Element (WrappedArrow a b c)) -> WrappedArrow a b c -> WrappedArrow a b c

Arrow a => MonoPointed (WrappedArrow a b c) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WrappedArrow a b c) -> WrappedArrow a b c

type Rep1 (WrappedArrow a b :: Type -> Type) 
Instance details

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) 
Instance details

Defined in Control.Applicative

type Rep (WrappedArrow a b c) = D1 ('MetaData "WrappedArrow" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapArrow" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapArrow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (a b c))))
type Element (WrappedArrow a b c) 
Instance details

Defined in Data.MonoTraversable

type Element (WrappedArrow a b c) = c

newtype WrappedMonad (m :: Type -> Type) a #

Constructors

WrapMonad 

Fields

Instances

Instances details
Generic1 (WrappedMonad m :: Type -> Type) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep1 (WrappedMonad m) :: k -> Type

Methods

from1 :: forall (a :: k). WrappedMonad m a -> Rep1 (WrappedMonad m) a

to1 :: forall (a :: k). Rep1 (WrappedMonad m) a -> WrappedMonad m a

MonadPlus m => Alternative (WrappedMonad m) 
Instance details

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) 
Instance details

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) 
Instance details

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) 
Instance details

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) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WrappedMonad m a -> c (WrappedMonad m a)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (WrappedMonad m a)

toConstr :: WrappedMonad m a -> Constr

dataTypeOf :: WrappedMonad m a -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (WrappedMonad m a))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (WrappedMonad m a))

gmapT :: (forall b. Data b => b -> b) -> WrappedMonad m a -> WrappedMonad m a

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonad m a -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonad m a -> r

gmapQ :: (forall d. Data d => d -> u) -> WrappedMonad m a -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedMonad m a -> u

gmapM :: Monad m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a)

gmapMp :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a)

gmapMo :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a)

Generic (WrappedMonad m a) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedMonad m a) :: Type -> Type

Methods

from :: WrappedMonad m a -> Rep (WrappedMonad m a) x

to :: Rep (WrappedMonad m a) x -> WrappedMonad m a

Monad m => MonoFunctor (WrappedMonad m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WrappedMonad m a) -> Element (WrappedMonad m a)) -> WrappedMonad m a -> WrappedMonad m a

Monad m => MonoPointed (WrappedMonad m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WrappedMonad m a) -> WrappedMonad m a

type Rep1 (WrappedMonad m :: Type -> Type) 
Instance details

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) 
Instance details

Defined in Control.Applicative

type Rep (WrappedMonad m a) = D1 ('MetaData "WrappedMonad" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapMonad" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapMonad") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (m a))))
type Element (WrappedMonad m a) 
Instance details

Defined in Data.MonoTraversable

type Element (WrappedMonad m a) = a

data IOErrorType #

Instances

Instances details
Show IOErrorType 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> IOErrorType -> ShowS

show :: IOErrorType -> String

showList :: [IOErrorType] -> ShowS

Eq IOErrorType 
Instance details

Defined in GHC.IO.Exception

Methods

(==) :: IOErrorType -> IOErrorType -> Bool

(/=) :: IOErrorType -> IOErrorType -> Bool

data Chan a #

Instances

Instances details
Eq (Chan a) 
Instance details

Defined in Control.Concurrent.Chan

Methods

(==) :: Chan a -> Chan a -> Bool

(/=) :: Chan a -> Chan a -> Bool

data QSem #

data QSemN #

pattern MixedAmountKeyUnitPrice :: !CommoditySymbol -> !CommoditySymbol -> !Quantity -> MixedAmountKey #

pattern MixedAmountKeyNoPrice :: !CommoditySymbol -> MixedAmountKey #

pattern MixedAmountKeyTotalPrice :: !CommoditySymbol -> !CommoditySymbol -> MixedAmountKey #

pattern April :: MonthOfYear #

pattern August :: MonthOfYear #

pattern BeforeCommonEra :: Integer -> Year #

pattern CommonEra :: Integer -> Year #

pattern January :: MonthOfYear #

pattern July :: MonthOfYear #

pattern June :: MonthOfYear #

pattern March :: MonthOfYear #

pattern May :: MonthOfYear #

pattern October :: MonthOfYear #

sum :: (Foldable t, Num a) => t a -> a #

product :: (Foldable t, Num a) => t a -> a #

null :: Foldable t => t a -> Bool #

length :: Foldable t => t a -> Int #

foldr1 :: Foldable t => (a -> a -> a) -> t a -> a #

foldl1 :: Foldable t => (a -> a -> a) -> t a -> a #

elem :: (Foldable t, Eq a) => a -> t a -> Bool #

foldl' :: Foldable t => (b -> a -> b) -> b -> t a -> b #

maximum :: (Foldable t, Ord a) => t a -> a #

minimum :: (Foldable t, Ord a) => t a -> a #

foldl :: Foldable t => (b -> a -> b) -> b -> t a -> b #

foldr :: Foldable t => (a -> b -> b) -> b -> t a -> b #

pager :: String -> IO () #

process :: Mode a -> [String] -> Either String a #

(++) :: [a] -> [a] -> [a] #

map :: (a -> b) -> [a] -> [b] #

join :: Monad m => m (m a) -> m a #

cycle :: HasCallStack => [a] -> [a] #

groupBy :: (a -> a -> Bool) -> [a] -> [[a]] #

unzip :: [(a, b)] -> ([a], [b]) #

($>) :: Functor f => f a -> b -> f b #

partition :: (a -> Bool) -> [a] -> ([a], [a]) #

stripPrefix :: Eq a => [a] -> [a] -> Maybe [a] #

liftM2 :: Monad m => (a1 -> a2 -> r) -> m a1 -> m a2 -> m r #

(<=<) :: Monad m => (b -> m c) -> (a -> m b) -> a -> m c #

repeat :: a -> [a] #

iterate :: (a -> a) -> a -> [a] #

void :: Functor f => f a -> f () #

zipWith :: (a -> b -> c) -> [a] -> [b] -> [c] #

filter :: (a -> Bool) -> [a] -> [a] #

replicate :: Int -> a -> [a] #

when :: Applicative f => Bool -> f () -> f () #

uncurry3 :: (a -> b -> c -> d) -> (a, b, c) -> d #

curry3 :: ((a, b, c) -> d) -> a -> b -> c -> d #

dropWhile :: (a -> Bool) -> [a] -> [a] #

takeWhile :: (a -> Bool) -> [a] -> [a] #

span :: (a -> Bool) -> [a] -> ([a], [a]) #

comparing :: Ord a => (b -> a) -> b -> b -> Ordering #

group :: Eq a => [a] -> [[a]] #

sort :: Ord a => [a] -> [a] #

nub :: Eq a => [a] -> [a] #

unzip3 :: [(a, b, c)] -> ([a], [b], [c]) #

take :: Int -> [a] -> [a] #

drop :: Int -> [a] -> [a] #

splitAt :: Int -> [a] -> ([a], [a]) #

inits :: [a] -> [[a]] #

tails :: [a] -> [[a]] #

break :: (a -> Bool) -> [a] -> ([a], [a]) #

isSpace :: Char -> Bool #

lines :: String -> [String] #

words :: String -> [String] #

head :: HasCallStack => [a] -> a #

tail :: HasCallStack => [a] -> [a] #

init :: HasCallStack => [a] -> [a] #

last :: HasCallStack => [a] -> a #

catMaybes :: [Maybe a] -> [a] #

zip :: [a] -> [b] -> [(a, b)] #

concat :: Foldable t => t [a] -> [a] #

proc :: FilePath -> [String] -> CreateProcess #

prognameandversion :: String Source #

The program name and version string for this build of the hledger tool, including any git info available at build time.

versionString :: ProgramName -> PackageVersion -> String Source #

A helper to generate the best version string we can from the given program name and package version strings, current os and architecture, and any git info available at build time (commit hash, commit date, branch name, patchlevel since latest release tag for that program's package). Typically called for programs "hledger", "hledger-ui", or "hledger-web".

The git info changes whenever any file in the repository changes. Keeping this template haskell call here and not down in Hledger.Cli.Version helps reduce the number of modules recompiled.

helpflags :: [Flag RawOpts] Source #

Common help flags: --help, --debug, --version...

detailedversionflag :: Flag RawOpts Source #

A hidden flag just for the hledger executable.

flattreeflags :: Bool -> [Flag RawOpts] Source #

Flags for selecting flat/tree mode, used for reports organised by account. With a True argument, shows some extra help about inclusive/exclusive amounts.

hiddenflags :: [Flag RawOpts] Source #

Common flags that are accepted but not shown in --help, such as --effective, --aux-date.

inputflags :: [Flag RawOpts] Source #

Common input-related flags: --file, --rules-file, --alias...

reportflags :: [Flag RawOpts] Source #

Common report-related flags: --period, --cost, etc.

outputFormatFlag :: [String] -> Flag RawOpts Source #

Common output-related flags: --output-file, --output-format...

defMode :: Mode RawOpts Source #

An empty cmdargs mode to use as a template. Modes describe the top-level command, ie the program, or a subcommand, telling cmdargs how to parse a command line and how to generate the command's usage text.

defCommandMode :: [Name] -> Mode RawOpts Source #

A cmdargs mode suitable for a hledger built-in command with the given names (primary name + optional aliases). The usage message shows [QUERY] as argument.

addonCommandMode :: Name -> Mode RawOpts Source #

A cmdargs mode representing the hledger add-on command with the given name, providing hledger's common inputreportinghelp flags. Just used when invoking addons.

hledgerCommandMode :: CommandDoc -> [Flag RawOpts] -> [(String, [Flag RawOpts])] -> [Flag RawOpts] -> ([Arg RawOpts], Maybe (Arg RawOpts)) -> Mode RawOpts Source #

Build a cmdarg mode for a hledger command, from a help template and flag/argument specifications. Reduces boilerplate a little, though the complicated cmdargs flag and argument specs are still required.

showModeUsage :: Mode a -> String Source #

Get a mode's usage message as a nicely wrapped string.

withAliases :: String -> [String] -> String Source #

Add command aliases to the command's help string.

likelyExecutablesInPath :: IO [String] Source #

Get all sorted unique filenames in the current user's PATH. We do not currently filter out non-file objects or files without execute permission.

hledgerExecutablesInPath :: IO [String] Source #

Get the sorted unique filenames of all hledger-* executables in the current user's PATH. These are files in any of the PATH directories, named hledger-*, with either no extension (and no periods in the name) or one of the addonExtensions. We do not currently filter out non-file objects or files without execute permission.

ensureDebugHasArg :: (Eq (t Char), IsString (t Char), Foldable t) => [t Char] -> [t Char] Source #

Convert an argument-less --debug flag to --debug=1 in the given arguments list. Used by hledgeruiweb to make their command line parsing easier somehow.

getHledgerCliOpts' :: Mode RawOpts -> [String] -> IO CliOpts Source #

A helper for addon commands: this parses options and arguments from the current command line using the given hledger-style cmdargs mode, and returns a CliOpts. Or, with --help or -h present, it prints long or short help, and exits the program. When --debug is present, also prints some debug output. Note this is not used by the main hledger executable.

The help texts are generated from the mode. Long help includes the full usage description generated by cmdargs (including all supported options), framed by whatever pre- and postamble text the mode specifies. It's intended that this forms a complete help document or manual.

Short help is a truncated version of the above: the preamble and the first part of the usage, up to the first line containing "flags:" (normally this marks the start of the common hledger flags); plus a mention of --help and the (presumed supported) common hledger options not displayed.

Tips: Empty lines in the pre/postamble are removed by cmdargs; add a space character to preserve them.

rawOptsToCliOpts :: RawOpts -> IO CliOpts Source #

Parse raw option string values to the desired final data types. Any relative smart dates will be converted to fixed dates based on today's date. Parsing failures will raise an error. Also records the terminal width, if supported.

outputFormats :: [String] Source #

journalFilePathFromOpts :: CliOpts -> IO [String] Source #

Get the (tilde-expanded, absolute) journal file path from 1. options, 2. an environment variable, or 3. the default. Actually, returns one or more file paths. There will be more than one if multiple -f options were provided. File paths can have a READER: prefix naming a reader/data format.

rulesFilePathFromOpts :: CliOpts -> IO (Maybe FilePath) Source #

Get the (tilde-expanded) rules file path from options, if any.

outputFileFromOpts :: CliOpts -> IO (Maybe FilePath) Source #

Get the expanded, absolute output file path specified by an -o/--output-file options, or nothing, meaning stdout.

outputFormatFromOpts :: CliOpts -> String Source #

Get the output format from the --output-format option, otherwise from a recognised file extension in the --output-file option, otherwise the default (txt).

defaultWidth :: Int Source #

Default width for hledger console output, when not otherwise specified.

replaceNumericFlags :: [String] -> [String] Source #

Replace any numeric flags (eg -2) with their long form (--depth 2), as I'm guessing cmdargs doesn't support this directly.

registerWidthsFromOpts :: CliOpts -> (Int, Maybe Int) Source #

Get the width in characters to use for the register command's console output, and also the description column width if specified (following the main width, comma-separated). The widths will be as follows: no --width flag - overall width is the available width (COLUMNS, or posix terminal width, or 80); description width is unspecified (auto) --width W - overall width is W, description width is auto --width W,D - overall width is W, description width is D Will raise a parse error for a malformed --width argument.

hledgerAddons :: IO [String] Source #

Get the sorted unique canonical names of hledger addon commands found in the current user's PATH. These are used in command line parsing and to display the commands list.

Canonical addon names are the filenames of hledger-* executables in PATH, without the "hledger-" prefix, and without the file extension except when it's needed for disambiguation (see below).

When there are exactly two versions of an executable (same base name, different extensions) that look like a source and compiled pair (one has .exe, .com, or no extension), the source version will be excluded (even if it happens to be newer). When there are three or more versions (or two versions that don't look like a source/compiled pair), they are all included, with file extensions intact.

topicForMode :: Mode a -> Topic Source #

Get the most appropriate documentation topic for a mode. Currently, that is either the hledger, hledger-ui or hledger-web manual.

fromRight :: b -> Either a b -> b #

isRight :: Either a b -> Bool #

intercalate :: [a] -> [[a]] -> [a] #

isInfixOf :: Eq a => [a] -> [a] -> Bool #

isPrefixOf :: Eq a => [a] -> [a] -> Bool #

isSuffixOf :: Eq a => [a] -> [a] -> Bool #

printHelpForTopic :: Tool -> Maybe Topic -> IO () Source #

Print plain text help for this tool. Takes an optional topic argument for convenience but it is currently ignored.

runManForTopic :: Tool -> Maybe Topic -> IO () Source #

Display a man page for this tool, scrolled to the given topic if provided, using the "man" executable in $PATH. Note when a topic is provided we force man to use the "less" executable in $PATH, ignoring $MANPAGER and $PAGER.

runInfoForTopic :: Tool -> Maybe Topic -> IO () Source #

Display an info manual for this topic, opened at the given topic if provided, using the "info" executable in $PATH.

runPagerForTopic :: Tool -> Maybe Topic -> IO () Source #

Display plain text help for this tool, scrolled to the given topic if provided, using the given pager executable. Note when a topic is provided we ignore the provided pager and use the "less" executable in $PATH.

fromMaybe :: a -> Maybe a -> a #

isNothing :: Maybe a -> Bool #

first3 :: (a, b, c) -> a #

second3 :: (a, b, c) -> b #

third3 :: (a, b, c) -> c #

printf :: PrintfType r => String -> r #

lookupEnv :: String -> IO (Maybe String) #

unsupportedOutputFormatError :: String -> String Source #

Standard error message for a bad output format specified with -O/-o.

withJournalDo :: CliOpts -> (Journal -> IO a) -> IO a Source #

Parse the user's specified journal file(s) as a Journal, maybe apply some transformations according to options, and run a hledger command with it. Or, throw an error.

writeOutput :: CliOpts -> String -> IO () Source #

Write some output to stdout or to a file selected by --output-file. If the file exists it will be overwritten.

writeOutputLazyText :: CliOpts -> Text -> IO () Source #

Write some output to stdout or to a file selected by --output-file. If the file exists it will be overwritten. This function operates on Lazy Text values.

journalTransform :: CliOpts -> Journal -> Journal Source #

Apply some extra post-parse transformations to the journal, if specified by options. These happen after journal validation, but before report calculation. They include:

  • adding forecast transactions (--forecast)
  • pivoting account names (--pivot)
  • anonymising (--anonymise).

This will return an error message if the query in any auto posting rule fails to parse, or the generated transactions are not balanced.

journalReload :: CliOpts -> ExceptT String IO Journal Source #

Re-read the journal file(s) specified by options, applying any transformations specified by options. Or return an error string. Reads the full journal, without filtering.

journalReloadIfChanged :: CliOpts -> Day -> Journal -> ExceptT String IO (Journal, Bool) Source #

Re-read the option-specified journal file(s), but only if any of them has changed since last read. (If the file is standard input, this will either do nothing or give an error, not tested yet). Returns a journal or error message, and a flag indicating whether it was re-read or not. Like withJournalDo and journalReload, reads the full journal, without filtering.

journalFileIsNewer :: Journal -> FilePath -> IO Bool Source #

Has the specified file changed since the journal was last read ? Typically this is one of the journal's journalFilePaths. These are not always real files, so the file's existence is tested first; for non-files the answer is always no.

openBrowserOn :: String -> IO ExitCode Source #

Attempt to open a web browser on the given url, all platforms.

writeFileWithBackup :: FilePath -> String -> IO () Source #

Back up this file with a (incrementing) numbered suffix, then overwrite it with this new text, or give an error.

writeFileWithBackupIfChanged :: FilePath -> Text -> IO Bool Source #

Back up this file with a (incrementing) numbered suffix then overwrite it with this new text, or give an error, but only if the text is different from the current file contents, and return a flag indicating whether we did anything.

The given text should have unix line endings (n); the existing file content will be normalised to unix line endings before comparing the two. If the file is overwritten, the new file will have the current system's native line endings (n on unix, rn on windows). This could be different from the file's previous line endings, if working with a DOS file on unix or vice-versa.

pivotByOpts :: CliOpts -> Journal -> Journal Source #

Apply the pivot transformation on a journal, if option is present.

anonymiseByOpts :: CliOpts -> Journal -> Journal Source #

Apply the anonymisation transformation on a journal, if option is present

postingsOrTransactionsReportAsText :: Bool -> CliOpts -> (Int -> Int -> (a, [WideBuilder], [WideBuilder]) -> Builder) -> (a -> MixedAmount) -> (a -> MixedAmount) -> [a] -> Builder Source #

Render a PostingsReport or AccountTransactionsReport as Text, determining the appropriate starting widths and increasing as necessary.

readMay :: Read a => String -> Maybe a #

headMay :: [a] -> Maybe a #

splitFileName :: FilePath -> (String, String) #

readProcessWithExitCode :: FilePath -> [String] -> String -> IO (ExitCode, String, String) #

formatString :: Bool -> Maybe Int -> Maybe Int -> String -> String #

pack :: String -> Text #

unpack :: Text -> String #

argsToCliOpts :: [String] -> [String] -> IO CliOpts Source #

Parse hledger CLI options from these command line arguments and add-on command names, or raise any error.

packageversion :: PackageVersion Source #

The "1.30.1" string defined with -D in this package's package.yaml/.cabal file (by Shake setversion), if any. Normally a dotted number string with 1-3 components.

progname :: ProgramName Source #

The name of this package's main executable.

versionStringWith :: Either String GitInfo -> ProgramName -> PackageVersion -> VersionString Source #

Given possible git state info from the build directory (or an error message, which is ignored), the name of a program (executable) in the currently building package, and the package's version, make a complete version string. Here is the logic:

  • Program name, OS and architecture are always shown.
  • The package version is always shown.
  • If there is git info at build time, the latest commit hash and commit date are shown, and (TODO, requires githash to use -uno for giDirty): if the working copy has uncommitted changes a + sign is appended.
  • (TODO, requires adding --match support to githash: If there are tags matching THISPKG-[0-9]*, the latest one is used to calculate patch level (number of commits since tag), and if non-zero, it and the branch name are shown.)

Some example outputs:

  • A homebrew binary, not built in git repo: hledger-ui 1.24, mac-aarch64
  • A CI release build, built in git repo at release tag: hledger-ui 1.24.1-g455b35293-20211210, mac-x86_64
  • (TODO) A dev build, built in git repo: hledger-ui 1.24.1+1-g4abd8ef10-20211210 (1.24-branch), mac-x86_64

This function requires git log to show the default (rfc2822-style) date format, so that must not be overridden by a log.date git config variable.

testcmd :: CliOpts -> Journal -> IO () Source #

The test command, which runs the hledger and hledger-lib packages' unit tests. This command also accepts tasty test runner options, written after a -- (double hyphen).

Unlike most hledger commands, this one does not read the user's journal. A Journal argument remains in the type signature, but it should not be used (and would raise an error).

builtinCommands :: [(Mode RawOpts, CliOpts -> Journal -> IO ())] Source #

The cmdargs subcommand mode (for command-line parsing) and IO action (for doing the command's work) for each builtin command. Command actions take parsed CLI options and a (lazy) finalised journal.

builtinCommandNames :: [String] Source #

All names and aliases of the builtin commands.

findBuiltinCommand :: String -> Maybe (Mode RawOpts, CliOpts -> Journal -> IO ()) Source #

Look up a builtin command's mode and action by exact command name or alias.

knownAddonCommands :: [String] Source #

Canonical names of the known addon commands which have a slot in the commands list, in alphabetical order.

knownCommands :: [String] Source #

Canonical names of all commands which have a slot in the commands list, in alphabetical order. These include the builtin commands and the known addon commands.

printCommandsList :: String -> [String] -> IO () Source #

Print the commands list, with a pager if appropriate, customising the commandsList template above with the given version string and the installed addons. Uninstalled known addons will be removed from the list, installed known addons will have the + prefix removed, and installed unknown addons will be added under Misc.

isAlphaNum :: Char -> Bool #

withArgs :: [String] -> IO a -> IO a #

accountsmode :: Mode RawOpts Source #

Command line options for this command.

accounts :: CliOpts -> Journal -> IO () Source #

The accounts command.

forM_ :: (Foldable t, Monad m) => t a -> (a -> m b) -> m () #

headDef :: a -> [a] -> a #

sortOn :: Ord b => (a -> b) -> [a] -> [a] #

add :: CliOpts -> Journal -> IO () Source #

Read multiple transactions from the console, prompting for each field, and append them to the journal file. If the journal came from stdin, this command has no effect.

appendToJournalFileOrStdout :: FilePath -> Text -> IO () Source #

Append a string, typically one or more transactions, to a journal file, or if the file is "-", dump it to stdout. Tries to avoid excess whitespace.

XXX This writes unix line endings (n), some at least, even if the file uses dos line endings (rn), which could leave mixed line endings in the file. See also writeFileWithBackupIfChanged.

journalAddTransaction :: Journal -> CliOpts -> Transaction -> IO Journal Source #

Append this transaction to the journal's file and transaction list.

isJust :: Maybe a -> Bool #

formatTime :: FormatTime t => TimeLocale -> String -> t -> String #

atMay :: [a] -> Int -> Maybe a #

flagNone :: [Name] -> (a -> a) -> Help -> Flag a #

hPutStr :: Handle -> String -> IO () #

hPutStrLn :: Handle -> String -> IO () #

postingsReportAsText :: CliOpts -> PostingsReport -> Text Source #

Render a register report as plain text suitable for console output.

aregister :: CliOpts -> Journal -> IO () Source #

Print an account register report for a specified account.

find :: Foldable t => (a -> Bool) -> t a -> Maybe a #

flagReq :: [Name] -> Update a -> FlagHelp -> Help -> Flag a #

balancemode :: Mode RawOpts Source #

Command line options for this command.

balance :: CliOpts -> Journal -> IO () Source #

The balance command, prints a balance report.

balanceReportAsText :: ReportOpts -> BalanceReport -> Builder Source #

Render a single-column balance report as plain text.

balanceReportAsCsv :: ReportOpts -> BalanceReport -> CSV Source #

Render a single-column balance report as CSV.

balanceReportItemAsText :: ReportOpts -> BalanceReportItem -> (Builder, [Int]) Source #

Render one balance report line item as plain text suitable for console output (or whatever string format is specified). Note, prices will not be rendered, and differently-priced quantities of the same commodity will appear merged. The output will be one or more lines depending on the format and number of commodities.

multiBalanceReportAsText :: ReportOpts -> MultiBalanceReport -> Text Source #

Render a multi-column balance report as plain text suitable for console output.

multiBalanceReportAsCsv :: ReportOpts -> MultiBalanceReport -> CSV Source #

Render a multi-column balance report as CSV. The CSV will always include the initial headings row, and will include the final totals row unless --no-total is set.

multiBalanceReportAsHtml :: ReportOpts -> MultiBalanceReport -> Html () Source #

Render a multi-column balance report as HTML.

multiBalanceReportHtmlRows :: ReportOpts -> MultiBalanceReport -> (Html (), [Html ()], [Html ()]) Source #

Render the HTML table rows for a MultiBalanceReport. Returns the heading row, 0 or more body rows, and the totals row if enabled.

multiBalanceReportHtmlFootRow :: ReportOpts -> [Text] -> Html () Source #

Render one MultiBalanceReport totals row as a HTML table row.

balanceReportAsTable :: ReportOpts -> MultiBalanceReport -> Table Text Text WideBuilder Source #

Build a Table from a multi-column balance report.

transpose :: [[a]] -> [[a]] #

addDays :: Integer -> Day -> Day #

maximumMay :: Ord a => [a] -> Maybe a #

partitionEithers :: [Either a b] -> ([a], [b]) #

codesmode :: Mode RawOpts Source #

Command line options for this command.

codes :: CliOpts -> Journal -> IO () Source #

The codes command.

commoditiesmode :: Mode RawOpts Source #

Command line options for this command.

demomode :: Mode RawOpts Source #

Command line options for this command.

demo :: CliOpts -> Journal -> IO () Source #

The demo command.

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] #

hClose :: Handle -> IO () #

descriptionsmode :: Mode RawOpts Source #

Command line options for this command.

descriptions :: CliOpts -> Journal -> IO () Source #

The descriptions command.

diffmode :: Mode RawOpts Source #

Command line options for this command.

diff :: CliOpts -> Journal -> IO () Source #

The diff command.

(\\) :: Eq a => [a] -> [a] -> [a] #

nubBy :: (a -> a -> Bool) -> [a] -> [a] #

sortBy :: (a -> a -> Ordering) -> [a] -> [a] #

diffDays :: Day -> Day -> Integer #

help' :: CliOpts -> Journal -> IO () Source #

Display the hledger manual in various formats. You can select a docs viewer with one of the `--info`, `--man`, `--pager` flags. Otherwise it will use the first available of: info, man, $PAGER, less, stdout (and always stdout if output is non-interactive).

notesmode :: Mode RawOpts Source #

Command line options for this command.

notes :: CliOpts -> Journal -> IO () Source #

The notes command.

payeesmode :: Mode RawOpts Source #

Command line options for this command.

payees :: CliOpts -> Journal -> IO () Source #

The payees command.

print' :: CliOpts -> Journal -> IO () Source #

Print journal transactions in standard format.

intersperse :: a -> [a] -> [a] #

register :: CliOpts -> Journal -> IO () Source #

Print a (posting) register report.

postingsReportItemAsText :: CliOpts -> Int -> Int -> (PostingsReportItem, [WideBuilder], [WideBuilder]) -> Builder Source #

Render one register report line item as plain text. Layout is like so: width (specified, terminal width, or 80) -------------------- date (10) description account amount (12) balance (12) DDDDDDDDDD dddddddddddddddddddd aaaaaaaaaaaaaaaaaaa AAAAAAAAAAAA AAAAAAAAAAAA If description's width is specified, account will use the remaining space. Otherwise, description and account divide up the space equally.

With a report interval, the layout is like so: width (specified, terminal width, or 80) -------------------- date (21) account amount (12) balance (12) DDDDDDDDDDDDDDDDDDDDD aaaaaaaaaaaaaaaaaaaaaaaaaaaaa AAAAAAAAAAAA AAAAAAAAAAAA

date and description are shown for the first posting of a transaction only.

Returns a string which can be multi-line, eg if the running balance has multiple commodities. Does not yet support formatting control like balance reports.

Also returns the natural width (without padding) of the amount and balance fields.

intersect :: Eq a => [a] -> [a] -> [a] #

fromLeft :: a -> Either a b -> a #

isLeft :: Either a b -> Bool #

stats :: CliOpts -> Journal -> IO () Source #

Print various statistics for the journal.

mapMaybe :: (a -> Maybe b) -> [a] -> [b] #

getEnv :: String -> IO String #

(<$>) :: Functor f => (a -> b) -> f a -> f b #

either :: (a -> c) -> (b -> c) -> Either a b -> c #

all :: Foldable t => (a -> Bool) -> t a -> Bool #

and :: Foldable t => t Bool -> Bool #

any :: Foldable t => (a -> Bool) -> t a -> Bool #

concatMap :: Foldable t => (a -> [b]) -> t a -> [b] #

mapM_ :: (Foldable t, Monad m) => (a -> m b) -> t a -> m () #

notElem :: (Foldable t, Eq a) => a -> t a -> Bool #

or :: Foldable t => t Bool -> Bool #

sequence_ :: (Foldable t, Monad m) => t (m a) -> m () #

maybe :: b -> (a -> b) -> Maybe a -> b #

mapM :: (Traversable t, Monad m) => (a -> m b) -> t a -> m (t b) #

sequence :: (Traversable t, Monad m) => t (m a) -> m (t a) #

(=<<) :: Monad m => (a -> m b) -> m a -> m b #

appendFile :: FilePath -> String -> IO () #

getContents :: IO String #

getLine :: IO String #

interact :: (String -> String) -> IO () #

print :: Show a => a -> IO () #

putChar :: Char -> IO () #

putStr :: String -> IO () #

putStrLn :: String -> IO () #

readFile :: FilePath -> IO String #

readIO :: Read a => String -> IO a #

readLn :: Read a => IO a #

writeFile :: FilePath -> String -> IO () #

unlines :: [String] -> String #

unwords :: [String] -> String #

userError :: String -> IOError #

(!!) :: HasCallStack => [a] -> Int -> a #

lookup :: Eq a => a -> [(a, b)] -> Maybe b #

reverse :: [a] -> [a] #

scanl :: (b -> a -> b) -> b -> [a] -> [b] #

scanl1 :: (a -> a -> a) -> [a] -> [a] #

scanr :: (a -> b -> b) -> b -> [a] -> [b] #

scanr1 :: (a -> a -> a) -> [a] -> [a] #

zip3 :: [a] -> [b] -> [c] -> [(a, b, c)] #

zipWith3 :: (a -> b -> c -> d) -> [a] -> [b] -> [c] -> [d] #

liftM :: Monad m => (a1 -> r) -> m a1 -> m r #

ord :: Char -> Int #

formatRealFloat :: RealFloat a => a -> FieldFormatter #

intToDigit :: Int -> Char #

isDigit :: Char -> Bool #

foldl1' :: HasCallStack => (a -> a -> a) -> [a] -> a #

unfoldr :: (b -> Maybe (a, b)) -> b -> [a] #

singleton :: a -> [a] #

isAscii :: Char -> Bool #

mapAccumL :: Traversable t => (s -> a -> (s, b)) -> s -> t a -> (s, t b) #

mapAccumR :: Traversable t => (s -> a -> (s, b)) -> s -> t a -> (s, t b) #

strip :: String -> String #

takeEnd :: Int -> [a] -> [a] #

uncons :: [a] -> Maybe (a, [a]) #

anyAccounts :: (Account -> Bool) -> Account -> Bool #

filterAccounts :: (Account -> Bool) -> Account -> [Account] #

showAccounts :: Account -> String #

amountIsZero :: Amount -> Bool #

cshowAmount :: Amount -> String #

eur :: DecimalRaw Integer -> Amount #

gbp :: DecimalRaw Integer -> Amount #

maAddAmounts :: Foldable t => MixedAmount -> t Amount -> MixedAmount #

maSum :: Foldable t => t MixedAmount -> MixedAmount #

mixed :: Foldable t => t Amount -> MixedAmount #

showAmount :: Amount -> String #

showAmountDebug :: Amount -> String #

showMixedAmountElided :: Int -> Bool -> MixedAmount -> String #

usd :: DecimalRaw Integer -> Amount #

datesepchar :: forall (m :: Type -> Type). TextParser m Char #

datesepchars :: String #

daysInSpan :: DateSpan -> Maybe Integer #

elapsedSeconds :: Fractional a => UTCTime -> UTCTime -> a #

getCurrentYear :: IO Integer #

groupByDateSpan :: Bool -> (a -> Day) -> [DateSpan] -> [a] -> [(DateSpan, [a])] #

isDateSepChar :: Char -> Bool #

parsedateM :: String -> Maybe Day #

periodexprp :: forall (m :: Type -> Type). Day -> TextParser m (Interval, DateSpan) #

smartdate :: forall (m :: Type -> Type). TextParser m SmartDate #

splitSpan :: Bool -> Interval -> DateSpan -> [DateSpan] #

yearp :: forall (m :: Type -> Type). TextParser m Integer #

makePostingErrorExcerpt :: Posting -> (Posting -> Transaction -> Text -> Maybe (Int, Maybe Int)) -> (FilePath, Int, Maybe (Int, Maybe Int), Text) #

journalTransactionsSimilarTo :: Journal -> Text -> Query -> SimilarityScore -> Int -> [(DateWeightedSimilarityScore, Age, SimilarityScore, Transaction)] #

readJsonFile :: FromJSON a => FilePath -> IO a #

toJsonText :: ToJSON a => a -> Text #

writeJsonFile :: ToJSON a => FilePath -> a -> IO () #

firstMonthOfQuarter :: Num a => a -> a #

isLastDayOfMonth :: (Eq a1, Eq a2, Num a1, Num a2) => Year -> a1 -> a2 -> Bool #

quarterContainingMonth :: Integral a => a -> a #

startOfFirstWeekInMonth :: Integer -> Int -> Day #

hasAmount :: Posting -> Bool #

isReal :: Posting -> Bool #

isVirtual :: Posting -> Bool #

postingAsLines :: Bool -> Bool -> Int -> Int -> Posting -> ([Text], Int, Int) #

postingsAsLines :: Bool -> [Posting] -> [Text] #

showPosting :: Posting -> String #

appendopts :: [(String, String)] -> RawOpts -> RawOpts #

boolopt :: String -> RawOpts -> Bool #

choiceopt :: (String -> Maybe a) -> RawOpts -> Maybe a #

collectopts :: ((String, String) -> Maybe a) -> RawOpts -> [a] #

intopt :: String -> RawOpts -> Int #

listofstringopt :: String -> RawOpts -> [String] #

maybecharopt :: String -> RawOpts -> Maybe Char #

maybeintopt :: String -> RawOpts -> Maybe Int #

maybeposintopt :: String -> RawOpts -> Maybe Int #

maybestringopt :: String -> RawOpts -> Maybe String #

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 #

partitionAndCheckConversionPostings :: Bool -> Map AccountName AccountType -> [IdxPosting] -> Either Text ([(IdxPosting, IdxPosting)], ([IdxPosting], [IdxPosting])) #

isDecimalMark :: Char -> Bool #

modifyEFDay :: (Day -> Day) -> EFDay -> EFDay #

wbUnpack :: WideBuilder -> String #

delete :: Eq a => a -> [a] -> [a] #

insert :: Ord a => a -> [a] -> [a] #

union :: Eq a => [a] -> [a] -> [a] #

showLitChar :: Char -> ShowS #

foldM :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m b #

numDigitsInt :: Integral a => Int -> a #

colorB :: ColorIntensity -> Color -> WideBuilder -> WideBuilder #

ap :: Monad m => m (a -> b) -> m a -> m b #

applyN :: Int -> (a -> a) -> a -> a #

error' :: String -> a #

choice' :: forall (m :: Type -> Type) a. [TextParser m a] -> TextParser m a #

parsewith :: Parsec e Text a -> Text -> Either (ParseErrorBundle Text e) a #

skipNonNewlineSpaces :: forall s (m :: Type -> Type). (Stream s, Token s ~ Char) => ParsecT HledgerParseErrorData s m () #

readDecimal :: Text -> Integer #

showGregorian :: Day -> String #

isLeapYear :: Year -> Bool #

parseTimeMultipleM :: (MonadFail m, ParseTime t) => Bool -> TimeLocale -> [(String, String)] -> m t #

matchesAmount :: Query -> Amount -> Bool #

first4 :: (a, b, c, d) -> a #

treeLeaves :: Tree a -> [a] #

dbg1With :: Show a => (a -> String) -> a -> a #

dbg4 :: Show a => String -> a -> a #

dbg7 :: Show a => String -> a -> a #

debugLevel :: Int #

traceOrLogAtWith :: Int -> (a -> String) -> a -> a #

uppercase :: String -> String #

mkPos :: Int -> Pos #

filterQuery :: (Query -> Bool) -> Query -> Query #

queryIsDepth :: Query -> Bool #

queryIsSym :: Query -> Bool #

genericTake :: Integral i => i -> [a] -> [a] #

addGregorianMonthsClip :: Integer -> Day -> Day #

addGregorianYearsClip :: Integer -> Day -> Day #

iso8601DateFormat :: Maybe String -> String #

parseTimeM :: (MonadFail m, ParseTime t) => Bool -> TimeLocale -> String -> String -> m t #

parseTimeOrError :: ParseTime t => Bool -> TimeLocale -> String -> String -> t #

readPTime :: ParseTime t => Bool -> TimeLocale -> String -> ReadP t #

readSTime :: ParseTime t => Bool -> TimeLocale -> String -> ReadS t #

filterM :: Applicative m => (a -> m Bool) -> [a] -> m [a] #

scanl' :: (b -> a -> b) -> b -> [a] -> [b] #

zip4 :: [a] -> [b] -> [c] -> [d] -> [(a, b, c, d)] #

zip5 :: [a] -> [b] -> [c] -> [d] -> [e] -> [(a, b, c, d, e)] #

zip6 :: [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [(a, b, c, d, e, f)] #

zipWith4 :: (a -> b -> c -> d -> e) -> [a] -> [b] -> [c] -> [d] -> [e] #

zipWith5 :: (a -> b -> c -> d -> e -> f) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] #

zipWith6 :: (a -> b -> c -> d -> e -> f -> g) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] #

zipWithM :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m [c] #

zipWithM_ :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m () #

elemIndex :: Eq a => a -> [a] -> Maybe Int #

elemIndices :: Eq a => a -> [a] -> [Int] #

findIndices :: (a -> Bool) -> [a] -> [Int] #

foldM_ :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m () #

forM :: (Traversable t, Monad m) => t a -> (a -> m b) -> m (t b) #

maximumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a #

minimumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a #

replicateM :: Applicative m => Int -> m a -> m [a] #

unzip4 :: [(a, b, c, d)] -> ([a], [b], [c], [d]) #

unzip5 :: [(a, b, c, d, e)] -> ([a], [b], [c], [d], [e]) #

unzip6 :: [(a, b, c, d, e, f)] -> ([a], [b], [c], [d], [e], [f]) #

(<**>) :: Applicative f => f a -> f (a -> b) -> f b #

liftA :: Applicative f => (a -> b) -> f a -> f b #

liftA3 :: Applicative f => (a -> b -> c -> d) -> f a -> f b -> f c -> f d #

liftM3 :: Monad m => (a1 -> a2 -> a3 -> r) -> m a1 -> m a2 -> m a3 -> m r #

liftM4 :: Monad m => (a1 -> a2 -> a3 -> a4 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m r #

liftM5 :: Monad m => (a1 -> a2 -> a3 -> a4 -> a5 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m a5 -> m r #

clamp :: Ord a => (a, a) -> a -> a #

wrap :: Text -> Text -> Text -> Text #

(<&>) :: Functor f => f a -> (a -> b) -> f b #

unPos :: Pos -> Int #

periodAllDays :: DayPeriod p => p -> [Day] #

periodFromDay :: DayPeriod p => Day -> (p, Int) #

periodLength :: DayPeriod p => p -> Int #

periodToDay :: DayPeriod p => p -> Int -> Day #

periodToDayValid :: DayPeriod p => p -> Int -> Maybe Day #

chr :: Int -> Char #

callCommand :: String -> IO () #

dbg1 :: Show a => String -> a -> a #

hGetContents :: Handle -> IO String #

hGetLine :: Handle -> IO String #

listToMaybe :: [a] -> Maybe a #

maybeToList :: Maybe a -> [a] #

hFileSize :: Handle -> IO Integer #

hFlush :: Handle -> IO () #

hGetEcho :: Handle -> IO Bool #

hIsClosed :: Handle -> IO Bool #

hIsEOF :: Handle -> IO Bool #

hIsOpen :: Handle -> IO Bool #

hIsReadable :: Handle -> IO Bool #

hIsSeekable :: Handle -> IO Bool #

hIsWritable :: Handle -> IO Bool #

hSeek :: Handle -> SeekMode -> Integer -> IO () #

hSetBinaryMode :: Handle -> Bool -> IO () #

hSetEcho :: Handle -> Bool -> IO () #

hSetFileSize :: Handle -> Integer -> 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 #

hGetContents' :: Handle -> IO String #

hPutBuf :: Handle -> Ptr a -> Int -> IO () #

hPutBufNonBlocking :: Handle -> Ptr a -> Int -> IO Int #

hPutChar :: Handle -> Char -> IO () #

hWaitForInput :: Handle -> Int -> IO Bool #

withBinaryFile :: FilePath -> IOMode -> (Handle -> IO r) -> IO r #

withFile :: FilePath -> IOMode -> (Handle -> IO r) -> IO r #

putMVar :: MVar a -> a -> IO () #

readMVar :: MVar a -> IO a #

fixIO :: (a -> IO a) -> IO a #

getContents' :: IO String #

hPrint :: Show a => Handle -> a -> IO () #

hReady :: Handle -> IO Bool #

readFile' :: FilePath -> IO String #

createPipeFd :: IO (FD, FD) #

rawSystem :: String -> [String] -> IO ExitCode #

readCreateProcess :: CreateProcess -> String -> IO String #

readCreateProcessWithExitCode :: CreateProcess -> String -> IO (ExitCode, String, String) #

readProcess :: FilePath -> [String] -> String -> IO String #

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 #

system :: String -> IO ExitCode #

dbg0 :: Show a => String -> a -> a #

dbg0IO :: (MonadIO m, Show a) => String -> a -> m () #

dbg0With :: (a -> String) -> a -> a #

dbg1IO :: (MonadIO m, Show a) => String -> a -> m () #

dbg2 :: Show a => String -> a -> a #

dbg2IO :: (MonadIO m, Show a) => String -> a -> m () #

dbg2With :: Show a => (a -> String) -> a -> a #

dbg3 :: Show a => String -> a -> a #

dbg3IO :: (MonadIO m, Show a) => String -> a -> m () #

dbg3With :: Show a => (a -> String) -> a -> a #

dbg4IO :: (MonadIO m, Show a) => String -> a -> m () #

dbg4With :: Show a => (a -> String) -> a -> a #

dbg5 :: Show a => String -> a -> a #

dbg5IO :: (MonadIO m, Show a) => String -> a -> m () #

dbg5With :: Show a => (a -> String) -> a -> a #

dbg6 :: Show a => String -> a -> a #

dbg6IO :: (MonadIO m, Show a) => String -> a -> m () #

dbg6With :: Show a => (a -> String) -> a -> a #

dbg7IO :: (MonadIO m, Show a) => String -> a -> m () #

dbg7With :: Show a => (a -> String) -> a -> a #

dbg8 :: Show a => String -> a -> a #

dbg8IO :: (MonadIO m, Show a) => String -> a -> m () #

dbg8With :: Show a => (a -> String) -> a -> a #

dbg9 :: Show a => String -> a -> a #

dbg9IO :: (MonadIO m, Show a) => String -> a -> m () #

dbg9With :: Show a => (a -> String) -> a -> a #

dbgExit :: Show a => String -> a -> a #

ptrace :: Show a => a -> a #

ptraceAt :: Show a => Int -> String -> a -> a #

ptraceAtIO :: (MonadIO m, Show a) => Int -> String -> a -> m () #

ptraceLogAt :: Show a => Int -> String -> a -> a #

ptraceLogAtIO :: (MonadIO m, Show a) => Int -> String -> a -> m () #

ptraceOrLogAt :: Show a => Int -> String -> a -> a #

ptraceOrLogAtIO :: (MonadIO m, Show a) => Int -> String -> a -> m () #

traceAt :: Int -> String -> a -> a #

traceAtWith :: Int -> (a -> String) -> a -> a #

traceLog :: String -> a -> a #

traceLogAt :: Int -> String -> a -> a #

traceLogAtIO :: MonadIO m => Int -> String -> m () #

traceLogAtWith :: Int -> (a -> String) -> a -> a #

traceLogIO :: MonadIO m => String -> m () #

traceLogWith :: (a -> String) -> a -> a #

traceOrLog :: String -> a -> a #

traceOrLogAt :: Int -> String -> a -> a #

traceWith :: (a -> String) -> a -> a #

bgColor :: ColorIntensity -> Color -> String -> String #

bgColorB :: ColorIntensity -> Color -> WideBuilder -> WideBuilder #

black' :: String -> String #

blue' :: String -> String #

bold' :: String -> String #

brightBlack' :: String -> String #

brightBlue' :: String -> String #

brightCyan' :: String -> String #

brightGreen' :: String -> String #

brightMagenta' :: String -> String #

brightRed' :: String -> String #

brightWhite' :: String -> String #

brightYellow' :: String -> String #

color :: ColorIntensity -> Color -> String -> String #

colorOption :: String #

cyan' :: String -> String #

faint' :: String -> String #

green' :: String -> String #

magenta' :: String -> String #

pprint :: Show a => a -> IO () #

pprint' :: Show a => a -> IO () #

progArgs :: [String] #

pshow :: Show a => a -> String #

pshow' :: Show a => a -> String #

red' :: String -> String #

rgb' :: Word8 -> Word8 -> Word8 -> String -> String #

terminalBgColor :: Maybe (RGB Float) #

terminalFgColor :: Maybe (RGB Float) #

usageError :: String -> a #

white' :: String -> String #

yellow' :: String -> String #

choiceInState :: forall s (m :: Type -> Type) a. [StateT s (ParsecT HledgerParseErrorData Text m) a] -> StateT s (ParsecT HledgerParseErrorData Text m) a #

dbgparse :: forall (m :: Type -> Type). Int -> String -> TextParser m () #

eolof :: forall (m :: Type -> Type). TextParser m () #

fromparse :: (Show t, Show (Token t), Show e) => Either (ParseErrorBundle t e) a -> a #

isNewline :: Char -> Bool #

nonspace :: forall (m :: Type -> Type). TextParser m Char #

parseWithState :: Monad m => st -> StateT st (ParsecT HledgerParseErrorData Text m) a -> Text -> m (Either HledgerParseErrors a) #

parseWithState' :: Stream s => st -> StateT st (ParsecT e s Identity) a -> s -> Either (ParseErrorBundle s e) a #

parseerror :: (Show t, Show (Token t), Show e) => ParseErrorBundle t e -> a #

parsewithString :: Parsec e String a -> String -> Either (ParseErrorBundle String e) a #

restofline :: forall (m :: Type -> Type). TextParser m String #

showDateParseError :: (Show t, Show (Token t), Show e) => ParseErrorBundle t e -> String #

skipNonNewlineSpaces' :: forall s (m :: Type -> Type). (Stream s, Token s ~ Char) => ParsecT HledgerParseErrorData s m Bool #

skipNonNewlineSpaces1 :: forall s (m :: Type -> Type). (Stream s, Token s ~ Char) => ParsecT HledgerParseErrorData s m () #

spacenonewline :: forall s (m :: Type -> Type). (Stream s, Char ~ Token s) => ParsecT HledgerParseErrorData s m Char #

surroundedBy :: Applicative m => m openclose -> m a -> m a #

traceOrLogParse :: forall (m :: Type -> Type). String -> TextParser m () #

regexMatch :: Regexp -> String -> Bool #

regexMatchText :: Regexp -> Text -> Bool #

regexReplace :: Regexp -> Replacement -> String -> Either RegexError String #

regexReplaceAllBy :: Regexp -> (String -> String) -> String -> String #

chomp :: String -> String #

chomp1 :: String -> String #

elideLeft :: Int -> String -> String #

elideRight :: Int -> String -> String #

lowercase :: String -> String #

lstrip :: String -> String #

quoteForCommandLine :: String -> String #

quoteIfNeeded :: String -> String #

rstrip :: String -> String #

singleQuoteIfNeeded :: String -> String #

singleline :: String -> String #

strWidth :: String -> Int #

strWidthAnsi :: String -> Int #

strip1By :: (Char -> Bool) -> String -> String #

strip1Char :: Char -> Char -> String -> String #

stripAnsi :: String -> String #

stripBy :: (Char -> Bool) -> String -> String #

stripbrackets :: String -> String #

takeWidth :: Int -> String -> String #

underline :: String -> String #

unwords' :: [String] -> String #

words' :: String -> [String] #

assertLeft :: (HasCallStack, Eq b, Show b) => Either a b -> Assertion #

assertParse :: (HasCallStack, Default st) => StateT st (ParsecT HledgerParseErrorData Text IO) a -> Text -> Assertion #

assertParseE :: (HasCallStack, Eq a, Show a, Default st) => StateT st (ParsecT HledgerParseErrorData Text (ExceptT FinalParseError IO)) a -> Text -> Assertion #

assertParseEq :: (HasCallStack, Eq a, Show a, Default st) => StateT st (ParsecT HledgerParseErrorData Text IO) a -> Text -> a -> Assertion #

assertParseEqE :: (Default st, Eq a, Show a, HasCallStack) => StateT st (ParsecT HledgerParseErrorData Text (ExceptT FinalParseError IO)) a -> Text -> a -> Assertion #

assertParseEqOn :: (HasCallStack, Eq b, Show b, Default st) => StateT st (ParsecT HledgerParseErrorData Text IO) a -> Text -> (a -> b) -> b -> Assertion #

assertParseError :: (HasCallStack, Eq a, Show a, Default st) => StateT st (ParsecT HledgerParseErrorData Text IO) a -> Text -> String -> Assertion #

assertParseErrorE :: (Default st, Eq a, Show a, HasCallStack) => StateT st (ParsecT HledgerParseErrorData Text (ExceptT FinalParseError IO)) a -> Text -> String -> Assertion #

assertParseStateOn :: (HasCallStack, Eq b, Show b, Default st) => StateT st (ParsecT HledgerParseErrorData Text IO) a -> Text -> (st -> b) -> b -> Assertion #

assertRight :: (HasCallStack, Eq a, Show a) => Either a b -> Assertion #

fitText :: Maybe Int -> Maybe Int -> Bool -> Bool -> Text -> Text #

formatText :: Bool -> Maybe Int -> Maybe Int -> Text -> Text #

textElideRight :: Int -> Text -> Text #

textTakeWidth :: Int -> Text -> Text #

unlinesB :: [Builder] -> Builder #

traceIO :: String -> IO () #

traceShowId :: Show a => a -> a #

charWidth :: Char -> Int #

curry2 :: ((a, b) -> c) -> a -> b -> c #

curry4 :: ((a, b, c, d) -> e) -> a -> b -> c -> d -> e #

fifth5 :: (a, b, c, d, e) -> e #

fifth6 :: (a, b, c, d, e, f) -> e #

first5 :: (a, b, c, d, e) -> a #

first6 :: (a, b, c, d, e, f) -> a #

fourth4 :: (a, b, c, d) -> d #

fourth5 :: (a, b, c, d, e) -> d #

fourth6 :: (a, b, c, d, e, f) -> d #

makeHledgerClassyLenses :: Name -> DecsQ #

mapM' :: Monad f => (a -> f b) -> [a] -> f [b] #

maximum' :: Integral a => [a] -> a #

maximumStrict :: Ord a => [a] -> a #

minimumStrict :: Ord a => [a] -> a #

multicol :: Int -> [String] -> String #

second4 :: (a, b, c, d) -> b #

second5 :: (a, b, c, d, e) -> b #

second6 :: (a, b, c, d, e, f) -> b #

sequence' :: Monad f => [f a] -> f [a] #

sixth6 :: (a, b, c, d, e, f) -> f #

splitAtElement :: Eq a => a -> [a] -> [[a]] #

sumStrict :: Num a => [a] -> a #

third4 :: (a, b, c, d) -> c #

third5 :: (a, b, c, d, e) -> c #

third6 :: (a, b, c, d, e, f) -> c #

uncurry2 :: (a -> b -> c) -> (a, b) -> c #

uncurry4 :: (a -> b -> c -> d -> e) -> (a, b, c, d) -> e #

adjustOption :: IsOption v => (v -> v) -> TestTree -> TestTree #

askOption :: IsOption v => (v -> TestTree) -> TestTree #

defaultIngredients :: [Ingredient] #

localOption :: IsOption v => v -> TestTree -> TestTree #

withResource :: IO a -> (a -> IO ()) -> (IO a -> TestTree) -> TestTree #

defaultMainWithIngredients :: [Ingredient] -> TestTree -> IO () #

includingOptions :: [OptionDescription] -> Ingredient #

mkTimeout :: Integer -> Timeout #

(@=?) :: (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 #

testCaseSteps :: TestName -> ((String -> IO ()) -> Assertion) -> TestTree #

trace :: String -> a -> a #

isUpper :: Char -> Bool #

formatInt :: (Integral a, Bounded a) => a -> FieldFormatter #

hPrintf :: HPrintfType r => Handle -> String -> r #

perror :: String -> a #

getArgs :: IO [String] #

getEnvironment :: IO [(String, String)] #

getProgName :: IO String #

setEnv :: String -> String -> IO () #

unsetEnv :: String -> IO () #

withProgName :: String -> IO a -> IO a #

isRelative :: FilePath -> Bool #

iterate' :: (a -> a) -> a -> [a] #

takeMVar :: MVar a -> IO a #

mode :: Name -> a -> Help -> Arg a -> [Flag a] -> Mode a #

deleteBy :: (a -> a -> Bool) -> a -> [a] -> [a] #

deleteFirstsBy :: (a -> a -> Bool) -> [a] -> [a] -> [a] #

genericDrop :: Integral i => i -> [a] -> [a] #

genericIndex :: Integral i => [a] -> i -> a #

genericLength :: Num i => [a] -> i #

genericReplicate :: Integral i => i -> a -> [a] #

genericSplitAt :: Integral i => i -> [a] -> ([a], [a]) #

insertBy :: (a -> a -> Ordering) -> a -> [a] -> [a] #

intersectBy :: (a -> a -> Bool) -> [a] -> [a] -> [a] #

permutations :: [a] -> [[a]] #

subsequences :: [a] -> [[a]] #

unionBy :: (a -> a -> Bool) -> [a] -> [a] -> [a] #

unzip7 :: [(a, b, c, d, e, f, g)] -> ([a], [b], [c], [d], [e], [f], [g]) #

zip7 :: [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -> [(a, b, c, d, e, f, g)] #

zipWith7 :: (a -> b -> c -> d -> e -> f -> g -> h) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -> [h] #

isSubsequenceOf :: Eq a => [a] -> [a] -> Bool #

lefts :: [Either a b] -> [a] #

rights :: [Either a b] -> [b] #

asum :: (Foldable t, Alternative f) => t (f a) -> f a #

msum :: (Foldable t, MonadPlus m) => t (m a) -> m a #

flagOpt :: String -> [Name] -> Update a -> FlagHelp -> Help -> Flag a #

flagArg :: Update a -> FlagHelp -> Arg a #

toGroup :: [a] -> Group a #

helpText :: [String] -> HelpFormat -> Mode a -> [Text] #

expandArgsAt :: [String] -> IO [String] #

splitReaderPrefix :: PrefixedFilePath -> (Maybe String, FilePath) #

splitExtension :: FilePath -> (String, String) #

optional :: Alternative f => f a -> f (Maybe a) #

takeBaseName :: FilePath -> String #

takeExtension :: FilePath -> String #

throwTo :: Exception e => ThreadId -> e -> IO () #

(<$!>) :: Monad m => (a -> b) -> m a -> m b #

(>=>) :: Monad m => (a -> m b) -> (b -> m c) -> a -> m c #

replicateM_ :: Applicative m => Int -> m a -> m () #

unless :: Applicative f => Bool -> f () -> f () #

forever :: Applicative f => f a -> f b #

mapAndUnzipM :: Applicative m => (a -> m (b, c)) -> [a] -> m ([b], [c]) #

mfilter :: MonadPlus m => (a -> Bool) -> m a -> m a #

guard :: Alternative f => Bool -> f () #

lexLitChar :: ReadS String #

readLitChar :: ReadS Char #

isAlpha :: Char -> Bool #

isAsciiLower :: Char -> Bool #

isAsciiUpper :: Char -> Bool #

isControl :: Char -> Bool #

isHexDigit :: Char -> Bool #

isLatin1 :: Char -> Bool #

isLower :: Char -> Bool #

isOctDigit :: Char -> Bool #

isPrint :: Char -> Bool #

isPunctuation :: Char -> Bool #

isSymbol :: Char -> Bool #

digitToInt :: Char -> Int #

isLetter :: Char -> Bool #

isMark :: Char -> Bool #

isNumber :: Char -> Bool #

isSeparator :: Char -> Bool #

lastDef :: a -> [a] -> a #

foldl1Def' :: a -> (a -> a -> a) -> [a] -> a #

foldl1Def :: a -> (a -> a -> a) -> [a] -> a #

foldr1Def :: a -> (a -> a -> a) -> [a] -> a #

abort :: Partial => String -> a #

assertNote :: Partial => String -> Bool -> a -> a #

atDef :: a -> [a] -> Int -> a #

atNote :: Partial => String -> [a] -> Int -> a #

cycleDef :: [a] -> [a] -> [a] #

cycleMay :: [a] -> Maybe [a] #

cycleNote :: Partial => String -> [a] -> [a] #

elemIndexJust :: (Partial, Eq a) => a -> [a] -> Int #

elemIndexJustDef :: Eq a => Int -> a -> [a] -> Int #

elemIndexJustNote :: (Partial, Eq a) => String -> a -> [a] -> Int #

findIndexJust :: (a -> Bool) -> [a] -> Int #

findIndexJustDef :: Int -> (a -> Bool) -> [a] -> Int #

findIndexJustNote :: Partial => String -> (a -> Bool) -> [a] -> Int #

findJust :: (a -> Bool) -> [a] -> a #

findJustDef :: a -> (a -> Bool) -> [a] -> a #

findJustNote :: Partial => String -> (a -> Bool) -> [a] -> a #

foldl1May :: (a -> a -> a) -> [a] -> Maybe a #

foldl1May' :: (a -> a -> a) -> [a] -> Maybe a #

foldl1Note :: Partial => String -> (a -> a -> a) -> [a] -> a #

foldl1Note' :: Partial => String -> (a -> a -> a) -> [a] -> a #

foldr1May :: (a -> a -> a) -> [a] -> Maybe a #

foldr1Note :: Partial => String -> (a -> a -> a) -> [a] -> a #

fromJustDef :: a -> Maybe a -> a #

fromJustNote :: Partial => String -> Maybe a -> a #

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] #

lastMay :: [a] -> Maybe 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 #

minimumDef :: Ord a => a -> [a] -> a #

minimumMay :: Ord a => [a] -> Maybe a #

minimumNote :: (Partial, Ord a) => String -> [a] -> a #

predDef :: (Enum a, Eq a, Bounded a) => a -> a -> a #

predMay :: (Enum a, Eq a, Bounded a) => a -> Maybe a #

predNote :: (Partial, Enum a, Eq a, Bounded a) => String -> a -> a #

predSafe :: (Enum a, Eq a, Bounded a) => a -> a #

readDef :: Read a => a -> String -> a #

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] #

tailMay :: [a] -> Maybe [a] #

tailNote :: Partial => String -> [a] -> [a] #

tailSafe :: [a] -> [a] #

toEnumDef :: (Enum a, Bounded a) => a -> Int -> a #

toEnumMay :: (Enum a, Bounded a) => Int -> Maybe a #

toEnumNote :: (Partial, Enum a, Bounded a) => String -> Int -> a #

toEnumSafe :: (Enum a, Bounded a) => Int -> a #

modes :: String -> a -> Help -> [Mode a] -> Mode a #

complete :: Mode a -> [String] -> (Int, Int) -> [Complete] #

joinArgs :: [String] -> String #

splitArgs :: String -> [String] #

checkMode :: Mode a -> Maybe String #

flagBool :: [Name] -> (Bool -> a -> a) -> Help -> Flag a #

fromFlagOpt :: FlagInfo -> String #

fromGroup :: Group a -> [a] #

modeEmpty :: a -> Mode a #

modeFlags :: Mode a -> [Flag a] #

modeModes :: Mode a -> [Mode a] #

parseBool :: String -> Maybe Bool #

remap2 :: Remap m => (a -> b) -> (b -> a) -> m a -> m b #

remapUpdate :: (a -> b) -> (b -> (a, a -> b)) -> Update a -> Update b #

flagHelpFormat :: (HelpFormat -> TextFormat -> a -> a) -> Flag a #

flagHelpSimple :: (a -> a) -> Flag a #

flagNumericVersion :: (a -> a) -> Flag a #

flagVersion :: (a -> a) -> Flag a #

flagsVerbosity :: (Verbosity -> a -> a) -> [Flag a] #

processArgs :: Mode a -> IO a #

processValue :: Mode a -> [String] -> a #

processValueIO :: Mode a -> [String] -> IO a #

exeExtension :: String #

findExecutables :: String -> IO [FilePath] #

findFile :: [FilePath] -> String -> IO (Maybe FilePath) #

findFileWith :: (FilePath -> IO Bool) -> [FilePath] -> String -> IO (Maybe FilePath) #

findFiles :: [FilePath] -> String -> IO [FilePath] #

findFilesWith :: (FilePath -> IO Bool) -> [FilePath] -> String -> IO [FilePath] #

getFileSize :: FilePath -> IO Integer #

splitSearchPath :: String -> [FilePath] #

die :: String -> IO a #

(-<.>) :: FilePath -> String -> FilePath #

(<.>) :: FilePath -> String -> FilePath #

hasDrive :: FilePath -> Bool #

isAbsolute :: FilePath -> Bool #

isDrive :: FilePath -> Bool #

isExtSeparator :: Char -> Bool #

isExtensionOf :: String -> FilePath -> Bool #

isValid :: FilePath -> Bool #

matchesQuery :: (Query -> Bool) -> Query -> Bool #

matchesTags :: Regexp -> Maybe Regexp -> [Tag] -> Bool #

parseQuery :: Day -> Text -> Either String (Query, [QueryOpt]) #

parseQueryList :: Day -> [Text] -> Either String (Query, [QueryOpt]) #

queryEndDate :: Bool -> Query -> Maybe Day #

queryIsAcct :: Query -> Bool #

queryIsAmt :: Query -> Bool #

queryIsCode :: Query -> Bool #

queryIsDate :: Query -> Bool #

queryIsDate2 :: Query -> Bool #

queryIsDesc :: Query -> Bool #

queryIsNull :: Query -> Bool #

queryIsReal :: Query -> Bool #

queryIsStartDateOnly :: Bool -> Query -> Bool #

queryIsStatus :: Query -> Bool #

queryIsTag :: Query -> Bool #

queryIsType :: Query -> Bool #

words'' :: [Text] -> Text -> [Text] #

orDieTrying :: MonadIO m => ExceptT String m a -> m a #

readJournal :: InputOpts -> Maybe FilePath -> Text -> ExceptT String IO Journal #

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 () #

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 #

commoditysymbolp :: forall (m :: Type -> Type). TextParser m CommoditySymbol #

costp :: forall (m :: Type -> Type). Amount -> JournalParser m AmountPrice #

datep :: forall (m :: Type -> Type). JournalParser m Day #

datetimep :: forall (m :: Type -> Type). JournalParser m LocalTime #

descriptionp :: forall (m :: Type -> Type). TextParser m Text #

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) #

getParentAccount :: forall (m :: Type -> Type). JournalParser m AccountName #

getYear :: forall (m :: Type -> Type). JournalParser m (Maybe Year) #

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) #

parseamount' :: String -> Amount #

popParentAccount :: forall (m :: Type -> Type). JournalParser m () #

postingcommentp :: forall (m :: Type -> Type). Maybe Year -> TextParser m (Text, [Tag], Maybe Day, Maybe Day) #

pushParentAccount :: forall (m :: Type -> Type). AccountName -> JournalParser m () #

rawnumberp :: forall (m :: Type -> Type). TextParser m (Either AmbiguousNumber RawNumber) #

secondarydatep :: forall (m :: Type -> Type). Day -> TextParser m Day #

setDefaultCommodityAndStyle :: forall (m :: Type -> Type). (CommoditySymbol, AmountStyle) -> JournalParser m () #

setYear :: forall (m :: Type -> Type). Year -> JournalParser m () #

singlespacednoncommenttext1p :: forall (m :: Type -> Type). TextParser m Text #

singlespacedtext1p :: forall (m :: Type -> Type). TextParser m Text #

singlespacedtextsatisfying1p :: forall (m :: Type -> Type). (Char -> Bool) -> TextParser m Text #

singlespacep :: forall (m :: Type -> Type). TextParser m () #

spaceandamountormissingp :: forall (m :: Type -> Type). JournalParser m MixedAmount #

statusp :: forall (m :: Type -> Type). TextParser m Status #

transactioncommentp :: forall (m :: Type -> Type). TextParser m (Text, [Tag]) #

findReader :: forall (m :: Type -> Type). MonadIO m => Maybe StorageFormat -> Maybe FilePath -> Maybe (Reader m) #

tmpostingrulep :: forall (m :: Type -> Type). Maybe Year -> JournalParser m TMPostingRule #

triAmount :: (a, b, c, d, e, f) -> e #

triBalance :: (a, b, c, d, e, f) -> f #

triDate :: (a, Transaction, c, d, e, f) -> Day #

triOrigTransaction :: (a, b, c, d, e, f) -> a #

flat_ :: ReportOpts -> Bool #

overEither :: ((a -> Either e b) -> s -> Either e t) -> (a -> b) -> s -> Either e t #

setEither :: ((a -> Either e b) -> s -> Either e t) -> b -> s -> Either e t #

simplifyStatuses :: Ord a => [a] -> [a] #

tree_ :: ReportOpts -> Bool #

prMapName :: (a -> b) -> PeriodicReport a c -> PeriodicReport b c #

prrAdd :: Semigroup b => PeriodicReportRow a b -> PeriodicReportRow a b -> PeriodicReportRow a b #

runExceptT :: ExceptT e m a -> m (Either e a) #

makeTimeOfDayValid :: Int -> Int -> Pico -> Maybe TimeOfDay #

yield :: IO () #

dupChan :: Chan a -> IO (Chan a) #

getChanContents :: Chan a -> IO [a] #

newChan :: IO (Chan a) #

readChan :: Chan a -> IO a #

writeChan :: Chan a -> a -> IO () #

writeList2Chan :: Chan a -> [a] -> IO () #

addMVarFinalizer :: MVar a -> IO () -> IO () #

mkWeakMVar :: MVar a -> IO () -> IO (Weak (MVar a)) #

modifyMVar :: MVar a -> (a -> IO (a, b)) -> IO b #

modifyMVarMasked :: MVar a -> (a -> IO (a, b)) -> IO b #

modifyMVarMasked_ :: MVar a -> (a -> IO a) -> IO () #

modifyMVar_ :: MVar a -> (a -> IO a) -> IO () #

swapMVar :: MVar a -> a -> IO a #

withMVar :: MVar a -> (a -> IO b) -> IO b #

withMVarMasked :: MVar a -> (a -> IO b) -> IO b #

newQSem :: Int -> IO QSem #

signalQSem :: QSem -> IO () #

waitQSem :: QSem -> IO () #

newQSemN :: Int -> IO QSemN #

signalQSemN :: QSemN -> Int -> IO () #

waitQSemN :: QSemN -> Int -> IO () #

threadWaitRead :: Fd -> IO () #

threadWaitReadSTM :: Fd -> IO (STM (), IO ()) #

threadWaitWrite :: Fd -> IO () #

threadWaitWriteSTM :: Fd -> IO (STM (), IO ()) #

forkIO :: IO () -> IO ThreadId #

forkIOWithUnmask :: ((forall a. IO a -> IO a) -> IO ()) -> IO ThreadId #

forkOn :: Int -> IO () -> IO ThreadId #

forkOnWithUnmask :: Int -> ((forall a. IO a -> IO a) -> IO ()) -> IO ThreadId #

setNumCapabilities :: Int -> IO () #

threadCapability :: ThreadId -> IO (Int, Bool) #

isEmptyMVar :: MVar a -> IO Bool #

newMVar :: a -> IO (MVar a) #

tryPutMVar :: MVar a -> a -> IO Bool #

tryReadMVar :: MVar a -> IO (Maybe a) #

tryTakeMVar :: MVar a -> IO (Maybe a) #

forkFinally :: IO a -> (Either SomeException a -> IO ()) -> IO ThreadId #

forkOS :: IO () -> IO ThreadId #

forkOSWithUnmask :: ((forall a. IO a -> IO a) -> IO ()) -> IO ThreadId #

ioeGetLocation :: IOError -> String #

isEOFError :: IOError -> Bool #

isFullError :: IOError -> Bool #

isUserError :: IOError -> Bool #

modifyIOError :: (IOError -> IOError) -> IO a -> IO a #

activity :: CliOpts -> Journal -> IO () Source #

Print a bar chart of number of postings per report interval.

printDayWith :: (PrintfArg t1, PrintfType t2) => (t3 -> t1) -> (DateSpan, t3) -> t2 Source #

countBar :: Foldable t => t a -> [Char] Source #