ocaml/runtime/startup_aux.c

200 lines
6.7 KiB
C
Raw Normal View History

/**************************************************************************/
/* */
/* OCaml */
/* */
/* Xavier Leroy and Damien Doligez, 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 GNU Lesser General Public License version 2.1, with the */
/* special exception on linking described in the file LICENSE. */
/* */
/**************************************************************************/
#define CAML_INTERNALS
/* Some runtime initialization functions that are common to bytecode
and native code. */
#include <stdio.h>
#include "caml/backtrace.h"
#include "caml/memory.h"
#include "caml/callback.h"
#include "caml/major_gc.h"
#ifndef NATIVE_CODE
#include "caml/dynlink.h"
#endif
#include "caml/osdeps.h"
#include "caml/startup_aux.h"
#ifdef _WIN32
extern void caml_win32_unregister_overflow_detection (void);
#endif
CAMLexport header_t *caml_atom_table = NULL;
/* Initialize the atom table */
void caml_init_atom_table(void)
{
caml_stat_block b;
int i;
/* PR#9128: We need to give the atom table its own page to make sure
it does not share a page with a non-value, which would break code
which depend on the correctness of the page table. For example,
if the atom table shares a page with bytecode, then functions in
the runtime may decide to follow a code pointer in a closure, as
if it were a pointer to a value.
We add 1 padding at the end of the atom table because the atom
pointer actually points to the word *following* the corresponding
entry in the table (the entry is an empty block *header*).
*/
asize_t request = (256 + 1) * sizeof(header_t);
request = (request + Page_size - 1) / Page_size * Page_size;
caml_atom_table =
caml_stat_alloc_aligned_noexc(request, 0, &b);
for(i = 0; i < 256; i++) {
caml_atom_table[i] = Make_header(0, i, Caml_black);
}
if (caml_page_table_add(In_static_data,
caml_atom_table, caml_atom_table + 256 + 1) != 0) {
caml_fatal_error("not enough memory for initial page table");
}
}
/* Parse the OCAMLRUNPARAM environment variable. */
uintnat caml_init_percent_free = Percent_free_def;
uintnat caml_init_max_percent_free = Max_percent_free_def;
uintnat caml_init_minor_heap_wsz = Minor_heap_def;
uintnat caml_init_heap_chunk_sz = Heap_chunk_def;
uintnat caml_init_heap_wsz = Init_heap_def;
uintnat caml_init_max_stack_wsz = Max_stack_def;
2015-11-20 08:54:26 -08:00
uintnat caml_init_major_window = Major_window_def;
uintnat caml_init_custom_major_ratio = Custom_major_ratio_def;
uintnat caml_init_custom_minor_ratio = Custom_minor_ratio_def;
uintnat caml_init_custom_minor_max_bsz = Custom_minor_max_bsz_def;
extern int caml_parser_trace;
uintnat caml_trace_level = 0;
Cleaning up the C code (#1812) Running Clang 6.0 and GCC 8 with full warnings on suggests a few simple improvements and clean-ups to the C code of OCaml. This commit implements them. * Remove old-style, unprototyped function declarations It's `int f(void)`, not `int f()`. [-Wstrict-prototypes] * Be more explicit about conversions involving `float` and `double` byterun/bigarray.c, byterun/ints.c: add explicit casts to clarify the intent renamed float field of conversion union from `d` to `f`. byterun/compact.c, byterun/gc_ctrl.c: some local variables were of type `float` while all FP computations here are done in double precision; turned these variables into `double`. [-Wdouble-promotion -Wfloat-conversion] *Add explicit initialization of struct field `compare_ext` [-Wmissing-field-initializers] * Declare more functions "noreturn" [-Wmissing-noreturn] * Make CAMLassert compliant with ISO C In `e1 ? e2 : e3`, expressions `e2` and `e3` must have the same type. `e2` of type `void` and `e3` of type `int`, as in the original code, is a GNU extension. * Remove or conditionalize unused macros Some macros were defined and never used. Some other macros were always defined but conditionally used. [-Wunused-macros] * Replace some uses of `int` by more appropriate types like `intnat` On a 64-bit platform, `int` is only 32 bits and may not represent correctly the length of a string or the size of an OCaml heap block. This commit replaces a number of uses of `int` by other types that are 64-bit wide on 64-bit architectures, such as `intnat` or `uintnat` or `size_t` or `mlsize_t`. Sometimes an `intnat` was used as an `int` and is intended as a Boolean (0 or 1); then it was replaced by an `int`. There are many remaining cases where we assign a 64-bit quantity to a 32-bit `int` variable. Either I believe these cases are safe (e.g. the 64-bit quantity is the difference between two pointers within an I/O buffer, something that always fits in 32 bits), or the code change was not obvious and too risky. [-Wshorten-64-to-32] * Put `inline` before return type `static inline void f(void)` is cleaner than `static void inline f(void)`. [-Wold-style-declaration] * Unused assignment to unused parameter Looks very useless. [-Wunused-but-set-parameter]
2018-06-07 03:55:09 -07:00
int caml_cleanup_on_exit = 0;
2017-09-21 03:29:03 -07:00
static void scanmult (char_os *opt, uintnat *var)
{
char_os mult = ' ';
unsigned int val = 1;
sscanf_os (opt, T("=%u%c"), &val, &mult);
sscanf_os (opt, T("=0x%x%c"), &val, &mult);
switch (mult) {
case 'k': *var = (uintnat) val * 1024; break;
case 'M': *var = (uintnat) val * (1024 * 1024); break;
case 'G': *var = (uintnat) val * (1024 * 1024 * 1024); break;
default: *var = (uintnat) val; break;
}
}
void caml_parse_ocamlrunparam(void)
{
char_os *opt = caml_secure_getenv (T("OCAMLRUNPARAM"));
uintnat p;
if (opt == NULL) opt = caml_secure_getenv (T("CAMLRUNPARAM"));
if (opt != NULL){
while (*opt != '\0'){
switch (*opt++){
2019-10-15 04:52:16 -07:00
case 'a': scanmult (opt, &p); caml_set_allocation_policy ((intnat) p);
break;
case 'b': scanmult (opt, &p); caml_record_backtrace(Val_int (p));
2019-10-15 04:52:16 -07:00
break;
case 'c': scanmult (opt, &p); caml_cleanup_on_exit = (p != 0); break;
case 'h': scanmult (opt, &caml_init_heap_wsz); break;
case 'H': scanmult (opt, &caml_use_huge_pages); break;
case 'i': scanmult (opt, &caml_init_heap_chunk_sz); break;
case 'l': scanmult (opt, &caml_init_max_stack_wsz); break;
case 'M': scanmult (opt, &caml_init_custom_major_ratio); break;
case 'm': scanmult (opt, &caml_init_custom_minor_ratio); break;
case 'n': scanmult (opt, &caml_init_custom_minor_max_bsz); break;
case 'o': scanmult (opt, &caml_init_percent_free); break;
case 'O': scanmult (opt, &caml_init_max_percent_free); break;
case 'p': scanmult (opt, &p); caml_parser_trace = (p != 0); break;
case 'R': break; /* see stdlib/hashtbl.mli */
case 's': scanmult (opt, &caml_init_minor_heap_wsz); break;
case 't': scanmult (opt, &caml_trace_level); break;
case 'v': scanmult (opt, &caml_verb_gc); break;
case 'w': scanmult (opt, &caml_init_major_window); break;
case 'W': scanmult (opt, &caml_runtime_warnings); break;
case ',': continue;
}
while (*opt != '\0'){
if (*opt++ == ',') break;
}
}
}
}
2014-05-29 11:47:18 -07:00
/* The number of outstanding calls to caml_startup */
static int startup_count = 0;
/* Has the runtime been shut down already? */
static int shutdown_happened = 0;
int caml_startup_aux(int pooling)
{
if (shutdown_happened == 1)
caml_fatal_error("caml_startup was called after the runtime "
"was shut down with caml_shutdown");
/* Second and subsequent calls are ignored,
since the runtime has already started */
startup_count++;
if (startup_count > 1)
return 0;
if (pooling)
caml_stat_create_pool();
return 1;
}
static void call_registered_value(char* name)
{
const value *f = caml_named_value(name);
if (f != NULL)
caml_callback_exn(*f, Val_unit);
}
2014-05-29 11:47:18 -07:00
CAMLexport void caml_shutdown(void)
{
if (startup_count <= 0)
caml_fatal_error("a call to caml_shutdown has no "
"corresponding call to caml_startup");
/* Do nothing unless it's the last call remaining */
startup_count--;
if (startup_count > 0)
return;
call_registered_value("Pervasives.do_at_exit");
call_registered_value("Thread.at_shutdown");
caml_finalise_heap();
caml_free_locale();
#ifndef NATIVE_CODE
caml_free_shared_libs();
#endif
2014-05-29 11:47:18 -07:00
caml_stat_destroy_pool();
#if defined(_WIN32) && defined(NATIVE_CODE)
caml_win32_unregister_overflow_detection();
#endif
shutdown_happened = 1;
2014-05-29 11:47:18 -07:00
}