zkfold-base-0.1.0.0: ZkFold Symbolic compiler and zero-knowledge proof protocols
Safe HaskellSafe-Inferred
LanguageHaskell2010

ZkFold.Base.Protocol.ARK.Protostar.Lookup

Documentation

data ProtostarLookup (l :: Natural) (sizeT :: Natural) Source #

Instances

Instances details
(Arithmetic f, KnownNat sizeT) => SpecialSoundProtocol f (ProtostarLookup l sizeT) Source # 
Instance details

Defined in ZkFold.Base.Protocol.ARK.Protostar.Lookup

Associated Types

type Witness f (ProtostarLookup l sizeT) Source #

type Input f (ProtostarLookup l sizeT) Source #

type ProverMessage t (ProtostarLookup l sizeT) Source #

type VerifierMessage t (ProtostarLookup l sizeT) Source #

type Dimension (ProtostarLookup l sizeT) :: Natural Source #

type Degree (ProtostarLookup l sizeT) :: Natural Source #

type Input f (ProtostarLookup l sizeT) Source # 
Instance details

Defined in ZkFold.Base.Protocol.ARK.Protostar.Lookup

type Input f (ProtostarLookup l sizeT) = ProtostarLookupParams f sizeT
type ProverMessage t (ProtostarLookup l sizeT) Source # 
Instance details

Defined in ZkFold.Base.Protocol.ARK.Protostar.Lookup

type ProverMessage t (ProtostarLookup l sizeT) = (Vector l t, SVector sizeT t)
type VerifierMessage t (ProtostarLookup l sizeT) Source # 
Instance details

Defined in ZkFold.Base.Protocol.ARK.Protostar.Lookup

type VerifierMessage t (ProtostarLookup l sizeT) = t
type Witness f (ProtostarLookup l sizeT) Source # 
Instance details

Defined in ZkFold.Base.Protocol.ARK.Protostar.Lookup

type Witness f (ProtostarLookup l sizeT) = Vector l f
type Degree (ProtostarLookup l sizeT) Source # 
Instance details

Defined in ZkFold.Base.Protocol.ARK.Protostar.Lookup

type Degree (ProtostarLookup l sizeT) = 2
type Dimension (ProtostarLookup l sizeT) Source # 
Instance details

Defined in ZkFold.Base.Protocol.ARK.Protostar.Lookup

type Dimension (ProtostarLookup l sizeT) = (l + sizeT) + 1

data ProtostarLookupParams f sizeT Source #

Constructors

ProtostarLookupParams (Zp sizeT -> f) (f -> [Zp sizeT])