Skip to content

Commit

Permalink
Rename emitenv_intf.ml to emitenv.mli
Browse files Browse the repository at this point in the history
  • Loading branch information
gretay-js committed Apr 15, 2021
1 parent 8c101f5 commit 3b11044
Show file tree
Hide file tree
Showing 12 changed files with 20 additions and 17 deletions.
12 changes: 6 additions & 6 deletions .depend
Original file line number Diff line number Diff line change
Expand Up @@ -2533,6 +2533,7 @@ asmcomp/emit.cmo : \
asmcomp/mach.cmi \
asmcomp/linear.cmi \
lambda/lambda.cmi \
asmcomp/emitenv.cmi \
asmcomp/emitaux.cmi \
utils/domainstate.cmi \
utils/config.cmi \
Expand All @@ -2555,6 +2556,7 @@ asmcomp/emit.cmx : \
asmcomp/mach.cmx \
asmcomp/linear.cmx \
lambda/lambda.cmx \
asmcomp/emitenv.cmi \
asmcomp/emitaux.cmx \
utils/domainstate.cmx \
utils/config.cmx \
Expand All @@ -2568,15 +2570,15 @@ asmcomp/emit.cmi : \
asmcomp/linear.cmi \
asmcomp/cmm.cmi
asmcomp/emitaux.cmo : \
asmcomp/emitenv_intf.cmo \
asmcomp/emitenv.cmi \
lambda/debuginfo.cmi \
utils/config.cmi \
asmcomp/cmm.cmi \
utils/clflags.cmi \
asmcomp/arch.cmo \
asmcomp/emitaux.cmi
asmcomp/emitaux.cmx : \
asmcomp/emitenv_intf.cmx \
asmcomp/emitenv.cmi \
lambda/debuginfo.cmx \
utils/config.cmx \
asmcomp/cmm.cmx \
Expand All @@ -2585,12 +2587,10 @@ asmcomp/emitaux.cmx : \
asmcomp/emitaux.cmi
asmcomp/emitaux.cmi : \
asmcomp/linear.cmi \
asmcomp/emitenv_intf.cmo \
asmcomp/emitenv.cmi \
lambda/debuginfo.cmi
asmcomp/emitenv_intf.cmo : \
asmcomp/emitenv.cmi : \
asmcomp/linear.cmi
asmcomp/emitenv_intf.cmx : \
asmcomp/linear.cmx
asmcomp/interf.cmo : \
asmcomp/reg.cmi \
asmcomp/proc.cmi \
Expand Down
1 change: 1 addition & 0 deletions asmcomp/amd64/emit.mlp
Original file line number Diff line number Diff line change
Expand Up @@ -23,6 +23,7 @@ open Reg
open Mach
open Linear
open Emitaux
open Emitenv

open X86_ast
open X86_proc
Expand Down
1 change: 1 addition & 0 deletions asmcomp/arm/emit.mlp
Original file line number Diff line number Diff line change
Expand Up @@ -25,6 +25,7 @@ open Reg
open Mach
open Linear
open Emitaux
open Emitenv

(* Output a label *)

Expand Down
1 change: 1 addition & 0 deletions asmcomp/arm64/emit.mlp
Original file line number Diff line number Diff line change
Expand Up @@ -26,6 +26,7 @@ open Reg
open Mach
open Linear
open Emitaux
open Emitenv

(* Names for special regs *)

Expand Down
3 changes: 1 addition & 2 deletions asmcomp/emitaux.ml
Original file line number Diff line number Diff line change
Expand Up @@ -385,9 +385,8 @@ let create_asm_file = ref true
let report_error ppf = function
| Stack_frame_too_large n ->
Format.fprintf ppf "stack frame too large (%d bytes)" n
include Emitenv_intf

