Commands.Make
module Prof : sig ... end
val compute_step :
Config.config ->
Wasm_utils.Wasm.tree ->
(Wasm_utils.Wasm.tree * int64) Mavryk_base.TzPervasives.tzresult Lwt.t
val eval_to_result :
Config.config ->
Wasm_utils.tree ->
(Wasm_utils.tree * int64) Mavryk_base.TzPervasives.tzresult Lwt.t
eval_to_result tree
tries to evaluates the PVM until the next `SK_Result` or `SK_Trap`, and stops in case of reveal tick or input tick. It has the property that the memory hasn't been flushed yet and can be inspected.
val eval_kernel_run :
wasm_entrypoint:string ->
Config.config ->
Wasm_utils.Wasm.tree ->
(Wasm_utils.Wasm_fast.tree * int64) Mavryk_base.TzPervasives.tzresult Lwt.t
val eval_until_input_requested :
?write_debug:Mavryk_scoru_wasm.Builtins.write_debug ->
wasm_entrypoint:string ->
Config.config ->
Wasm_utils.Wasm.tree ->
(Wasm_utils.Wasm.tree * int64) Mavryk_base.TzPervasives.tzresult Lwt.t
val produce_flamegraph :
collapse:bool ->
max_depth:int ->
Config.config ->
Profiling.function_call Profiling.call_stack option list ->
unit
val profiling_results :
Profiling.function_call Profiling.call_stack option ->
unit
val eval_and_profile :
collapse:bool ->
with_time:bool ->
no_reboot:bool ->
Config.config ->
string Custom_section.FuncMap.t ->
Wasm_utils.Tree_encoding_runner.tree ->
Wasm_utils.Wasm.tree Mavryk_base.TzPervasives.tzresult Lwt.t
val set_raw_message_input_step :
int32 ->
Z.t ->
string ->
Wasm_utils.Wasm.tree ->
Wasm_utils.Wasm.tree Lwt.t
val check_input_request :
Wasm_utils.Wasm.tree ->
(unit, string) Stdlib.result Lwt.t
val load_inputs_gen :
string list Mavryk_base.TzPervasives.Seq.t ->
int32 ->
Wasm_utils.tree ->
(Wasm_utils.tree * string list Mavryk_base.TzPervasives.Seq.t * int32,
Mavryk_base.TzPervasives.tztrace)
Stdlib.result
Lwt.t
val load_inputs :
string list Mavryk_base.TzPervasives.Seq.t ->
int32 ->
Wasm_utils.Wasm.tree ->
(Wasm_utils.Wasm.tree * string list Mavryk_base.TzPervasives.Seq.t * int32,
Mavryk_base.TzPervasives.tztrace)
Stdlib.result
Lwt.t
val eval :
?write_debug:Mavryk_scoru_wasm.Builtins.write_debug ->
wasm_entrypoint:string ->
int32 ->
string list Mavryk_base.TzPervasives.Seq.t ->
Config.config ->
eval_step ->
Wasm_utils.Wasm.tree ->
(Wasm_utils.Wasm.tree
* int64
* string list Mavryk_base.TzPervasives.Seq.t
* int32,
Mavryk_base.TzPervasives.tztrace)
Stdlib.result
Lwt.t
val profile :
collapse:bool ->
with_time:bool ->
no_reboot:bool ->
int32 ->
string list Mavryk_base.TzPervasives.Seq.t ->
Config.config ->
string Custom_section.FuncMap.t ->
Wasm_utils.Tree_encoding_runner.tree ->
(Wasm_utils.Wasm.tree * string list Mavryk_base.TzPervasives.Seq.t * int32,
Mavryk_base.TzPervasives.tztrace)
Stdlib.result
Lwt.t
val pp_input_request :
Stdlib.Format.formatter ->
Mavryk_scoru_wasm.Wasm_pvm_state.input_request ->
unit
val show_status : Wasm_utils.Wasm.tree -> unit Lwt.t
val step :
wasm_entrypoint:string ->
int32 ->
string list Mavryk_base.TzPervasives.Seq.t ->
Config.config ->
eval_step ->
Wasm_utils.Wasm.tree ->
((Wasm_utils.Wasm.tree * string list Mavryk_base.TzPervasives.Seq.t * int32)
option,
Mavryk_base.TzPervasives.tztrace)
Stdlib.result
Lwt.t
val show_inbox : Wasm_utils.Wasm.tree -> unit Lwt.t
val show_outbox_gen : Wasm_utils.Wasm.tree -> int32 -> unit Lwt.t
val show_outbox : Wasm_utils.Wasm.tree -> int32 -> unit Lwt.t
val find_key_in_durable :
Wasm_utils.tree ->
Mavryk_scoru_wasm.Durable.key ->
Mavryk_lazy_containers.Chunked_byte_vector.t option Lwt.t
val print_durable :
?depth:int ->
?show_values:bool ->
?path:string list ->
Wasm_utils.Ctx.Tree.tree ->
unit Lwt.t
val show_durable : Wasm_utils.Ctx.Tree.tree -> unit Lwt.t
val show_subkeys : Wasm_utils.Ctx.Tree.tree -> string -> unit Lwt.t
val show_value : Repl_helpers.printable_value_kind -> string -> string
val show_key_gen :
Wasm_utils.tree ->
Mavryk_scoru_wasm.Durable.key ->
Repl_helpers.printable_value_kind ->
unit Lwt.t
val show_key :
Wasm_utils.tree ->
string ->
Repl_helpers.printable_value_kind ->
unit Lwt.t
val load_memory :
Wasm_utils.Wasm.tree ->
Mavryk_webassembly_interpreter.Instance.memory_inst Lwt.t
val show_memory :
Wasm_utils.Wasm.tree ->
Mavryk_webassembly_interpreter.Memory.address ->
int ->
Repl_helpers.printable_value_kind ->
unit Lwt.t
val dump_function_symbols : string Custom_section.FuncMap.t -> unit Lwt.t
val reveal_preimage :
Config.config ->
string option ->
Wasm_utils.Wasm.tree ->
Wasm_utils.Wasm.tree Lwt.t
val reveal_metadata :
Config.config ->
Wasm_utils.Wasm.tree ->
Wasm_utils.Wasm.tree Lwt.t
val get_function_symbols :
Wasm_utils.tree ->
(string Custom_section.FuncMap.t, Mavryk_base.TzPervasives.tztrace)
Stdlib.result
Lwt.t
val handle_command :
string ->
Config.config ->
Wasm_utils.Wasm.tree ->
string list Mavryk_base.TzPervasives.Seq.t ->
int32 ->
((Wasm_utils.Wasm.tree * string list Mavryk_base.TzPervasives.Seq.t * int32)
option,
Mavryk_base.TzPervasives.tztrace)
Stdlib.result
Lwt.t