1995-08-09 08:06:35 -07:00
|
|
|
/***********************************************************************/
|
|
|
|
/* */
|
1996-04-30 07:53:58 -07:00
|
|
|
/* Objective Caml */
|
1995-08-09 08:06:35 -07:00
|
|
|
/* */
|
|
|
|
/* Damien Doligez, projet Para, INRIA Rocquencourt */
|
|
|
|
/* */
|
1996-04-30 07:53:58 -07:00
|
|
|
/* Copyright 1996 Institut National de Recherche en Informatique et */
|
1995-08-09 08:06:35 -07:00
|
|
|
/* Automatique. Distributed only by permission. */
|
|
|
|
/* */
|
|
|
|
/***********************************************************************/
|
|
|
|
|
|
|
|
/* $Id$ */
|
|
|
|
|
1995-05-04 03:15:53 -07:00
|
|
|
#include <string.h>
|
|
|
|
#include "fail.h"
|
|
|
|
#include "freelist.h"
|
|
|
|
#include "gc.h"
|
|
|
|
#include "gc_ctrl.h"
|
|
|
|
#include "major_gc.h"
|
|
|
|
#include "memory.h"
|
|
|
|
#include "minor_gc.h"
|
|
|
|
#include "misc.h"
|
|
|
|
#include "mlvalues.h"
|
1995-12-22 08:48:17 -08:00
|
|
|
#include "signals.h"
|
1995-05-04 03:15:53 -07:00
|
|
|
|
|
|
|
/* Allocate more memory from malloc for the heap.
|
|
|
|
Return a block of at least the requested size (in words).
|
|
|
|
Return NULL when out of memory.
|
1997-05-13 07:45:38 -07:00
|
|
|
|
|
|
|
Faudrait nettoyer tout ca pour decoupler heap_start de heap_base
|
|
|
|
et pour simplifier l'agrandissement de page_table.
|
1995-05-04 03:15:53 -07:00
|
|
|
*/
|
|
|
|
static char *expand_heap (request)
|
|
|
|
mlsize_t request;
|
|
|
|
{
|
|
|
|
char *mem;
|
1995-07-24 05:46:59 -07:00
|
|
|
page_table_entry *new_page_table;
|
1995-05-04 03:15:53 -07:00
|
|
|
asize_t new_page_table_size;
|
|
|
|
asize_t malloc_request;
|
|
|
|
asize_t i, more_pages;
|
1997-05-13 07:45:38 -07:00
|
|
|
void *block;
|
1995-05-04 03:15:53 -07:00
|
|
|
|
|
|
|
malloc_request = round_heap_chunk_size (Bhsize_wosize (request));
|
1997-05-13 07:45:38 -07:00
|
|
|
gc_message ("Growing heap to %luk bytes\n",
|
1995-05-04 03:15:53 -07:00
|
|
|
(stat_heap_size + malloc_request) / 1024);
|
|
|
|
mem = aligned_malloc (malloc_request + sizeof (heap_chunk_head),
|
1997-05-13 07:45:38 -07:00
|
|
|
sizeof (heap_chunk_head), &block);
|
1995-05-04 03:15:53 -07:00
|
|
|
if (mem == NULL){
|
|
|
|
gc_message ("No room for growing heap\n", 0);
|
|
|
|
return NULL;
|
|
|
|
}
|
|
|
|
mem += sizeof (heap_chunk_head);
|
1997-05-13 07:45:38 -07:00
|
|
|
Chunk_size (mem) = malloc_request;
|
|
|
|
Chunk_block (mem) = block;
|
1995-05-04 03:15:53 -07:00
|
|
|
Assert (Wosize_bhsize (malloc_request) >= request);
|
|
|
|
Hd_hp (mem) = Make_header (Wosize_bhsize (malloc_request), 0, Blue);
|
|
|
|
|
|
|
|
if (mem < heap_start){
|
|
|
|
more_pages = -Page (mem);
|
|
|
|
}else if (Page (mem + malloc_request) > page_table_size){
|
|
|
|
more_pages = Page (mem + malloc_request) - page_table_size;
|
|
|
|
}else{
|
|
|
|
more_pages = 0;
|
|
|
|
}
|
|
|
|
|
|
|
|
if (more_pages != 0){
|
|
|
|
new_page_table_size = page_table_size + more_pages;
|
1995-07-24 05:46:59 -07:00
|
|
|
new_page_table =
|
|
|
|
(page_table_entry *)
|
|
|
|
malloc(new_page_table_size * sizeof(page_table_entry));
|
1995-05-04 03:15:53 -07:00
|
|
|
if (new_page_table == NULL){
|
|
|
|
gc_message ("No room for growing page table\n", 0);
|
|
|
|
free (mem);
|
|
|
|
return NULL;
|
|
|
|
}
|
|
|
|
} else {
|
|
|
|
new_page_table = NULL;
|
|
|
|
new_page_table_size = 0;
|
|
|
|
}
|
|
|
|
|
|
|
|
if (mem < heap_start){
|
|
|
|
Assert (more_pages != 0);
|
|
|
|
for (i = 0; i < more_pages; i++){
|
|
|
|
new_page_table [i] = Not_in_heap;
|
|
|
|
}
|
1995-07-24 05:46:59 -07:00
|
|
|
bcopy (page_table, new_page_table + more_pages,
|
|
|
|
page_table_size * sizeof(page_table_entry));
|
1997-05-13 07:45:38 -07:00
|
|
|
Chunk_next (mem) = heap_start;
|
1995-05-04 03:15:53 -07:00
|
|
|
heap_start = mem;
|
|
|
|
}else{
|
|
|
|
char **last;
|
|
|
|
char *cur;
|
|
|
|
|
1997-05-13 07:45:38 -07:00
|
|
|
if (mem + malloc_request > heap_end) heap_end = mem + malloc_request;
|
1995-05-04 03:15:53 -07:00
|
|
|
if (more_pages != 0){
|
|
|
|
for (i = page_table_size; i < new_page_table_size; i++){
|
|
|
|
new_page_table [i] = Not_in_heap;
|
|
|
|
}
|
1995-07-24 05:46:59 -07:00
|
|
|
bcopy (page_table, new_page_table,
|
|
|
|
page_table_size * sizeof(page_table_entry));
|
1995-05-04 03:15:53 -07:00
|
|
|
}
|
|
|
|
last = &heap_start;
|
|
|
|
cur = *last;
|
|
|
|
while (cur != NULL && cur < mem){
|
1997-05-13 07:45:38 -07:00
|
|
|
last = &(Chunk_next (cur));
|
1995-05-04 03:15:53 -07:00
|
|
|
cur = *last;
|
|
|
|
}
|
1997-05-13 07:45:38 -07:00
|
|
|
Chunk_next (mem) = cur;
|
1995-05-04 03:15:53 -07:00
|
|
|
*last = mem;
|
|
|
|
}
|
|
|
|
|
|
|
|
if (more_pages != 0){
|
1995-07-24 05:46:59 -07:00
|
|
|
free ((char *) page_table);
|
1995-05-04 03:15:53 -07:00
|
|
|
page_table = new_page_table;
|
|
|
|
page_table_size = new_page_table_size;
|
|
|
|
}
|
|
|
|
|
|
|
|
for (i = Page (mem); i < Page (mem + malloc_request); i++){
|
|
|
|
page_table [i] = In_heap;
|
|
|
|
}
|
|
|
|
stat_heap_size += malloc_request;
|
|
|
|
return Bp_hp (mem);
|
|
|
|
}
|
|
|
|
|
1997-05-13 07:45:38 -07:00
|
|
|
/* Remove the heap chunk [chunk] from the heap and give the memory back
|
|
|
|
to [malloc].
|
|
|
|
*/
|
|
|
|
void shrink_heap (chunk)
|
|
|
|
char *chunk;
|
|
|
|
{
|
|
|
|
char **cp;
|
|
|
|
int i;
|
|
|
|
|
|
|
|
/* Never deallocate the first block, because heap_start is both the
|
|
|
|
first block and the base address for page numbers, and we don't
|
|
|
|
want to shift the page table, it's too messy (see above).
|
|
|
|
It will never happen anyway, because of the way compaction works.
|
|
|
|
(see compact.c)
|
|
|
|
*/
|
|
|
|
if (chunk == heap_start) return;
|
|
|
|
|
|
|
|
stat_heap_size -= Chunk_size (chunk);
|
|
|
|
gc_message ("Shrinking heap to %luk bytes\n", stat_heap_size / 1024);
|
|
|
|
|
|
|
|
#ifdef DEBUG
|
|
|
|
{
|
|
|
|
mlsize_t i;
|
|
|
|
for (i = 0; i < Wsize_bsize (Chunk_size (chunk)); i++){
|
|
|
|
((value *) chunk) [i] = not_random ();
|
|
|
|
}
|
|
|
|
}
|
|
|
|
#endif
|
|
|
|
|
|
|
|
/* Remove [chunk] from the list of chunks. */
|
|
|
|
cp = &heap_start;
|
|
|
|
while (*cp != chunk) cp = &(Chunk_next (*cp));
|
|
|
|
*cp = Chunk_next (chunk);
|
|
|
|
|
|
|
|
/* Remove the pages of [chunk] from the page table. */
|
|
|
|
for (i = Page (chunk); i < Page (chunk + Chunk_size (chunk)); i++){
|
|
|
|
page_table [i] = Not_in_heap;
|
|
|
|
}
|
|
|
|
|
|
|
|
/* Free the [malloc]ed block that contains [chunk]. */
|
|
|
|
free (Chunk_block (chunk));
|
|
|
|
}
|
|
|
|
|
1995-05-04 03:15:53 -07:00
|
|
|
value alloc_shr (wosize, tag)
|
|
|
|
mlsize_t wosize;
|
|
|
|
tag_t tag;
|
|
|
|
{
|
|
|
|
char *hp, *new_block;
|
|
|
|
|
|
|
|
hp = fl_allocate (wosize);
|
|
|
|
if (hp == NULL){
|
|
|
|
new_block = expand_heap (wosize);
|
1995-07-24 05:46:59 -07:00
|
|
|
if (new_block == NULL) {
|
|
|
|
if (in_minor_collection)
|
|
|
|
fatal_error ("Fatal error: out of memory.\n");
|
|
|
|
else
|
|
|
|
raise_out_of_memory ();
|
|
|
|
}
|
1995-05-04 03:15:53 -07:00
|
|
|
fl_add_block (new_block);
|
|
|
|
hp = fl_allocate (wosize);
|
|
|
|
}
|
|
|
|
|
|
|
|
Assert (Is_in_heap (Val_hp (hp)));
|
|
|
|
|
1997-05-13 07:45:38 -07:00
|
|
|
if (gc_phase == Phase_mark
|
|
|
|
|| gc_phase == Phase_sweep && (addr)hp >= (addr)gc_sweep_hp){
|
1995-05-04 03:15:53 -07:00
|
|
|
Hd_hp (hp) = Make_header (wosize, tag, Black);
|
|
|
|
}else{
|
1997-05-13 07:45:38 -07:00
|
|
|
Assert (gc_phase == Phase_idle
|
|
|
|
|| gc_phase == Phase_sweep && (addr)hp < (addr)gc_sweep_hp);
|
1995-05-04 03:15:53 -07:00
|
|
|
Hd_hp (hp) = Make_header (wosize, tag, White);
|
|
|
|
}
|
|
|
|
allocated_words += Whsize_wosize (wosize);
|
1995-08-08 06:37:34 -07:00
|
|
|
if (allocated_words > Wsize_bsize (minor_heap_size)) urge_major_slice ();
|
1995-05-04 03:15:53 -07:00
|
|
|
return Val_hp (hp);
|
|
|
|
}
|
|
|
|
|
|
|
|
/* Use this function to tell the major GC to speed up when you use
|
|
|
|
finalized objects to automatically deallocate extra-heap objects.
|
|
|
|
The GC will do at least one cycle every [max] allocated words;
|
|
|
|
[mem] is the number of words allocated this time.
|
|
|
|
Note that only [mem/max] is relevant. You can use numbers of bytes
|
|
|
|
(or kilobytes, ...) instead of words. You can change units between
|
|
|
|
calls to [adjust_collector_speed].
|
|
|
|
*/
|
|
|
|
void adjust_gc_speed (mem, max)
|
|
|
|
mlsize_t mem, max;
|
|
|
|
{
|
|
|
|
if (max == 0) max = 1;
|
|
|
|
if (mem > max) mem = max;
|
|
|
|
extra_heap_memory += ((float) mem / max) * stat_heap_size;
|
|
|
|
if (extra_heap_memory > stat_heap_size){
|
|
|
|
extra_heap_memory = stat_heap_size;
|
|
|
|
}
|
1995-08-08 06:37:34 -07:00
|
|
|
if (extra_heap_memory > Wsize_bsize (minor_heap_size) / 2)
|
|
|
|
urge_major_slice ();
|
1995-05-04 03:15:53 -07:00
|
|
|
}
|
|
|
|
|
|
|
|
/* You must use [initialize] to store the initial value in a field of
|
|
|
|
a shared block, unless you are sure the value is not a young block.
|
|
|
|
A block value [v] is a shared block if and only if [Is_in_heap (v)]
|
|
|
|
is true.
|
|
|
|
*/
|
|
|
|
/* [initialize] never calls the GC, so you may call it while an object is
|
|
|
|
unfinished (i.e. just after a call to [alloc_shr].) */
|
|
|
|
void initialize (fp, val)
|
|
|
|
value *fp;
|
|
|
|
value val;
|
|
|
|
{
|
|
|
|
*fp = val;
|
|
|
|
Assert (Is_in_heap (fp));
|
|
|
|
if (Is_block (val) && Is_young (val)){
|
|
|
|
*ref_table_ptr++ = fp;
|
|
|
|
if (ref_table_ptr >= ref_table_limit){
|
|
|
|
realloc_ref_table ();
|
|
|
|
}
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|
|
|
|
/* You must use [modify] to change a field of an existing shared block,
|
|
|
|
unless you are sure the value being overwritten is not a shared block and
|
|
|
|
the value being written is not a young block. */
|
|
|
|
/* [modify] never calls the GC. */
|
|
|
|
void modify (fp, val)
|
|
|
|
value *fp;
|
|
|
|
value val;
|
|
|
|
{
|
|
|
|
Modify (fp, val);
|
|
|
|
}
|
|
|
|
|
|
|
|
char *stat_alloc (sz)
|
|
|
|
asize_t sz;
|
|
|
|
{
|
|
|
|
char *result = (char *) malloc (sz);
|
|
|
|
|
|
|
|
if (result == NULL) raise_out_of_memory ();
|
|
|
|
return result;
|
|
|
|
}
|
|
|
|
|
|
|
|
void stat_free (blk)
|
|
|
|
char * blk;
|
|
|
|
{
|
|
|
|
free (blk);
|
|
|
|
}
|
|
|
|
|
|
|
|
char *stat_resize (blk, sz)
|
|
|
|
char *blk;
|
|
|
|
asize_t sz;
|
|
|
|
{
|
|
|
|
char *result = (char *) realloc (blk, sz);
|
|
|
|
|
|
|
|
if (result == NULL) raise_out_of_memory ();
|
|
|
|
return result;
|
|
|
|
}
|
|
|
|
|