Skip to content

Commit

Permalink
Long line
Browse files Browse the repository at this point in the history
  • Loading branch information
lthls committed Nov 24, 2023
1 parent ec8121b commit b1800be
Showing 1 changed file with 3 additions and 2 deletions.
5 changes: 3 additions & 2 deletions middle_end/flambda/flambda_iterators.ml
Original file line number Diff line number Diff line change
Expand Up @@ -327,15 +327,16 @@ let map_general ~toplevel f f_named tree =
let new_named =
aux_named_done_something id lam done_something
in
let open Value_rec_types in
(* See comment in [map_rec_binding_sharing] *)
let new_rkind =
match (new_named : Flambda.named) with
| Symbol _ | Const _ | Allocated_const _->
begin match (rkind : Value_rec_types.recursive_binding_kind) with
begin match rkind with
| Constant -> ()
| Static | Not_recursive | Class -> done_something := true
end;
Value_rec_types.Constant
Constant
| Read_mutable _ | Read_symbol_field _ | Set_of_closures _
| Project_closure _ | Move_within_set_of_closures _
| Project_var _ | Prim _ | Expr _ -> rkind
Expand Down

0 comments on commit b1800be

Please sign in to comment.