Copyright | (c) The University of Glasgow 2005 |
---|---|
License | BSD-style (see the file libraries/base/LICENSE) |
Maintainer | libraries@haskell.org |
Stability | stable |
Portability | portable |
Safe Haskell | Trustworthy |
Language | Haskell2010 |
Data.Ord
Description
Orderings
Synopsis
Documentation
The Ord
class is used for totally ordered datatypes.
Instances of Ord
can be derived for any user-defined
datatype whose constituent types are in Ord
. The declared order
of the constructors in the data declaration determines the ordering
in derived Ord
instances. The Ordering
datatype allows a single
comparison to determine the precise ordering of two objects.
Minimal complete definition: either compare
or <=
.
Using compare
can be more efficient for complex types.
Methods
compare :: a -> a -> Ordering #
(<) :: a -> a -> Bool infix 4 #
(<=) :: a -> a -> Bool infix 4 #
(>) :: a -> a -> Bool infix 4 #
Instances
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 #
Methods
compare :: GeneralCategory -> GeneralCategory -> Ordering #
(<) :: GeneralCategory -> GeneralCategory -> Bool #
(<=) :: GeneralCategory -> GeneralCategory -> Bool #
(>) :: GeneralCategory -> GeneralCategory -> Bool #
(>=) :: GeneralCategory -> GeneralCategory -> Bool #
max :: GeneralCategory -> GeneralCategory -> GeneralCategory #
min :: GeneralCategory -> GeneralCategory -> GeneralCategory #
Methods
compare :: Fingerprint -> Fingerprint -> Ordering #
(<) :: Fingerprint -> Fingerprint -> Bool #
(<=) :: Fingerprint -> Fingerprint -> Bool #
(>) :: Fingerprint -> Fingerprint -> Bool #
(>=) :: Fingerprint -> Fingerprint -> Bool #
max :: Fingerprint -> Fingerprint -> Fingerprint #
min :: Fingerprint -> Fingerprint -> Fingerprint #
Methods
compare :: CSUSeconds -> CSUSeconds -> Ordering #
(<) :: CSUSeconds -> CSUSeconds -> Bool #
(<=) :: CSUSeconds -> CSUSeconds -> Bool #
(>) :: CSUSeconds -> CSUSeconds -> Bool #
(>=) :: CSUSeconds -> CSUSeconds -> Bool #
max :: CSUSeconds -> CSUSeconds -> CSUSeconds #
min :: CSUSeconds -> CSUSeconds -> CSUSeconds #
Methods
compare :: CSigAtomic -> CSigAtomic -> Ordering #
(<) :: CSigAtomic -> CSigAtomic -> Bool #
(<=) :: CSigAtomic -> CSigAtomic -> Bool #
(>) :: CSigAtomic -> CSigAtomic -> Bool #
(>=) :: CSigAtomic -> CSigAtomic -> Bool #
max :: CSigAtomic -> CSigAtomic -> CSigAtomic #
min :: CSigAtomic -> CSigAtomic -> CSigAtomic #
Methods
compare :: SomeSymbol -> SomeSymbol -> Ordering #
(<) :: SomeSymbol -> SomeSymbol -> Bool #
(<=) :: SomeSymbol -> SomeSymbol -> Bool #
(>) :: SomeSymbol -> SomeSymbol -> Bool #
(>=) :: SomeSymbol -> SomeSymbol -> Bool #
max :: SomeSymbol -> SomeSymbol -> SomeSymbol #
min :: SomeSymbol -> SomeSymbol -> SomeSymbol #
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 #
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 #
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 #
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 #
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 #
Methods
compare :: NewlineMode -> NewlineMode -> Ordering #
(<) :: NewlineMode -> NewlineMode -> Bool #
(<=) :: NewlineMode -> NewlineMode -> Bool #
(>) :: NewlineMode -> NewlineMode -> Bool #
(>=) :: NewlineMode -> NewlineMode -> Bool #
max :: NewlineMode -> NewlineMode -> NewlineMode #
min :: NewlineMode -> NewlineMode -> NewlineMode #
Methods
compare :: BufferMode -> BufferMode -> Ordering #
(<) :: BufferMode -> BufferMode -> Bool #
(<=) :: BufferMode -> BufferMode -> Bool #
(>) :: BufferMode -> BufferMode -> Bool #
(>=) :: BufferMode -> BufferMode -> Bool #
max :: BufferMode -> BufferMode -> BufferMode #
min :: BufferMode -> BufferMode -> BufferMode #
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 #
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 #
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 #
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 #
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 #
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 #
Methods
compare :: URec k Word p -> URec k Word p -> Ordering #
(<) :: URec k Word p -> URec k Word p -> Bool #
(<=) :: URec k Word p -> URec k Word p -> Bool #
(>) :: URec k Word p -> URec k Word p -> Bool #
(>=) :: URec k Word p -> URec k Word p -> Bool #
Methods
compare :: URec k Int p -> URec k Int p -> Ordering #
(<) :: URec k Int p -> URec k Int p -> Bool #
(<=) :: URec k Int p -> URec k Int p -> Bool #
(>) :: URec k Int p -> URec k Int p -> Bool #
(>=) :: URec k Int p -> URec k Int p -> Bool #
Methods
compare :: URec k Float p -> URec k Float p -> Ordering #
(<) :: URec k Float p -> URec k Float p -> Bool #
(<=) :: URec k Float p -> URec k Float p -> Bool #
(>) :: URec k Float p -> URec k Float p -> Bool #
(>=) :: URec k Float p -> URec k Float p -> Bool #
Methods
compare :: URec k Double p -> URec k Double p -> Ordering #
(<) :: URec k Double p -> URec k Double p -> Bool #
(<=) :: URec k Double p -> URec k Double p -> Bool #
(>) :: URec k Double p -> URec k Double p -> Bool #
(>=) :: URec k Double p -> URec k Double p -> Bool #
max :: URec k Double p -> URec k Double p -> URec k Double p #
min :: URec k Double p -> URec k Double p -> URec k Double p #
Methods
compare :: URec k Char p -> URec k Char p -> Ordering #
(<) :: URec k Char p -> URec k Char p -> Bool #
(<=) :: URec k Char p -> URec k Char p -> Bool #
(>) :: URec k Char p -> URec k Char p -> Bool #
(>=) :: URec k Char p -> URec k Char p -> Bool #
Methods
compare :: URec k (Ptr ()) p -> URec k (Ptr ()) p -> Ordering #
(<) :: URec k (Ptr ()) p -> URec k (Ptr ()) p -> Bool #
(<=) :: URec k (Ptr ()) p -> URec k (Ptr ()) p -> Bool #
(>) :: URec k (Ptr ()) p -> URec k (Ptr ()) p -> Bool #
(>=) :: URec k (Ptr ()) p -> URec k (Ptr ()) p -> Bool #
max :: URec k (Ptr ()) p -> URec k (Ptr ()) p -> URec k (Ptr ()) p #
min :: URec k (Ptr ()) p -> URec k (Ptr ()) p -> URec k (Ptr ()) p #
Methods
compare :: Coercion k a b -> Coercion k a b -> Ordering #
(<) :: Coercion k a b -> Coercion k a b -> Bool #
(<=) :: Coercion k a b -> Coercion k a b -> Bool #
(>) :: Coercion k a b -> Coercion k a b -> Bool #
(>=) :: Coercion k a b -> Coercion k a b -> Bool #
Methods
compare :: (k :+: f) g p -> (k :+: f) g p -> Ordering #
(<) :: (k :+: f) g p -> (k :+: f) g p -> Bool #
(<=) :: (k :+: f) g p -> (k :+: f) g p -> Bool #
(>) :: (k :+: f) g p -> (k :+: f) g p -> Bool #
(>=) :: (k :+: f) g p -> (k :+: f) g p -> Bool #
Methods
compare :: (k :*: f) g p -> (k :*: f) g p -> Ordering #
(<) :: (k :*: f) g p -> (k :*: f) g p -> Bool #
(<=) :: (k :*: f) g p -> (k :*: f) g p -> Bool #
(>) :: (k :*: f) g p -> (k :*: f) g p -> Bool #
(>=) :: (k :*: f) g p -> (k :*: f) g p -> Bool #
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 #
Methods
compare :: (k1 :~~: k2) a b -> (k1 :~~: k2) a b -> Ordering #
(<) :: (k1 :~~: k2) a b -> (k1 :~~: k2) a b -> Bool #
(<=) :: (k1 :~~: k2) a b -> (k1 :~~: k2) a b -> Bool #
(>) :: (k1 :~~: k2) a b -> (k1 :~~: k2) a b -> Bool #
(>=) :: (k1 :~~: k2) a b -> (k1 :~~: k2) a b -> Bool #
max :: (k1 :~~: k2) a b -> (k1 :~~: k2) a b -> (k1 :~~: k2) a b #
min :: (k1 :~~: k2) a b -> (k1 :~~: k2) a b -> (k1 :~~: k2) a b #
Methods
compare :: Product * f g a -> Product * f g a -> Ordering #
(<) :: Product * f g a -> Product * f g a -> Bool #
(<=) :: Product * f g a -> Product * f g a -> Bool #
(>) :: Product * f g a -> Product * f g a -> Bool #
(>=) :: Product * f g a -> Product * f g a -> Bool #
max :: Product * f g a -> Product * f g a -> Product * f g a #
min :: Product * f g a -> Product * f g a -> Product * f g a #
Methods
compare :: M1 k i c f p -> M1 k i c f p -> Ordering #
(<) :: M1 k i c f p -> M1 k i c f p -> Bool #
(<=) :: M1 k i c f p -> M1 k i c f p -> Bool #
(>) :: M1 k i c f p -> M1 k i c f p -> Bool #
(>=) :: M1 k i c f p -> M1 k i c f p -> Bool #
Methods
compare :: (k2 :.: k1) f g p -> (k2 :.: k1) f g p -> Ordering #
(<) :: (k2 :.: k1) f g p -> (k2 :.: k1) f g p -> Bool #
(<=) :: (k2 :.: k1) f g p -> (k2 :.: k1) f g p -> Bool #
(>) :: (k2 :.: k1) f g p -> (k2 :.: k1) f g p -> Bool #
(>=) :: (k2 :.: k1) f g p -> (k2 :.: k1) f g p -> Bool #
max :: (k2 :.: k1) f g p -> (k2 :.: k1) f g p -> (k2 :.: k1) f g p #
min :: (k2 :.: k1) f g p -> (k2 :.: k1) f g p -> (k2 :.: k1) f g p #
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) #
Methods
compare :: Compose * * f g a -> Compose * * f g a -> Ordering #
(<) :: Compose * * f g a -> Compose * * f g a -> Bool #
(<=) :: Compose * * f g a -> Compose * * f g a -> Bool #
(>) :: Compose * * f g a -> Compose * * f g a -> Bool #
(>=) :: Compose * * f g a -> Compose * * f g a -> Bool #
max :: Compose * * f g a -> Compose * * f g a -> Compose * * f g a #
min :: Compose * * f g a -> Compose * * f g a -> Compose * * f g a #
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) #
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) #
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) #
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) #
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) #
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) #
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) #
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) #
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) #
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) #
Instances
Methods
succ :: Ordering -> Ordering Source #
pred :: Ordering -> Ordering Source #
toEnum :: Int -> Ordering Source #
fromEnum :: Ordering -> Int Source #
enumFrom :: Ordering -> [Ordering] Source #
enumFromThen :: Ordering -> Ordering -> [Ordering] Source #
enumFromTo :: Ordering -> Ordering -> [Ordering] Source #
enumFromThenTo :: Ordering -> Ordering -> Ordering -> [Ordering] Source #
Methods
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ordering -> c Ordering Source #
gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Ordering Source #
toConstr :: Ordering -> Constr Source #
dataTypeOf :: Ordering -> DataType Source #
dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Ordering) Source #
dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Ordering) Source #
gmapT :: (forall b. Data b => b -> b) -> Ordering -> Ordering Source #
gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r Source #
gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r Source #
gmapQ :: (forall d. Data d => d -> u) -> Ordering -> [u] Source #
gmapQi :: Int -> (forall d. Data d => d -> u) -> Ordering -> u Source #
gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering Source #
gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering Source #
gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering Source #
Methods
range :: (Ordering, Ordering) -> [Ordering] Source #
index :: (Ordering, Ordering) -> Ordering -> Int Source #
unsafeIndex :: (Ordering, Ordering) -> Ordering -> Int
inRange :: (Ordering, Ordering) -> Ordering -> Bool Source #
rangeSize :: (Ordering, Ordering) -> Int Source #
unsafeRangeSize :: (Ordering, Ordering) -> Int
The Down
type allows you to reverse sort order conveniently. A value of type
contains a value of type Down
aa
(represented as
).
If Down
aa
has an
instance associated with it then comparing two
values thus wrapped will give you the opposite of their normal sort order.
This is particularly useful when sorting in generalised list comprehensions,
as in: Ord
then sortWith by
Down
x
Provides Show
and Read
instances (since: 4.7.0.0).
Since: 4.6.0.0
Constructors
Instances