(SpecialSoundProtocol f i p m c d k a, Ring f, HomomorphicCommit m c, RandomOracle (i f) f, RandomOracle c f, KnownNat k) => SpecialSoundProtocol f i p (Vector k (m, c)) (c :: Type) (d :: k1) 1 (FiatShamir (CommitOpen a)) Source # | |
Instance detailsDefined in ZkFold.Base.Protocol.Protostar.FiatShamir |
Scale b a => Scale b (Vector n a) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
(BoolType b, Eq b x) => Eq b (Vector n x) Source # | |
Instance detailsDefined in ZkFold.Symbolic.Data.Eq |
KnownNat size => Arbitrary1 (Vector size) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
KnownNat size => Representable (Vector size) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
Foldable (Vector size) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
Show1 (Vector size) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
Traversable (Vector size) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
KnownNat size => Applicative (Vector size) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
Functor (Vector size) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
KnownNat size => Distributive (Vector size) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
Semialign (Vector size) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
Unzip (Vector size) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
Zip (Vector size) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
(Arbitrary a, KnownNat size) => Arbitrary (Vector size a) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
ToJSON a => ToJSON (Vector n a) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
Generic (Vector size a) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
IsList (Vector n a) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
Show a => Show (Vector size a) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
(KnownNat n, Binary a) => Binary (Vector n a) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
NFData a => NFData (Vector size a) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
Eq a => Eq (Vector size a) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
Ord a => Ord (Vector size a) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
(Random a, KnownNat size) => Random (Vector size a) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
(AdditiveGroup a, KnownNat n) => AdditiveGroup (Vector n a) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
(AdditiveMonoid a, KnownNat n) => AdditiveMonoid (Vector n a) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
AdditiveSemigroup a => AdditiveSemigroup (Vector n a) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
(SymbolicData x, Package (Context x), KnownNat n) => SymbolicData (Vector n x) Source # | |
Instance detailsDefined in ZkFold.Symbolic.Data.Class |
(Symbolic (Context x), KnownNat n, SymbolicInput x) => SymbolicInput (Vector n x) Source # | |
Instance detailsDefined in ZkFold.Symbolic.Data.Input |
(PedersonSetup n c, Scale f c, AdditiveGroup c) => HomomorphicCommit (Vector n f) c Source # | |
Instance detailsDefined in ZkFold.Base.Protocol.Protostar.Commit |
Substitution (Vector n b) (Zp n) b Source # | |
Instance detailsDefined in ZkFold.Base.Algebra.Polynomials.Multivariate.Substitution |
(Arithmetic a, Arbitrary a, Binary a, Binary (Rep p), Arbitrary (Rep i), Binary (Rep i), Ord (Rep i), NFData (Rep i), Representable i, Foldable i, KnownNat l) => Arbitrary (ArithmeticCircuit a p i (Vector l)) Source # | |
Instance detailsDefined in ZkFold.Symbolic.Compiler.ArithmeticCircuit.Instance |
type VerifierOutput f i p (Vector k (m, c)) (c :: Type) (d :: k1) 1 (FiatShamir (CommitOpen a)) Source # | |
Instance detailsDefined in ZkFold.Base.Protocol.Protostar.FiatShamir |
type Rep (Vector size) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
type Rep (Vector size a) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
type Item (Vector n a) Source # | |
Instance detailsDefined in ZkFold.Base.Data.Vector |
type Context (Vector n x) Source # | |
Instance detailsDefined in ZkFold.Symbolic.Data.Class |
type Layout (Vector n x) Source # | |
Instance detailsDefined in ZkFold.Symbolic.Data.Class |
type Payload (Vector n x) Source # | |
Instance detailsDefined in ZkFold.Symbolic.Data.Class |
type Support (Vector n x) Source # | |
Instance detailsDefined in ZkFold.Symbolic.Data.Class |