210 lines
6.7 KiB
OCaml
210 lines
6.7 KiB
OCaml
(***********************************************************************)
|
|
(* *)
|
|
(* Objective Caml *)
|
|
(* *)
|
|
(* Xavier Leroy, projet Cristal, INRIA Rocquencourt *)
|
|
(* *)
|
|
(* Copyright 1996 Institut National de Recherche en Informatique et *)
|
|
(* en Automatique. All rights reserved. This file is distributed *)
|
|
(* under the terms of the Q Public License version 1.0. *)
|
|
(* *)
|
|
(***********************************************************************)
|
|
|
|
(* $Id$ *)
|
|
|
|
(* Construction of the interference graph.
|
|
Annotate pseudoregs with interference lists and preference lists. *)
|
|
|
|
open Misc
|
|
open Reg
|
|
open Mach
|
|
|
|
module BitMatrix =
|
|
struct
|
|
type bucket = Nil | Cons of int * int * bucket
|
|
type t = {
|
|
mutable tbl: bucket array;
|
|
mutable capacity: int;
|
|
mutable numelts: int
|
|
}
|
|
let create log2_sz =
|
|
let sz = 1 lsl log2_sz in
|
|
{ tbl = Array.create sz Nil; capacity = 4 * sz; numelts = 0 }
|
|
|
|
let resize mat =
|
|
let len = Array.length mat.tbl in
|
|
let newtbl = Array.make (len * 2) mat.tbl.(0) in
|
|
Array.blit mat.tbl 0 newtbl 0 len;
|
|
Array.blit mat.tbl 0 newtbl len len;
|
|
mat.tbl <- newtbl;
|
|
mat.capacity <- mat.capacity * 4
|
|
|
|
let rec find_in_bucket i j = function
|
|
Nil -> false
|
|
| Cons(x, y, rem) -> (x = i && y = j) || find_in_bucket i j rem
|
|
|
|
let rec testandset mat i j =
|
|
if j > i then testandset mat j i else begin
|
|
let hash = (i lxor j) land (Array.length mat.tbl - 1) in
|
|
let bucket = mat.tbl.(hash) in
|
|
find_in_bucket i j bucket ||
|
|
begin
|
|
mat.tbl.(hash) <- Cons(i, j, bucket);
|
|
mat.numelts <- mat.numelts + 1;
|
|
if mat.numelts >= mat.capacity then resize mat;
|
|
false
|
|
end
|
|
end
|
|
|
|
let rec isset mat i j =
|
|
if j > i then
|
|
isset mat j i
|
|
else
|
|
find_in_bucket i j mat.tbl.((i lxor j) land (Array.length mat.tbl - 1))
|
|
end
|
|
|
|
let build_graph fundecl =
|
|
|
|
(* The interference graph is represented in two ways:
|
|
- by adjacency lists for each register
|
|
- by a (triangular) bit matrix *)
|
|
|
|
let mat = BitMatrix.create 6 in
|
|
|
|
(* Record an interference between two registers *)
|
|
let add_interf ri rj =
|
|
let i = ri.stamp and j = rj.stamp in
|
|
if i = j || BitMatrix.testandset mat i j then () else begin
|
|
if ri.loc = Unknown then ri.interf <- rj :: ri.interf;
|
|
if rj.loc = Unknown then rj.interf <- ri :: rj.interf
|
|
end in
|
|
|
|
(* Record interferences between a register array and a set of registers *)
|
|
let add_interf_set v s =
|
|
for i = 0 to Array.length v - 1 do
|
|
let r1 = v.(i) in
|
|
Reg.Set.iter (add_interf r1) s
|
|
done in
|
|
|
|
(* Record interferences between elements of an array *)
|
|
let add_interf_self v =
|
|
for i = 0 to Array.length v - 2 do
|
|
let ri = v.(i) in
|
|
for j = i+1 to Array.length v - 1 do
|
|
add_interf ri v.(j)
|
|
done
|
|
done in
|
|
|
|
(* Record interferences between the destination of a move and a set
|
|
of live registers. Since the destination is equal to the source,
|
|
do not add an interference between them if the source is still live
|
|
afterwards. *)
|
|
let add_interf_move src dst s =
|
|
Reg.Set.iter (fun r -> if r.stamp <> src.stamp then add_interf dst r) s in
|
|
|
|
(* Compute interferences *)
|
|
|
|
let rec interf i =
|
|
let destroyed = Proc.destroyed_at_oper i.desc in
|
|
if Array.length destroyed > 0 then add_interf_set destroyed i.live;
|
|
match i.desc with
|
|
Iend -> ()
|
|
| Ireturn -> ()
|
|
| Iop(Imove | Ispill | Ireload) ->
|
|
add_interf_move i.arg.(0) i.res.(0) i.live;
|
|
interf i.next
|
|
| Iop(Itailcall_ind) -> ()
|
|
| Iop(Itailcall_imm lbl) -> ()
|
|
| Iop op ->
|
|
add_interf_set i.res i.live;
|
|
add_interf_self i.res;
|
|
interf i.next
|
|
| Iifthenelse(tst, ifso, ifnot) ->
|
|
interf ifso;
|
|
interf ifnot;
|
|
interf i.next
|
|
| Iswitch(index, cases) ->
|
|
for i = 0 to Array.length cases - 1 do
|
|
interf cases.(i)
|
|
done;
|
|
interf i.next
|
|
| Iloop body ->
|
|
interf body; interf i.next
|
|
| Icatch(_, body, handler) ->
|
|
interf body; interf handler; interf i.next
|
|
| Iexit _ ->
|
|
()
|
|
| Itrywith(body, handler) ->
|
|
add_interf_set Proc.destroyed_at_raise handler.live;
|
|
interf body; interf handler; interf i.next
|
|
| Iraise -> () in
|
|
|
|
(* Add a preference from one reg to another.
|
|
Do not add anything if the two registers conflict,
|
|
or if the source register already has a location. *)
|
|
|
|
let add_pref weight r1 r2 =
|
|
if weight > 0 then begin
|
|
let i = r1.stamp and j = r2.stamp in
|
|
if i <> j
|
|
&& r1.loc = Unknown
|
|
&& not (BitMatrix.isset mat i j)
|
|
then r1.prefer <- (r2, weight) :: r1.prefer
|
|
end in
|
|
|
|
(* Add a mutual preference between two regs *)
|
|
let add_mutual_pref weight r1 r2 =
|
|
add_pref weight r1 r2; add_pref weight r2 r1 in
|
|
|
|
(* Update the spill cost of the registers involved in an operation *)
|
|
|
|
let add_spill_cost cost arg =
|
|
for i = 0 to Array.length arg - 1 do
|
|
let r = arg.(i) in r.spill_cost <- r.spill_cost + cost
|
|
done in
|
|
|
|
(* Compute preferences and spill costs *)
|
|
|
|
let rec prefer weight i =
|
|
add_spill_cost weight i.arg;
|
|
add_spill_cost weight i.res;
|
|
match i.desc with
|
|
Iend -> ()
|
|
| Ireturn -> ()
|
|
| Iop(Imove) ->
|
|
add_mutual_pref weight i.arg.(0) i.res.(0);
|
|
prefer weight i.next
|
|
| Iop(Ispill) ->
|
|
add_pref (weight / 4) i.arg.(0) i.res.(0);
|
|
prefer weight i.next
|
|
| Iop(Ireload) ->
|
|
add_pref (weight / 4) i.res.(0) i.arg.(0);
|
|
prefer weight i.next
|
|
| Iop(Itailcall_ind) -> ()
|
|
| Iop(Itailcall_imm lbl) -> ()
|
|
| Iop op ->
|
|
prefer weight i.next
|
|
| Iifthenelse(tst, ifso, ifnot) ->
|
|
prefer (weight / 2) ifso;
|
|
prefer (weight / 2) ifnot;
|
|
prefer weight i.next
|
|
| Iswitch(index, cases) ->
|
|
for i = 0 to Array.length cases - 1 do
|
|
prefer (weight / 2) cases.(i)
|
|
done;
|
|
prefer weight i.next
|
|
| Iloop body ->
|
|
(* Avoid overflow of weight and spill_cost *)
|
|
prefer (if weight < 1000 then 8 * weight else weight) body;
|
|
prefer weight i.next
|
|
| Icatch(_, body, handler) ->
|
|
prefer weight body; prefer weight handler; prefer weight i.next
|
|
| Iexit _ ->
|
|
()
|
|
| Itrywith(body, handler) ->
|
|
prefer weight body; prefer weight handler; prefer weight i.next
|
|
| Iraise -> ()
|
|
in
|
|
|
|
interf fundecl.fun_body; prefer 8 fundecl.fun_body
|