ligo/src/client/embedded/alpha/client_baking_forge.ml

626 lines
22 KiB
OCaml
Raw Normal View History

2016-09-08 21:13:10 +04:00
(**************************************************************************)
(* *)
(* Copyright (c) 2014 - 2016. *)
(* Dynamic Ledger Solutions, Inc. <contact@tezos.com> *)
(* *)
(* All rights reserved. No warranty, explicit or implicit, provided. *)
(* *)
(**************************************************************************)
open Client_commands
2016-09-08 21:13:10 +04:00
open Logging.Client.Mining
let generate_proof_of_work_nonce () =
Sodium.Random.Bigbytes.generate Constants.proof_of_work_nonce_size
let generate_seed_nonce () =
match Nonce.of_bytes @@
Sodium.Random.Bigbytes.generate Constants.nonce_length with
| Error _ -> assert false
| Ok nonce -> nonce
let rec forge_block_header
cctxt block delegate_sk shell priority seed_nonce_hash =
2017-02-15 20:20:10 +04:00
Client_proto_rpcs.Constants.stamp_threshold
cctxt block >>=? fun stamp_threshold ->
2016-09-08 21:13:10 +04:00
let rec loop () =
let proof_of_work_nonce = generate_proof_of_work_nonce () in
let unsigned_header =
2017-04-20 17:21:10 +04:00
Tezos_context.Block_header.forge_unsigned
shell { priority ; seed_nonce_hash ; proof_of_work_nonce } in
2016-09-08 21:13:10 +04:00
let signed_header =
Environment.Ed25519.Signature.append delegate_sk unsigned_header in
2016-09-08 21:13:10 +04:00
let block_hash = Block_hash.hash_bytes [signed_header] in
if Mining.check_hash block_hash stamp_threshold then
signed_header
2016-09-08 21:13:10 +04:00
else
loop () in
return (loop ())
let empty_proof_of_work_nonce =
MBytes.of_string
(String.make Constants_repr.proof_of_work_nonce_size '\000')
let forge_faked_proto_header ~priority ~seed_nonce_hash =
Tezos_context.Block_header.forge_unsigned_proto_header
{ priority ; seed_nonce_hash ;
proof_of_work_nonce = empty_proof_of_work_nonce }
let assert_valid_operations_hash shell_header operations =
let operations_hash =
Operation_list_list_hash.compute
(List.map Operation_list_hash.compute
(List.map
(List.map
(function
| Client_node_rpcs.Blob op -> Tezos_data.Operation.hash op
| Hash oph -> oph)) operations)) in
fail_unless
(Operation_list_list_hash.equal
operations_hash shell_header.Tezos_data.Block_header.operations_hash)
(failure
2017-11-01 15:07:33 +04:00
"Client_baking_forge.inject_block: \
inconsistent header.")
let inject_block cctxt
?force ~shell_header ~priority ~seed_nonce_hash ~src_sk operations =
assert_valid_operations_hash shell_header operations >>=? fun () ->
let block = `Hash shell_header.Tezos_data.Block_header.predecessor in
forge_block_header cctxt block
src_sk shell_header priority seed_nonce_hash >>=? fun signed_header ->
Client_node_rpcs.inject_block cctxt
?force signed_header operations >>=? fun block_hash ->
2016-09-08 21:13:10 +04:00
return block_hash
type error +=
| Failed_to_preapply of Client_node_rpcs.operation * error list
let () =
register_error_kind
`Permanent
2017-11-01 15:07:33 +04:00
~id:"Client_baking_forge.failed_to_preapply"
~title: "Fail to preapply an operation"
~description: ""
~pp:(fun ppf (op, err) ->
let h =
match op with
| Client_node_rpcs.Hash h -> h
| Blob op -> Tezos_data.Operation.hash op in
Format.fprintf ppf "@[Failed to preapply %a:@ %a@]"
Operation_hash.pp_short h
pp_print_error err)
Data_encoding.
(obj2
(req "operation" (dynamic_size Client_node_rpcs.operation_encoding))
(req "error" Node_rpc_services.Error.encoding))
(function
| Failed_to_preapply (hash, err) -> Some (hash, err)
| _ -> None)
(fun (hash, err) -> Failed_to_preapply (hash, err))
let forge_block cctxt block
2016-09-08 21:13:10 +04:00
?force
?operations ?(best_effort = operations = None) ?(sort = best_effort)
2017-03-08 21:47:01 +04:00
?timestamp
~priority
~seed_nonce_hash ~src_sk () =
2017-04-20 10:26:43 +04:00
let block = Client_rpcs.last_mined_block block in
2016-09-08 21:13:10 +04:00
begin
match operations with
| None ->
2017-02-15 20:20:10 +04:00
Client_node_rpcs.Blocks.pending_operations
cctxt block >>=? fun (ops, pendings) ->
let ops =
Operation_hash.Set.elements @@
Operation_hash.Set.union
(Prevalidation.preapply_result_operations ops)
pendings in
return (List.map (fun x -> Client_node_rpcs.Hash x) ops)
| Some operations -> return operations
end >>=? fun operations ->
2016-09-08 21:13:10 +04:00
begin
match priority with
2017-03-08 21:47:01 +04:00
| `Set prio -> begin
2017-02-15 20:20:10 +04:00
Client_proto_rpcs.Helpers.minimal_time
cctxt block ~prio () >>=? fun time ->
return (prio, time)
2016-09-08 21:13:10 +04:00
end
2017-11-01 15:07:33 +04:00
| `Auto (src_pkh, max_priority, free_baking) ->
Client_proto_rpcs.Context.next_level cctxt block >>=? fun { level } ->
2017-11-01 15:07:33 +04:00
Client_proto_rpcs.Helpers.Rights.baking_rights_for_delegate cctxt
2016-09-08 21:13:10 +04:00
?max_priority
~first_level:level
~last_level:level
block src_pkh () >>=? fun possibilities ->
try
begin
2017-11-01 15:07:33 +04:00
if free_baking then
Client_proto_rpcs.Constants.first_free_baking_slot cctxt block
else
return 0
end >>=? fun min_prio ->
2016-09-08 21:13:10 +04:00
let _, prio, time =
List.find (fun (l,p,_) -> l = level && p >= min_prio) possibilities in
2016-09-08 21:13:10 +04:00
return (prio, time)
with Not_found ->
failwith "No slot found at level %a" Raw_level.pp level
2016-09-08 21:13:10 +04:00
end >>=? fun (priority, minimal_timestamp) ->
(* lwt_log_info "Mining block at level %a prio %d" *)
(* Raw_level.pp level priority >>= fun () -> *)
2016-09-08 21:13:10 +04:00
begin
match timestamp, minimal_timestamp with
| None, timestamp -> return timestamp
| Some timestamp, minimal_timestamp ->
2016-09-08 21:13:10 +04:00
if timestamp < minimal_timestamp then
failwith
2016-09-08 21:13:10 +04:00
"Proposed timestamp %a is earlier than minimal timestamp %a"
Time.pp_hum timestamp
Time.pp_hum minimal_timestamp
else
return timestamp
2016-09-08 21:13:10 +04:00
end >>=? fun timestamp ->
let request = List.length operations in
let proto_header = forge_faked_proto_header ~priority ~seed_nonce_hash in
2017-02-15 20:20:10 +04:00
Client_node_rpcs.Blocks.preapply
cctxt block ~timestamp ~sort ~proto_header operations >>=?
fun { operations = result ; shell_header } ->
let valid = List.length result.applied in
2016-09-08 21:13:10 +04:00
lwt_log_info "Found %d valid operations (%d refused) for timestamp %a"
valid (request - valid)
Time.pp_hum timestamp >>= fun () ->
lwt_log_info "Computed fitness %a"
Fitness.pp shell_header.fitness >>= fun () ->
2016-09-08 21:13:10 +04:00
if best_effort
|| ( Operation_hash.Map.is_empty result.refused
&& Operation_hash.Map.is_empty result.branch_refused
&& Operation_hash.Map.is_empty result.branch_delayed ) then
let operations =
if not best_effort then operations
else
let map =
List.fold_left
(fun map op ->
match op with
| Client_node_rpcs.Hash _ -> map
| Blob op ->
Operation_hash.Map.add (Tezos_data.Operation.hash op) op map)
Operation_hash.Map.empty operations in
List.map
(fun h ->
try Client_node_rpcs.Blob (Operation_hash.Map.find h map)
with _ -> Client_node_rpcs.Hash h)
result.applied in
inject_block cctxt
?force ~shell_header ~priority ~seed_nonce_hash ~src_sk
[operations]
2016-09-08 21:13:10 +04:00
else
Lwt.return_error @@
Utils.filter_map
(fun op ->
let h =
match op with
| Client_node_rpcs.Hash h -> h
| Blob op -> Tezos_data.Operation.hash op in
try Some (Failed_to_preapply
(op, Operation_hash.Map.find h result.refused))
with Not_found ->
try Some (Failed_to_preapply
(op, Operation_hash.Map.find h result.branch_refused))
with Not_found ->
try Some (Failed_to_preapply
(op, Operation_hash.Map.find h result.branch_delayed))
with Not_found -> None)
operations
2016-09-08 21:13:10 +04:00
(** Worker *)
module State : sig
val get_block:
Client_commands.context ->
2016-09-08 21:13:10 +04:00
Raw_level.t -> Block_hash.t list tzresult Lwt.t
val record_block:
Client_commands.context ->
2016-09-08 21:13:10 +04:00
Raw_level.t -> Block_hash.t -> Nonce.t -> unit tzresult Lwt.t
end = struct
module LevelMap = Map.Make(Raw_level)
type t = Block_hash.t list LevelMap.t
let encoding : t Data_encoding.t =
let open Data_encoding in
conv
(fun x -> LevelMap.bindings x)
2017-02-15 20:20:10 +04:00
(fun l ->
List.fold_left
(fun x (y, z) -> LevelMap.add y z x)
LevelMap.empty l)
2016-09-08 21:13:10 +04:00
(list (obj2
(req "level" Raw_level.encoding)
(req "blocks" (list Block_hash.encoding))))
let filename cctxt =
Client_commands.(Filename.concat cctxt.config.base_dir "blocks")
2016-09-08 21:13:10 +04:00
let load cctxt =
let filename = filename cctxt in
2016-09-08 21:13:10 +04:00
if not (Sys.file_exists filename) then return LevelMap.empty else
Data_encoding_ezjsonm.read_file filename >>= function
| Error _ ->
2016-09-08 21:13:10 +04:00
failwith "couldn't to read the block file"
| Ok json ->
2016-09-08 21:13:10 +04:00
match Data_encoding.Json.destruct encoding json with
| exception _ -> (* TODO print_error *)
failwith "didn't understand the block file"
| map ->
return map
let save cctxt map =
2016-09-08 21:13:10 +04:00
Lwt.catch
(fun () ->
let dirname = Client_commands.(cctxt.config.base_dir) in
(if not (Sys.file_exists dirname) then Lwt_utils.create_dir dirname
2016-09-08 21:13:10 +04:00
else Lwt.return ()) >>= fun () ->
let filename = filename cctxt in
2016-09-08 21:13:10 +04:00
let json = Data_encoding.Json.construct encoding map in
Data_encoding_ezjsonm.write_file filename json >>= function
| Error _ -> failwith "Json.write_file"
| Ok () -> return ())
2016-09-08 21:13:10 +04:00
(fun exn ->
failwith
2016-09-08 21:13:10 +04:00
"could not write the block file: %s."
(Printexc.to_string exn))
let lock = Lwt_mutex.create ()
let get_block cctxt level =
2016-09-08 21:13:10 +04:00
Lwt_mutex.with_lock lock
(fun () ->
load cctxt >>=? fun map ->
2016-09-08 21:13:10 +04:00
try
let blocks = LevelMap.find level map in
return blocks
with Not_found -> return [])
let record_block cctxt level hash nonce =
2016-09-08 21:13:10 +04:00
Lwt_mutex.with_lock lock
(fun () ->
load cctxt >>=? fun map ->
2016-09-08 21:13:10 +04:00
let previous =
try LevelMap.find level map
with Not_found -> [] in
save cctxt
2016-09-08 21:13:10 +04:00
(LevelMap.add level (hash :: previous) map)) >>=? fun () ->
Client_proto_nonces.add cctxt hash nonce
2016-09-08 21:13:10 +04:00
end
2017-11-01 15:07:33 +04:00
let get_baking_slot cctxt
?max_priority (bi: Client_baking_blocks.block_info) delegates =
2016-09-08 21:13:10 +04:00
let block = `Hash bi.hash in
let level = Raw_level.succ bi.level.level in
Lwt_list.filter_map_p
(fun delegate ->
2017-11-01 15:07:33 +04:00
Client_proto_rpcs.Helpers.Rights.baking_rights_for_delegate cctxt
2016-09-08 21:13:10 +04:00
?max_priority
~first_level:level
~last_level:level
block delegate () >>= function
| Error errs ->
2017-11-01 15:07:33 +04:00
log_error "Error while fetching baking possibilities:\n%a"
2016-09-08 21:13:10 +04:00
pp_print_error errs ;
Lwt.return_none
| Ok slots ->
let convert = fun (_lvl, slot, timestamp) ->
(timestamp, (bi, slot, delegate)) in
Lwt.return (Some (List.map convert slots)))
2016-09-08 21:13:10 +04:00
delegates >>= fun slots ->
let sorted_slots =
2017-02-15 20:20:10 +04:00
List.sort
(fun (t1,_) (t2,_) -> Time.compare t1 t2)
(List.flatten slots) in
2016-09-08 21:13:10 +04:00
match sorted_slots with
| [] -> Lwt.return None
| slot :: _ -> Lwt.return (Some slot)
2017-11-01 15:07:33 +04:00
let rec insert_baking_slot slot = function
2016-09-08 21:13:10 +04:00
| [] -> [slot]
2017-02-15 20:20:10 +04:00
| ((timestamp,_) :: _) as slots when Time.(fst slot < timestamp) ->
slot :: slots
2017-11-01 15:07:33 +04:00
| slot' :: slots -> slot' :: insert_baking_slot slot slots
2016-09-08 21:13:10 +04:00
type state = {
genesis: Block_hash.t ;
delegates: public_key_hash list ;
2017-11-01 15:07:33 +04:00
mutable best: Client_baking_blocks.block_info ;
2016-09-08 21:13:10 +04:00
mutable future_slots:
2017-11-01 15:07:33 +04:00
(Time.t * (Client_baking_blocks.block_info * int * public_key_hash)) list ;
2016-09-08 21:13:10 +04:00
}
let create_state genesis delegates best =
2016-09-08 21:13:10 +04:00
{ genesis ;
delegates ;
best ;
2016-09-08 21:13:10 +04:00
future_slots = [] ;
}
let drop_old_slots ~before state =
state.future_slots <-
List.filter
(fun (t, _slot) -> Time.compare before t <= 0)
state.future_slots
2016-09-08 21:13:10 +04:00
let compute_timeout { future_slots } =
match future_slots with
| [] ->
Lwt_utils.never_ending
| (timestamp, _) :: _ ->
let now = Time.now () in
let delay = Time.diff timestamp now in
if delay <= 0L then
if delay <= -1800L then
Lwt_unix.sleep 10.
else
Lwt.return_unit
2016-09-08 21:13:10 +04:00
else
Lwt_unix.sleep (Int64.to_float delay)
let get_unrevealed_nonces cctxt ?(force = false) block =
Client_proto_rpcs.Context.next_level cctxt.rpc_config block >>=? fun level ->
let cur_cycle = level.cycle in
match Cycle.pred cur_cycle with
| None -> return []
| Some cycle ->
2017-11-01 15:07:33 +04:00
Client_baking_blocks.blocks_from_cycle
cctxt.rpc_config block cycle >>=? fun blocks ->
filter_map_s (fun hash ->
Client_proto_nonces.find cctxt hash >>= function
| None -> return None
| Some nonce ->
Client_proto_rpcs.Context.level
cctxt.rpc_config (`Hash hash) >>=? fun level ->
if force then
return (Some (hash, (level.level, nonce)))
else
Client_proto_rpcs.Context.Nonce.get
cctxt.rpc_config block level.level >>=? function
| Missing nonce_hash
when Nonce.check_hash nonce nonce_hash ->
cctxt.warning "Found nonce for %a (level: %a)@."
Block_hash.pp_short hash
Level.pp level >>= fun () ->
return (Some (hash, (level.level, nonce)))
| Missing _nonce_hash ->
cctxt.error "Incoherent nonce for level %a"
Raw_level.pp level.level >>= fun () ->
return None
| Forgotten -> return None
| Revealed _ -> return None)
blocks
let safe_get_unrevealed_nonces cctxt block =
get_unrevealed_nonces cctxt block >>= function
| Ok r -> Lwt.return r
| Error err ->
lwt_warn "Cannot read nonces: %a@." pp_print_error err >>= fun () ->
Lwt.return []
let get_delegates cctxt state =
match state.delegates with
| [] ->
Client_keys.get_keys cctxt >>=? fun keys ->
return (List.map (fun (_,pkh,_,_) -> pkh) keys)
| _ :: _ as delegates -> return delegates
let insert_block
2017-11-01 15:07:33 +04:00
cctxt ?max_priority state (bi: Client_baking_blocks.block_info) =
begin
safe_get_unrevealed_nonces cctxt (`Hash bi.hash) >>= fun nonces ->
2017-11-01 15:07:33 +04:00
Client_baking_revelation.forge_seed_nonce_revelation
cctxt ~force:true (`Hash bi.hash) (List.map snd nonces)
end >>= fun _ignore_error ->
if Fitness.compare state.best.fitness bi.fitness < 0 then begin
state.best <- bi ;
drop_old_slots
~before:(Time.add state.best.timestamp (-1800L)) state ;
end ;
get_delegates cctxt state >>=? fun delegates ->
2017-11-01 15:07:33 +04:00
get_baking_slot cctxt.rpc_config ?max_priority bi delegates >>= function
2016-09-08 21:13:10 +04:00
| None ->
lwt_debug
"Can't compute slot for %a" Block_hash.pp_short bi.hash >>= fun () ->
return ()
2016-09-08 21:13:10 +04:00
| Some ((timestamp, (_,_,delegate)) as slot) ->
Client_keys.Public_key_hash.name cctxt delegate >>=? fun name ->
2017-11-01 15:07:33 +04:00
lwt_log_info "New baking slot at %a for %s after %a"
2016-09-08 21:13:10 +04:00
Time.pp_hum timestamp
name
Block_hash.pp_short bi.hash >>= fun () ->
2017-11-01 15:07:33 +04:00
state.future_slots <- insert_baking_slot slot state.future_slots ;
return ()
2016-09-08 21:13:10 +04:00
2017-11-01 15:07:33 +04:00
let pop_baking_slots state =
2016-09-08 21:13:10 +04:00
let now = Time.now () in
let rec pop acc = function
| [] -> List.rev acc, []
| ((timestamp,_) :: _) as slots when Time.compare now timestamp < 0 ->
List.rev acc, slots
| slot :: slots -> pop (slot :: acc) slots in
let slots, future_slots = pop [] state.future_slots in
state.future_slots <- future_slots ;
slots
let insert_blocks cctxt ?max_priority state bis =
iter_s (insert_block cctxt ?max_priority state) bis >>= function
| Ok () ->
Lwt.return_unit
| Error err ->
Format.eprintf "Error: %a" pp_print_error err ;
Lwt.return_unit
2016-09-08 21:13:10 +04:00
let mine cctxt state =
2017-11-01 15:07:33 +04:00
let slots = pop_baking_slots state in
let seed_nonce = generate_seed_nonce () in
let seed_nonce_hash = Nonce.hash seed_nonce in
filter_map_s
(fun (timestamp, (bi, priority, delegate)) ->
2017-11-01 15:07:33 +04:00
let block = `Hash bi.Client_baking_blocks.hash in
2016-09-08 21:13:10 +04:00
let timestamp =
2017-11-01 15:07:33 +04:00
if Block_hash.equal bi.Client_baking_blocks.hash state.genesis then
2016-09-08 21:13:10 +04:00
Time.now ()
else
timestamp in
Client_keys.Public_key_hash.name cctxt delegate >>=? fun name ->
2017-11-01 15:07:33 +04:00
lwt_debug "Try baking after %a (slot %d) for %s (%a)"
2016-09-08 21:13:10 +04:00
Block_hash.pp_short bi.hash
priority name Time.pp_hum timestamp >>= fun () ->
Client_node_rpcs.Blocks.pending_operations cctxt.rpc_config
block >>=? fun (res, ops) ->
2016-09-08 21:13:10 +04:00
let operations =
let open Operation_hash.Set in
List.map (fun x -> Client_node_rpcs.Hash x) @@
elements (union ops (Prevalidation.preapply_result_operations res)) in
2016-09-08 21:13:10 +04:00
let request = List.length operations in
let proto_header =
forge_faked_proto_header ~priority ~seed_nonce_hash in
Client_node_rpcs.Blocks.preapply cctxt.rpc_config block
~timestamp ~sort:true ~proto_header operations >>= function
2016-09-08 21:13:10 +04:00
| Error errs ->
lwt_log_error "Error while prevalidating operations:\n%a"
pp_print_error
errs >>= fun () ->
return None
| Ok { operations ; shell_header } ->
2016-09-08 21:13:10 +04:00
lwt_debug
"Computed condidate block after %a (slot %d): %d/%d fitness: %a"
Block_hash.pp_short bi.hash priority
2016-09-08 21:13:10 +04:00
(List.length operations.applied) request
Fitness.pp shell_header.fitness
2016-09-08 21:13:10 +04:00
>>= fun () ->
return
(Some (bi, priority, shell_header, operations, delegate)))
slots >>=? fun candidates ->
2016-09-08 21:13:10 +04:00
let candidates =
List.sort
(fun (_,_,h1,_,_) (_,_,h2,_,_) ->
match
Fitness.compare h1.Tezos_data.Block_header.fitness h2.fitness
with
| 0 ->
Time.compare h1.timestamp h2.timestamp
| cmp -> ~- cmp)
candidates in
2016-09-08 21:13:10 +04:00
match candidates with
| (bi, priority, shell_header, operations, delegate) :: _
when Fitness.compare state.best.fitness shell_header.fitness < 0 ||
(Fitness.compare state.best.fitness shell_header.fitness = 0 &&
Time.compare shell_header.timestamp state.best.timestamp < 0) -> begin
2016-09-08 21:13:10 +04:00
let level = Raw_level.succ bi.level.level in
cctxt.message
2016-09-08 21:13:10 +04:00
"Select candidate block after %a (slot %d) fitness: %a"
Block_hash.pp_short bi.hash priority
Fitness.pp shell_header.fitness >>= fun () ->
Client_keys.get_key cctxt delegate >>=? fun (_,_,src_sk) ->
inject_block cctxt.rpc_config
~force:true ~shell_header ~priority ~seed_nonce_hash ~src_sk
[List.map (fun h -> Client_node_rpcs.Hash h) operations.applied]
2016-09-08 21:13:10 +04:00
|> trace_exn (Failure "Error while injecting block") >>=? fun block_hash ->
State.record_block cctxt level block_hash seed_nonce
2016-09-08 21:13:10 +04:00
|> trace_exn (Failure "Error while recording block") >>=? fun () ->
Client_keys.Public_key_hash.name cctxt delegate >>=? fun name ->
cctxt.message
2016-09-08 21:13:10 +04:00
"Injected block %a for %s after %a \
\ (level %a, slot %d, fitness %a, operations %d)"
Block_hash.pp_short block_hash
name
Block_hash.pp_short bi.hash
Raw_level.pp level priority
Fitness.pp shell_header.fitness
(List.length operations.applied) >>= fun () ->
2016-09-08 21:13:10 +04:00
return ()
end
| _ ->
lwt_debug "No valid candidates." >>= fun () ->
return ()
2017-02-15 20:20:10 +04:00
let create
cctxt ?max_priority delegates
(block_stream:
2017-11-01 15:07:33 +04:00
Client_baking_blocks.block_info list tzresult Lwt_stream.t)
2017-02-15 20:20:10 +04:00
(endorsement_stream:
2017-11-01 15:07:33 +04:00
Client_baking_operations.valid_endorsement tzresult Lwt_stream.t) =
2016-09-08 21:13:10 +04:00
Lwt_stream.get block_stream >>= function
| None | Some (Ok [] | Error _) ->
cctxt.Client_commands.error "Can't fetch the current block head."
| Some (Ok (bi :: _ as initial_heads)) ->
Client_node_rpcs.Blocks.hash cctxt.rpc_config `Genesis >>=? fun genesis_hash ->
2016-09-08 21:13:10 +04:00
let last_get_block = ref None in
let get_block () =
match !last_get_block with
| None ->
let t = Lwt_stream.get block_stream in
last_get_block := Some t ;
t
| Some t -> t in
let last_get_endorsement = ref None in
let get_endorsement () =
match !last_get_endorsement with
| None ->
let t = Lwt_stream.get endorsement_stream in
last_get_endorsement := Some t ;
t
| Some t -> t in
let state = create_state genesis_hash delegates bi in
insert_blocks cctxt ?max_priority state initial_heads >>= fun () ->
2016-09-08 21:13:10 +04:00
let rec worker_loop () =
let timeout = compute_timeout state in
Lwt.choose [ (timeout >|= fun () -> `Timeout) ;
(get_block () >|= fun b -> `Hash b) ;
(get_endorsement () >|= fun e -> `Endorsement e) ;
] >>= function
| `Hash (None | Some (Error _))
| `Endorsement (None | Some (Error _)) ->
2016-09-08 21:13:10 +04:00
Lwt.return_unit
| `Hash (Some (Ok bis)) -> begin
2016-09-08 21:13:10 +04:00
Lwt.cancel timeout ;
last_get_block := None ;
lwt_debug
"@[<hov 2>Discoverer blocks:@ %a@]"
(Format.pp_print_list
(fun ppf bi ->
2017-11-01 15:07:33 +04:00
Block_hash.pp_short ppf bi.Client_baking_blocks.hash))
2016-09-08 21:13:10 +04:00
bis
>>= fun () ->
insert_blocks cctxt ?max_priority state bis >>= fun () ->
2016-09-08 21:13:10 +04:00
worker_loop ()
end
| `Endorsement (Some (Ok e)) ->
2016-09-08 21:13:10 +04:00
Lwt.cancel timeout ;
last_get_endorsement := None ;
Client_keys.Public_key_hash.name cctxt
2017-11-01 15:07:33 +04:00
e.Client_baking_operations.source >>= fun _source ->
2016-09-08 21:13:10 +04:00
(* TODO *)
worker_loop ()
| `Timeout ->
2017-11-01 15:07:33 +04:00
lwt_debug "Waking up for baking..." >>= fun () ->
2016-09-08 21:13:10 +04:00
begin
mine cctxt state >>= function
2016-09-08 21:13:10 +04:00
| Ok () -> Lwt.return_unit
| Error errs ->
2017-11-01 15:07:33 +04:00
lwt_log_error "Error while baking:\n%a"
2016-09-08 21:13:10 +04:00
pp_print_error
errs >>= fun () ->
Lwt.return_unit
end >>= fun () ->
worker_loop () in
2017-11-01 15:07:33 +04:00
lwt_log_info "Starting baking daemon" >>= fun () ->
worker_loop () >>= fun () ->
return ()
2016-09-08 21:13:10 +04:00
(* FIXME bug in ocamldep ?? *)
open Level