let mk_env f p =
let mk_env f (p:'a) : 'a Emitenv.per_function_env =
{
f;
stack_offset = 0;
Expand Down
4 changes: 1 addition & 3 deletions asmcomp/emitaux.mli
Original file line number Diff line number Diff line change
Expand Up @@ -85,6 +85,4 @@ type error =
exception Error of error
val report_error: Format.formatter -> error -> unit

include module type of Emitenv_intf

val mk_env : Linear.fundecl -> 'a -> ('a, 'gc, 'bd) per_function_env
val mk_env : Linear.fundecl -> 'a -> 'a Emitenv.per_function_env
10 changes: 5 additions & 5 deletions asmcomp/emitenv_intf.ml → asmcomp/emitenv.mli
Original file line number Diff line number Diff line change
Expand Up @@ -16,7 +16,7 @@
type label = Linear.label

(* Record calls to caml_call_gc, emitted out of line. *)
type 'a gc_call =
type gc_call =
{ gc_lbl: label; (* Entry label *)
gc_return_lbl: label; (* Where to branch after GC *)
gc_frame_lbl: label; (* Label of frame descriptor *)
Expand All @@ -27,7 +27,7 @@ type 'a gc_call =
caml_ml_array_bound_error per bound check site. Without -g, we can share
a single call. *)

type 'a bound_error_call =
type bound_error_call =
{ bd_lbl: label; (* Entry label *)
bd_frame: label; (* Label of frame descriptor *)
}
Expand All @@ -47,11 +47,11 @@ type int_literal =
}

(* Environment for emitting a function *)
type ('a, 'gc, 'bd) per_function_env = {
type 'a per_function_env = {
f : Linear.fundecl;
mutable stack_offset : int;
mutable call_gc_sites : 'gc gc_call list;
mutable bound_error_sites : 'bd bound_error_call list;
mutable call_gc_sites : gc_call list;
mutable bound_error_sites : bound_error_call list;
mutable bound_error_call : label option;
mutable float_literals : float_literal list;
mutable int_literals : int_literal list;
Expand Down
1 change: 1 addition & 0 deletions asmcomp/i386/emit.mlp
Original file line number Diff line number Diff line change
Expand Up @@ -24,6 +24,7 @@ open Reg
open Mach
open Linear
open Emitaux
open Emitenv
module String = Misc.Stdlib.String

open X86_ast
Expand Down
1 change: 1 addition & 0 deletions asmcomp/power/emit.mlp
Original file line number Diff line number Diff line change
Expand Up @@ -23,6 +23,7 @@ open Reg
open Mach
open Linear
open Emitaux
open Emitenv

(* Reserved space at bottom of stack *)

Expand Down
1 change: 1 addition & 0 deletions asmcomp/riscv/emit.mlp
Original file line number Diff line number Diff line change
Expand Up @@ -23,6 +23,7 @@ open Reg
open Mach
open Linear
open Emitaux
open Emitenv

(* Layout of the stack. The stack is kept 16-aligned. *)

Expand Down
1 change: 1 addition & 0 deletions asmcomp/s390x/emit.mlp
Original file line number Diff line number Diff line change
Expand Up @@ -24,6 +24,7 @@ open Reg
open Mach
open Linear
open Emitaux
open Emitenv

let frame_size env =
let size =
Expand Down
1 change: 0 additions & 1 deletion compilerlibs/Makefile.compilerlibs
Original file line number Diff line number Diff line change
Expand Up @@ -155,7 +155,6 @@ ASMCOMP=\
asmcomp/schedgen.cmo asmcomp/scheduling.cmo \
asmcomp/branch_relaxation_intf.cmo \
asmcomp/branch_relaxation.cmo \
asmcomp/emitenv_intf.cmo \
asmcomp/emitaux.cmo asmcomp/emit.cmo asmcomp/asmgen.cmo \
asmcomp/asmlink.cmo asmcomp/asmlibrarian.cmo asmcomp/asmpackager.cmo \
driver/opterrors.cmo driver/optcompile.cmo driver/optmaindriver.cmo
Expand Down

0 comments on commit 3b11044

Please sign in to comment.