Ordering
base Prelude Data.Ord GHC.Base GHC.Exts,
ghc-prim GHC.Types,
ghc GHC.Prelude.Basic,
protolude Protolude Protolude Protolude.Base,
relude Relude.Base,
rio RIO.Prelude.Types,
base-prelude BasePrelude,
classy-prelude ClassyPrelude,
numeric-prelude NumericPrelude NumericPrelude.Base,
basic-prelude CorePrelude,
basement Basement.Compat.Base Basement.Imports,
beam-core Database.Beam.Backend.SQL.AST,
clash-prelude Clash.HaskellPrelude,
github GitHub.Internal.Prelude,
foundation Foundation,
prelude-compat Prelude2010,
ghc-internal GHC.Internal.Base GHC.Internal.Data.Ord GHC.Internal.Exts,
xmonad-contrib XMonad.Config.Prime,
constrained-categories Control.Category.Constrained.Prelude Control.Category.Hask,
incipit-base Incipit.Base,
yesod-paginator Yesod.Paginator.Prelude,
distribution-opensuse OpenSuse.Prelude hedgehog Hedgehog.Internal.Prelude,
base-compat Prelude.Compat,
Cabal-syntax Distribution.Compat.Prelude,
universum Universum.Base Universum.Base,
ihaskell IHaskellPrelude,
ghc-lib-parser GHC.Prelude.Basic,
dimensional Numeric.Units.Dimensional.Prelude,
haxl Haxl.Prelude,
rebase Rebase.Prelude,
hledger Hledger.Cli.Script,
mixed-types-num Numeric.MixedTypes.PreludeHiding,
copilot-language Copilot.Language.Prelude,
LambdaHack Game.LambdaHack.Core.Prelude,
cabal-install-solver Distribution.Solver.Compat.Prelude,
faktory Faktory.Prelude,
vcr Imports,
verset Verset,
hledger-web Hledger.Web.Import,
termonad Termonad.Prelude Valid for: GN;
Default: none;
Notes:
Dot
only
Describes the way two values can be compared.
These values can be used with a
[callback
gLib.CompareFunc]. However, a
GCompareFunc is allowed to return any integer values. For
converting such a value to a
GtkOrdering value, use
Ordering.
from_cmpfunc().
This module defines monad transformer which lift from query into query
with ordering.
This module defines ordering of signatures, which lifts to ordering of
terms and contexts.
This module defines ordering of signatures, which lifts to ordering of
terms and contexts.
Specify an ordering of edges of a node: either the outgoing or the
incoming edges of a node must appear left-to-right in the same order
in which they are defined in the input.
When specified as both a global graph or sub-graph level attribute,
then it takes precedence over an attribute specified for an individual
node.
A value of type
Ordering is encoded as follows in binary
encoding.
0 ==> LT
1 ==> EQ
2 ==> GT
Pre-release
A value of type
Ordering is encoded as follows in binary
encoding.
0 ==> LT
1 ==> EQ
2 ==> GT
Pre-release
Ordering data type for type literals that provides proof of their
ordering.
the first value is larger than the second
the first value is smaller than the second
Ordering over two distinct types with a proof they are equal.
Type to accumulate ordering context. Type c is ordering term
record context type.
Ordering data type for type literals that provides proof of their
ordering.
Type to accumulate ordering context. Type c is ordering term
record context type.
A sum type to help the specification of a column ordering (Ascending,
or Descending)