Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Synopsis
- class Ord b a where
- 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
Ord a => Ord Bool a Source # | |
Symbolic c => Ord (Bool c) (FieldElement c) Source # | |
Defined in ZkFold.Symbolic.Data.FieldElement (<=) :: FieldElement c -> FieldElement c -> Bool c Source # (<) :: FieldElement c -> FieldElement c -> Bool c Source # (>=) :: FieldElement c -> FieldElement c -> Bool c Source # (>) :: FieldElement c -> FieldElement c -> Bool c Source # max :: FieldElement c -> FieldElement c -> FieldElement c Source # min :: FieldElement c -> FieldElement c -> FieldElement c Source # | |
(Symbolic c, Representable f, Traversable f) => Ord (Bool c) (c f) Source # | Every |
(Symbolic c, KnownNat n, KnownRegisterSize r, KnownRegisters c n r, regSize ~ GetRegisterSize (BaseField c) n r, KnownNat (Ceil regSize OrdWord)) => Ord (Bool c) (UInt n r c) Source # | |
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.