remove all $Id keywords

git-svn-id: http://caml.inria.fr/svn/ocaml/trunk@13013 f963ae5c-01c2-4b8c-9fe0-0dff7051ff02
master
Damien Doligez 2012-10-15 17:50:56 +00:00
parent 0a6f6a7857
commit def31744f9
1050 changed files with 10 additions and 2112 deletions

View File

@ -10,8 +10,6 @@
# #
#########################################################################
# $Id$
# The main Makefile
include config/Makefile

View File

@ -10,8 +10,6 @@
# #
#########################################################################
# $Id$
# The main Makefile
include config/Makefile

4
README
View File

@ -129,7 +129,3 @@ To be effective, bug reports should include a complete program
configuration you are using (machine type, etc).
You can also contact the implementors directly at caml@inria.fr.
----
$Id$

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Machine-specific command-line options *)
let pic_code = ref true

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Emission of x86-64 (AMD 64) assembly code *)
open Cmm

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Emission of x86-64 (AMD 64) assembly code, MASM syntax *)
module StringSet =

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Description of the AMD64 processor *)
open Misc

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
open Cmm
open Arch
open Reg

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
let _ = let module M = Schedgen in () (* to create a dependency *)
(* Scheduling is turned off because the processor schedules dynamically

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Instruction selection for the AMD64 *)
open Arch

View File

@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Specific operations for the ARM processor *)
open Format

View File

@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Emission of ARM assembly code *)
open Misc

View File

@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Description of the ARM processor *)
open Misc

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Reloading for the ARM *)
let fundecl f =

View File

@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
open Arch
open Mach

View File

@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Instruction selection for the ARM processor *)
open Arch

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* From lambda to assembly code *)
open Format

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* From lambda to assembly code *)
val compile_implementation :

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Build libraries of .cmx files *)
open Misc

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Build libraries of .cmx files *)
open Format

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Link a set of .cmx/.o files and produce an executable *)
open Misc

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Link a set of .cmx/.o files and produce an executable or a plugin *)
open Format

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* "Package" a set of .cmx/.o files into one .cmx/.o file having the
original compilation units as sub-modules. *)

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* "Package" a set of .cmx/.o files into one .cmx/.o file having the
original compilation units as sub-modules. *)

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* A variant of the "lambda" code with direct / indirect calls explicit
and closures explicit too *)

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* A variant of the "lambda" code with direct / indirect calls explicit
and closures explicit too *)

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Introduction of closures, uncurrying, recognition of direct calls *)
open Misc

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Introduction of closures, uncurrying, recognition of direct calls *)
val intro: int -> Lambda.lambda -> Clambda.ulambda

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
type machtype_component =
Addr
| Int

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Second intermediate language (machine independent) *)
type machtype_component =

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Translation from closed lambda to C-- *)
open Misc

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Translation from closed lambda to C-- *)
val compunit: int -> Clambda.ulambda -> Cmm.phrase list

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Format of .cmx, .cmxa and .cmxs files *)
(* Each .o file has a matching .cmx file that provides the following infos

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* From C-- to assembly code *)
open Format

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* From C-- to assembly code *)
val phrase: Cmm.phrase -> unit

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Register allocation by coloring of the interference graph *)
open Reg

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Register allocation by coloring of the interference graph *)
val allocate_registers: unit -> unit

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Combine heap allocations occurring in the same basic block *)
open Mach

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Combine heap allocations occurring in the same basic block *)
val fundecl: Mach.fundecl -> Mach.fundecl

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Compilation environments for compilation units *)
open Config

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Compilation environments for compilation units *)
open Cmx_format

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Generation of assembly code *)
val fundecl: Linearize.fundecl -> unit

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Common functions for emitting assembly code *)
open Debuginfo

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Common functions for emitting assembly code *)
val output_channel: out_channel ref

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Machine-specific command-line options *)
let fast_math = ref false

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Emission of Intel 386 assembly code *)
module StringSet = Set.Make(struct type t = string let compare = compare end)

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Emission of Intel 386 assembly code, MASM syntax. *)
module StringSet =

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Description of the Intel 386 processor *)
open Misc

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
open Cmm
open Arch
open Reg

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
let () = let module M = Schedgen in () (* to create a dependency *)
(* Scheduling is turned off because our model does not fit the 486

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Instruction selection for the Intel x86 *)
open Misc

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Construction of the interference graph.
Annotate pseudoregs with interference lists and preference lists. *)

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Construction of the interference graph.
Annotate pseudoregs with interference lists and preference lists. *)

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Transformation of Mach code into a list of pseudo-instructions. *)
open Reg

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Transformation of Mach code into a list of pseudo-instructions. *)
type label = int

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Liveness analysis.
Annotate mach code with the set of regs live at each point. *)

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Liveness analysis.
Annotate mach code with the set of regs live at each point. *)

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Representation of machine code by sequences of pseudoinstructions *)
type integer_comparison =

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Representation of machine code by sequences of pseudoinstructions *)
type integer_comparison =

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Specific operations for the PowerPC processor *)
open Misc

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Emission of PowerPC assembly code *)
module StringSet = Set.Make(struct type t = string let compare = compare end)

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Description of the Power PC *)
open Misc

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Reloading for the PowerPC *)
let fundecl f =

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Instruction scheduling for the Power PC *)
open Arch

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Instruction selection for the Power PC processor *)
open Misc

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Pretty-printing of C-- code *)
open Format

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Pretty-printing of C-- code *)
open Format

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Pretty-printing of linearized machine code *)
open Format

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Pretty-printing of linearized machine code *)
open Format

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Pretty-printing of pseudo machine code *)
open Format

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Pretty-printing of pseudo machine code *)
open Format

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Processor descriptions *)
(* Instruction selection *)

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
open Cmm
type t =

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Pseudo-registers *)
type t =

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Insert load/stores for pseudoregs that got assigned to stack locations. *)
val fundecl: Mach.fundecl -> Mach.fundecl * bool

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Insert load/stores for pseudoregs that got assigned to stack locations. *)
open Misc

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
class reload_generic : object
method reload_operation :
Mach.operation -> Reg.t array -> Reg.t array -> Reg.t array * Reg.t array

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Instruction scheduling *)
open Reg

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Instruction scheduling *)
type code_dag_node =

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Instruction scheduling *)
val fundecl: Linearize.fundecl -> Linearize.fundecl

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Selection of pseudo-instructions, assignment of pseudo-registers,
sequentialization. *)

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Selection of pseudo-instructions, assignment of pseudo-registers,
sequentialization. *)

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Selection of pseudo-instructions, assignment of pseudo-registers,
sequentialization. *)

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Specific operations for the Sparc processor *)
open Format

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Emission of Sparc assembly code *)
open Misc

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Description of the Sparc processor *)
open Misc

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Reloading for the Sparc *)
let fundecl f =

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
open Cmm
open Mach

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Instruction selection for the Sparc processor *)
open Cmm

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Insertion of moves to suggest possible spilling / reloading points
before register allocation. *)

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Insertion of moves to suggest possible spilling / reloading points
before register allocation. *)

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Renaming of registers at reload points to split live ranges. *)
open Reg

