Skip to content

Commit

Permalink
Remove more mentions of "deprecation"
Browse files Browse the repository at this point in the history
Signed-off-by: Rudi Grinberg <rudi.grinberg@gmail.com>
  • Loading branch information
rgrinberg committed Aug 31, 2018
1 parent acf9446 commit 5942ea3
Show file tree
Hide file tree
Showing 3 changed files with 4 additions and 4 deletions.
2 changes: 1 addition & 1 deletion src/dir_contents.ml
Original file line number Diff line number Diff line change
Expand Up @@ -198,7 +198,7 @@ end = struct
| Yes_with_transition _ ->
( wrap_modules modules
, Module.Name.Map.remove modules main_module_name
|> Module.Name.Map.map ~f:Module.deprecate
|> Module.Name.Map.map ~f:Module.wrapped_compat
)
in
let alias_module =
Expand Down
4 changes: 2 additions & 2 deletions src/module.ml
Original file line number Diff line number Diff line change
Expand Up @@ -164,7 +164,7 @@ let to_sexp { name; impl; intf; obj_name ; pp } =
; "pp", (option string) (Option.map ~f:(fun _ -> "has pp") pp)
]

let deprecate t =
let wrapped_compat t =
{ t with
intf = None
; impl =
Expand All @@ -178,7 +178,7 @@ let deprecate t =
in
let path =
Path.L.relative (Path.parent_exn path)
[ ".deprecated"
[ ".wrapped_compat"
; Path.basename path
]
in
Expand Down
2 changes: 1 addition & 1 deletion src/module.mli
Original file line number Diff line number Diff line change
Expand Up @@ -95,4 +95,4 @@ val set_pp : t -> (unit, string list) Build.t option -> t

val to_sexp : t Sexp.To_sexp.t

val deprecate : t -> t
val wrapped_compat : t -> t

0 comments on commit 5942ea3

Please sign in to comment.