Skip to content

Commit

Permalink
Revert #7415 and #7450 (#7887)
Browse files Browse the repository at this point in the history
* Revert "fix(x-compilation): delay evaluation of `ppx_runtime_deps` until context is known"

This reverts commit ab74a71.

Signed-off-by: Etienne Millon <me@emillon.org>

* Revert "test(x-compilation): demonstrate overlap check failure with ppx_runtime_libraries"

This reverts commit 096fc97.

Signed-off-by: Etienne Millon <me@emillon.org>

* Revert "fix(x-compilation): find host ppx dependencies in the host context (#7415)"

This reverts commit 16a7e88.

Signed-off-by: Etienne Millon <me@emillon.org>

* Changelog

Signed-off-by: Etienne Millon <me@emillon.org>

---------

Signed-off-by: Etienne Millon <me@emillon.org>
  • Loading branch information
emillon committed Jun 5, 2023
1 parent 1106c6c commit 886df09
Show file tree
Hide file tree
Showing 16 changed files with 123 additions and 292 deletions.
5 changes: 4 additions & 1 deletion CHANGES.md
Expand Up @@ -26,6 +26,9 @@ Unreleased
- The `interface` and `implementation` fields of a `(dialect)` are now optional
(#7757, @gpetiot)

- Revert #7415 and #7450 (Resolve `ppx_runtime_libraries` in the target context when
cross compiling) (#7887, fixes #7875, @emillon)

3.8.0 (2023-05-23)
------------------

Expand Down Expand Up @@ -82,7 +85,7 @@ Unreleased
- Fix `dune install` when cross compiling (#7410, fixes #6191, @anmonteiro,
@rizo)

- Find `pps` dependencies in the host context when cross-compiling, (#7410,
- Find `pps` dependencies in the host context when cross-compiling, (#7415,
fixes #4156, @anmonteiro)

- Dune in watch mode no longer builds concurrent rules in serial (#7395
Expand Down
5 changes: 3 additions & 2 deletions src/dune_rules/buildable_rules.ml
Expand Up @@ -56,8 +56,9 @@ let modules_rules ~preprocess ~preprocessor_deps ~lint
(Preprocess.Per_module.instrumentation_deps preprocess
~instrumentation_backend)
in
Preprocessing.make sctx ~dir ~preprocess:preprocess_with_instrumentation
~expander ~preprocessor_deps ~instrumentation_deps ~lint ~lib_name
Preprocessing.make sctx ~dir ~scope
~preprocess:preprocess_with_instrumentation ~expander ~preprocessor_deps
~instrumentation_deps ~lint ~lib_name
in
let add_empty_intf =
let default = empty_module_interface_if_absent in
Expand Down
2 changes: 1 addition & 1 deletion src/dune_rules/cinaps.ml
Expand Up @@ -120,7 +120,7 @@ let gen_rules sctx t ~dir ~scope =
Preprocessing.make sctx ~dir ~expander
~lint:(Preprocess.Per_module.no_preprocessing ())
~preprocess:t.preprocess ~preprocessor_deps:t.preprocessor_deps
~instrumentation_deps:[] ~lib_name:None
~instrumentation_deps:[] ~lib_name:None ~scope
in
let* modules =
Modules.singleton_exe module_
Expand Down
2 changes: 0 additions & 2 deletions src/dune_rules/expander.ml
Expand Up @@ -65,8 +65,6 @@ type t =

let scope t = t.scope

let scope_host t = t.scope_host

let artifacts t = t.bin_artifacts_host

let dir t = t.dir
Expand Down
2 changes: 0 additions & 2 deletions src/dune_rules/expander.mli
Expand Up @@ -6,8 +6,6 @@ type t

val scope : t -> Scope.t

val scope_host : t -> Scope.t

val dir : t -> Path.Build.t

val context : t -> Context.t
Expand Down
2 changes: 1 addition & 1 deletion src/dune_rules/jsoo/jsoo_rules.ml
Expand Up @@ -355,7 +355,7 @@ let setup_separate_compilation_rules sctx components =
let pkg = Lib_name.parse_string_exn (Loc.none, s_pkg) in
let ctx = Super_context.context sctx in
let open Memo.O in
let* installed_libs = Lib.DB.installed ~host:None ctx in
let* installed_libs = Lib.DB.installed ctx in
Lib.DB.find installed_libs pkg >>= function
| None -> Memo.return ()
| Some pkg ->
Expand Down

0 comments on commit 886df09

Please sign in to comment.