Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Synopsis
- class Ord b a where
- newtype Lexicographical a = Lexicographical a
- blueprintGE :: forall r i a w m f. (Arithmetic a, MonadCircuit i a w m, Zip f, Foldable f, KnownNat r) => f i -> f i -> m i
- bitwiseGE :: forall r c f. (Symbolic c, Zip f, Foldable f, KnownNat r) => c f -> c f -> Bool c
- bitwiseGT :: forall r c f. (Symbolic c, Zip f, Foldable f, KnownNat r) => c f -> c f -> Bool c
- getBitsBE :: forall c x. (SymbolicOutput x, Context x ~ c) => x -> c List
Documentation
Instances
newtype Lexicographical a Source #
A newtype wrapper for easy definition of Ord instances (though not necessarily a most effective one)
Instances
blueprintGE :: forall r i a w m f. (Arithmetic a, MonadCircuit i a w m, Zip f, Foldable f, KnownNat r) => f i -> f i -> m i Source #
bitwiseGE :: forall r c f. (Symbolic c, Zip f, Foldable f, KnownNat r) => c f -> c f -> Bool c Source #
Given two lists of bits of equal length, compares them lexicographically.