View File

@ -10,8 +10,6 @@
(* *)
(***********************************************************************)
(* $Id$ *)
(* Renaming of registers at reload points to split live ranges. *)
val fundecl: Mach.fundecl -> Mach.fundecl

View File

@ -11,8 +11,6 @@
# #
#########################################################################
# $Id$
include ../config/Makefile
CC=$(NATIVECC)

View File

@ -11,8 +11,6 @@
# #
#########################################################################
# $Id$
include ../config/Makefile
CC=$(NATIVECC)

View File

@ -11,8 +11,6 @@
/* */
/***********************************************************************/
/* $Id$ */
/* Asm part of the runtime system, AMD64 processor */
/* Must be preprocessed by cpp */
@ -493,7 +491,7 @@ LBL(110):
popq C_ARG_2 /* arg 2: pc of raise */
movq %rsp, C_ARG_3 /* arg 3: sp at raise */
movq %r14, C_ARG_4 /* arg 4: sp of handler */
/* PR#5700: thanks to popq above, stack is now 16-aligned */
/* PR#5700: thanks to popq above, stack is now 16-aligned */
PREPARE_FOR_C_CALL /* no need to cleanup after */
call GCALL(caml_stash_backtrace)
movq %r12, %rax /* Recover exception bucket */

View File

@ -11,8 +11,6 @@
;* *
;***********************************************************************
; $Id$
; Asm part of the runtime system, AMD64 processor, Intel syntax
; Notes on Win64 calling conventions:

View File

@ -12,8 +12,6 @@
/* */
/***********************************************************************/
/* $Id$ */
/* Asm part of the runtime system, ARM processor */
/* Must be preprocessed by cpp */

View File

@ -11,8 +11,6 @@
/* */
/***********************************************************************/
/* $Id$ */
/* Stack backtrace for uncaught exceptions */
#include <stdio.h>

View File

@ -11,8 +11,6 @@
/* */
/***********************************************************************/
/* $Id$ */
/* Raising exceptions from C. */
#include <signal.h>

Some files were not shown because too many files have changed in this diff Show More