ZkFold.Symbolic.Interpreter
Contents
newtype Interpreter a f Source #
Constructors
Fields
Defined in ZkFold.Symbolic.Interpreter
Methods
hpure :: (forall (a0 :: k0). f a0) -> Interpreter a f Source #
hunit :: Interpreter a U1 Source #
hap :: forall (f :: k0 -> Type) (g :: k0 -> Type). Interpreter a (Transform f g) -> Interpreter a f -> Interpreter a g Source #
hliftA2 :: (forall (a0 :: k0). f a0 -> g a0 -> h a0) -> Interpreter a f -> Interpreter a g -> Interpreter a h Source #
hpair :: forall (f :: k0 -> Type) (g :: k0 -> Type). Interpreter a f -> Interpreter a g -> Interpreter a (f :*: g) Source #
hmap :: (forall (a0 :: k0). f a0 -> g a0) -> Interpreter a f -> Interpreter a g Source #
unpack :: forall f (g :: k10 -> Type). Functor f => Interpreter a (f :.: g) -> f (Interpreter a g) Source #
unpackWith :: Functor f => (forall (a0 :: k10). h a0 -> f (g a0)) -> Interpreter a h -> f (Interpreter a g) Source #
pack :: forall f (g :: k10 -> Type). (Foldable f, Functor f) => f (Interpreter a g) -> Interpreter a (f :.: g) Source #
packWith :: (Foldable f, Functor f) => (forall (a0 :: k10). f (g a0) -> h a0) -> f (Interpreter a g) -> Interpreter a h Source #
Defined in ZkFold.Symbolic.Data.Bool
showsPrec :: Int -> Bool (Interpreter a) -> ShowS #
show :: Bool (Interpreter a) -> String #
showList :: [Bool (Interpreter a)] -> ShowS #
Defined in ZkFold.Symbolic.Data.DiscreteField
isZero :: x -> Bool (Interpreter a) Source #
Defined in ZkFold.Symbolic.Data.ByteString
toJSON :: ByteString n (Interpreter (Zp p)) -> Value #
toEncoding :: ByteString n (Interpreter (Zp p)) -> Encoding #
toJSONList :: [ByteString n (Interpreter (Zp p))] -> Value #
toEncodingList :: [ByteString n (Interpreter (Zp p))] -> Encoding #
Associated Types
type Const (ByteString n (Interpreter (Zp p))) Source #
toConstant :: ByteString n (Interpreter (Zp p)) -> Const (ByteString n (Interpreter (Zp p))) Source #
Defined in ZkFold.Symbolic.Data.FFA
type Const (FFA p (Interpreter a)) Source #
toConstant :: FFA p (Interpreter a) -> Const (FFA p (Interpreter a)) Source #
type BaseField (Interpreter a) Source #
type WitnessField (Interpreter a) Source #
witnessF :: Functor f => Interpreter a f -> f (WitnessField (Interpreter a)) Source #
fromCircuitF :: forall (f :: Type -> Type) (g :: Type -> Type). Interpreter a f -> CircuitFun '[f] g (Interpreter a) -> Interpreter a g Source #
sanityF :: BaseField (Interpreter a) ~ a0 => Interpreter a f -> (f a0 -> g a0) -> (Interpreter a f -> Interpreter a g) -> Interpreter a g Source #
parseJSON :: Value -> Parser (Interpreter a f) #
parseJSONList :: Value -> Parser [Interpreter a f] #
Defined in ZkFold.Symbolic.Data.UInt
toJSON :: UInt n r (Interpreter (Zp p)) -> Value #
toEncoding :: UInt n r (Interpreter (Zp p)) -> Encoding #
toJSONList :: [UInt n r (Interpreter (Zp p))] -> Value #
toEncodingList :: [UInt n r (Interpreter (Zp p))] -> Encoding #
toJSON :: Interpreter a f -> Value #
toEncoding :: Interpreter a f -> Encoding #
toJSONList :: [Interpreter a f] -> Value #
toEncodingList :: [Interpreter a f] -> Encoding #
type Rep (Interpreter a f) :: Type -> Type #
from :: Interpreter a f -> Rep (Interpreter a f) x #
to :: Rep (Interpreter a f) x -> Interpreter a f #
showsPrec :: Int -> Interpreter a f -> ShowS #
show :: Interpreter a f -> String #
showList :: [Interpreter a f] -> ShowS #
rnf :: Interpreter a f -> () #
(==) :: Interpreter a f -> Interpreter a f -> Bool #
(/=) :: Interpreter a f -> Interpreter a f -> Bool #
type Const (UInt n r (Interpreter (Zp p))) Source #
toConstant :: UInt n r (Interpreter (Zp p)) -> Const (UInt n r (Interpreter (Zp p))) Source #
at :: a -> a Source #