Skip to content

Commit

Permalink
Remove unused forward declaration
Browse files Browse the repository at this point in the history
  • Loading branch information
voodoos committed Dec 11, 2024
1 parent 77a69af commit 13407ca
Show file tree
Hide file tree
Showing 3 changed files with 0 additions and 10 deletions.
6 changes: 0 additions & 6 deletions src/ocaml/typing/btype.ml
Original file line number Diff line number Diff line change
Expand Up @@ -93,12 +93,6 @@ module TypePairs = struct
f (type_expr t1, type_expr t2))
end

(**** Forward declarations ****)

let print_raw =
ref (fun _ -> assert false : Format_doc.formatter -> type_expr -> unit)


(**** Type level management ****)

let generic_level = Ident.highest_scope
Expand Down
3 changes: 0 additions & 3 deletions src/ocaml/typing/btype.mli
Original file line number Diff line number Diff line change
Expand Up @@ -305,9 +305,6 @@ val method_type : label -> class_signature -> type_expr
@raises [Assert_failure] if the class has no such method. *)
val instance_variable_type : label -> class_signature -> type_expr

(**** Forward declarations ****)
val print_raw: (Format_doc.formatter -> type_expr -> unit) ref

(**** Type information getter ****)

val cstr_type_path : constructor_description -> Path.t
1 change: 0 additions & 1 deletion src/ocaml/typing/printtyp.ml
Original file line number Diff line number Diff line change
Expand Up @@ -76,5 +76,4 @@ let printed_signature = Fmt.compat1 Doc.printed_signature

let () = Env.print_longident := Doc.longident
let () = Env.print_path := Doc.path
let () = Btype.print_raw := Doc.raw_type_expr
let () = Env.shorten_module_path := shorten_module_path

0 comments on commit 13407ca

Please sign in to comment.