Skip to content
Success

Console Output

Skipping 966 KB.. Full Log
  for (key in D) D_is_set[key] = 1
  FS = ""
}
/^[\t ]*#[\t ]*(define|undef)[\t ]+[_abcdefghijklmnopqrstuvwxyzABCDEFGHIJKLMNOPQRSTUVWXYZ][_abcdefghijklmnopqrstuvwxyzABCDEFGHIJKLMNOPQRSTUVWXYZ0123456789]*([\t (]|\r?$)/ {
  line = $ 0
  split(line, arg, /[ \r\t]/)
  if (arg[1] == "#") {
    defundef = arg[2]
    mac1 = arg[3]
  } else {
    defundef = substr(arg[1], 2)
    mac1 = arg[2]
  }
  split(mac1, mac2, "(") #)
  macro = mac2[1]
  prefix = substr(line, 1, index(line, defundef) - 1)
  if (D_is_set[macro]) {
    # Preserve the white space surrounding the "#".
    print prefix "define", macro P[macro] D[macro]
    next
  } else {
    # Replace #undef with comments.  This is necessary, for example,
    # in the case of _POSIX_SOURCE, which is predefined and required
    # on some systems where configure will not decide to define it.
    if (defundef == "undef") {
      print "/*", prefix defundef, macro, "*/"
      next
    }
  }
}
{ print }
_ACAWK
  as_fn_error $? "could not setup config headers machinery" "$LINENO" 5
fi # test -n "$CONFIG_HEADERS"


eval set X "  :F $CONFIG_FILES  :H $CONFIG_HEADERS  :L $CONFIG_LINKS  :C $CONFIG_COMMANDS"
shift
for ac_tag
do
  case $ac_tag in
  :[FHLC]) ac_mode=$ac_tag; continue;;
  esac
  case $ac_mode$ac_tag in
  :[FHL]*:*);;
  :L* | :C*:*) as_fn_error $? "invalid tag \`$ac_tag'" "$LINENO" 5;;
  :[FH]-) ac_tag=-:-;;
  :[FH]*) ac_tag=$ac_tag:$ac_tag.in;;
  esac
  ac_save_IFS=$IFS
  IFS=:
  set x $ac_tag
  IFS=$ac_save_IFS
  shift
  ac_file=$1
  shift

  case $ac_mode in
  :L) ac_source=$1;;
  :[FH])
    ac_file_inputs=
    for ac_f
    do
      case $ac_f in
      -) ac_f="$ac_tmp/stdin";;
      *) # Look for the file first in the build tree, then in the source tree
	 # (if the path is not absolute).  The absolute path cannot be DOS-style,
	 # because $ac_f cannot contain `:'.
	 test -f "$ac_f" ||
	   case $ac_f in
	   [\\/$]*) false;;
	   *) test -f "$srcdir/$ac_f" && ac_f="$srcdir/$ac_f";;
	   esac ||
	   as_fn_error 1 "cannot find input file: \`$ac_f'" "$LINENO" 5;;
      esac
      case $ac_f in *\'*) ac_f=`printf "%s\n" "$ac_f" | sed "s/'/'\\\\\\\\''/g"`;; esac
      as_fn_append ac_file_inputs " '$ac_f'"
    done

    # Let's still pretend it is `configure' which instantiates (i.e., don't
    # use $as_me), people would be surprised to read:
    #    /* config.h.  Generated by config.status.  */
    configure_input='Generated from '`
	  printf "%s\n" "$*" | sed 's|^[^:]*/||;s|:[^:]*/|, |g'
	`' by configure.'
    if test x"$ac_file" != x-; then
      configure_input="$ac_file.  $configure_input"
      { printf "%s\n" "$as_me:${as_lineno-$LINENO}: creating $ac_file" >&5
printf "%s\n" "$as_me: creating $ac_file" >&6;}
    fi
    # Neutralize special characters interpreted by sed in replacement strings.
    case $configure_input in #(
    *\&* | *\|* | *\\* )
       ac_sed_conf_input=`printf "%s\n" "$configure_input" |
       sed 's/[\\\\&|]/\\\\&/g'`;; #(
    *) ac_sed_conf_input=$configure_input;;
    esac

    case $ac_tag in
    *:-:* | *:-) cat >"$ac_tmp/stdin" \
      || as_fn_error $? "could not create $ac_file" "$LINENO" 5 ;;
    esac
    ;;
  esac

  ac_dir=`$as_dirname -- "$ac_file" ||
$as_expr X"$ac_file" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
	 X"$ac_file" : 'X\(//\)[^/]' \| \
	 X"$ac_file" : 'X\(//\)$' \| \
	 X"$ac_file" : 'X\(/\)' \| . 2>/dev/null ||
printf "%s\n" X"$ac_file" |
    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
	    s//\1/
	    q
	  }
	  /^X\(\/\/\)[^/].*/{
	    s//\1/
	    q
	  }
	  /^X\(\/\/\)$/{
	    s//\1/
	    q
	  }
	  /^X\(\/\).*/{
	    s//\1/
	    q
	  }
	  s/.*/./; q'`
  as_dir="$ac_dir"; as_fn_mkdir_p
  ac_builddir=.

case "$ac_dir" in
.) ac_dir_suffix= ac_top_builddir_sub=. ac_top_build_prefix= ;;
*)
  ac_dir_suffix=/`printf "%s\n" "$ac_dir" | sed 's|^\.[\\/]||'`
  # A ".." for each directory in $ac_dir_suffix.
  ac_top_builddir_sub=`printf "%s\n" "$ac_dir_suffix" | sed 's|/[^\\/]*|/..|g;s|/||'`
  case $ac_top_builddir_sub in
  "") ac_top_builddir_sub=. ac_top_build_prefix= ;;
  *)  ac_top_build_prefix=$ac_top_builddir_sub/ ;;
  esac ;;
esac
ac_abs_top_builddir=$ac_pwd
ac_abs_builddir=$ac_pwd$ac_dir_suffix
# for backward compatibility:
ac_top_builddir=$ac_top_build_prefix

case $srcdir in
  .)  # We are building in place.
    ac_srcdir=.
    ac_top_srcdir=$ac_top_builddir_sub
    ac_abs_top_srcdir=$ac_pwd ;;
  [\\/]* | ?:[\\/]* )  # Absolute name.
    ac_srcdir=$srcdir$ac_dir_suffix;
    ac_top_srcdir=$srcdir
    ac_abs_top_srcdir=$srcdir ;;
  *) # Relative name.
    ac_srcdir=$ac_top_build_prefix$srcdir$ac_dir_suffix
    ac_top_srcdir=$ac_top_build_prefix$srcdir
    ac_abs_top_srcdir=$ac_pwd/$srcdir ;;
esac
ac_abs_srcdir=$ac_abs_top_srcdir$ac_dir_suffix


  case $ac_mode in
  :F)
  #
  # CONFIG_FILE
  #

  case $INSTALL in
  [\\/$]* | ?:[\\/]* ) ac_INSTALL=$INSTALL ;;
  *) ac_INSTALL=$ac_top_build_prefix$INSTALL ;;
  esac
# If the template does not know about datarootdir, expand it.
# FIXME: This hack should be removed a few years after 2.60.
ac_datarootdir_hack=; ac_datarootdir_seen=
ac_sed_dataroot='
/datarootdir/ {
  p
  q
}
/@datadir@/p
/@docdir@/p
/@infodir@/p
/@localedir@/p
/@mandir@/p'
case `eval "sed -n \"\$ac_sed_dataroot\" $ac_file_inputs"` in
*datarootdir*) ac_datarootdir_seen=yes;;
*@datadir@*|*@docdir@*|*@infodir@*|*@localedir@*|*@mandir@*)
  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: WARNING: $ac_file_inputs seems to ignore the --datarootdir setting" >&5
printf "%s\n" "$as_me: WARNING: $ac_file_inputs seems to ignore the --datarootdir setting" >&2;}
  ac_datarootdir_hack='
  s&@datadir@&${datarootdir}&g
  s&@docdir@&${datarootdir}/doc/${PACKAGE_TARNAME}&g
  s&@infodir@&${datarootdir}/info&g
  s&@localedir@&${datarootdir}/locale&g
  s&@mandir@&${prefix}/man&g
  s&\${datarootdir}&${prefix}/share&g' ;;
esac
ac_sed_extra="/^[	 ]*VPATH[	 ]*=[	 ]*/{
h
s///
s/^/:/
s/[	 ]*$/:/
s/:\$(srcdir):/:/g
s/:\${srcdir}:/:/g
s/:@srcdir@:/:/g
s/^:*//
s/:*$//
x
s/\(=[	 ]*\).*/\1/
G
s/\n//
s/^[^=]*=[	 ]*$//
}

:t
/@[a-zA-Z_][a-zA-Z_0-9]*@/!b
s|@configure_input@|$ac_sed_conf_input|;t t
s&@top_builddir@&$ac_top_builddir_sub&;t t
s&@top_build_prefix@&$ac_top_build_prefix&;t t
s&@srcdir@&$ac_srcdir&;t t
s&@abs_srcdir@&$ac_abs_srcdir&;t t
s&@top_srcdir@&$ac_top_srcdir&;t t
s&@abs_top_srcdir@&$ac_abs_top_srcdir&;t t
s&@builddir@&$ac_builddir&;t t
s&@abs_builddir@&$ac_abs_builddir&;t t
s&@abs_top_builddir@&$ac_abs_top_builddir&;t t
s&@INSTALL@&$ac_INSTALL&;t t
$ac_datarootdir_hack
"
eval sed \"\$ac_sed_extra\" "$ac_file_inputs" | $AWK -f "$ac_tmp/subs.awk" \
  >$ac_tmp/out || as_fn_error $? "could not create $ac_file" "$LINENO" 5

test -z "$ac_datarootdir_hack$ac_datarootdir_seen" &&
  { ac_out=`sed -n '/\${datarootdir}/p' "$ac_tmp/out"`; test -n "$ac_out"; } &&
  { ac_out=`sed -n '/^[	 ]*datarootdir[	 ]*:*=/p' \
      "$ac_tmp/out"`; test -z "$ac_out"; } &&
  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: WARNING: $ac_file contains a reference to the variable \`datarootdir'
which seems to be undefined.  Please make sure it is defined" >&5
printf "%s\n" "$as_me: WARNING: $ac_file contains a reference to the variable \`datarootdir'
which seems to be undefined.  Please make sure it is defined" >&2;}

  rm -f "$ac_tmp/stdin"
  case $ac_file in
  -) cat "$ac_tmp/out" && rm -f "$ac_tmp/out";;
  *) rm -f "$ac_file" && mv "$ac_tmp/out" "$ac_file";;
  esac \
  || as_fn_error $? "could not create $ac_file" "$LINENO" 5
 ;;
  :H)
  #
  # CONFIG_HEADER
  #
  if test x"$ac_file" != x-; then
    {
      printf "%s\n" "/* $configure_input  */" >&1 \
      && eval '$AWK -f "$ac_tmp/defines.awk"' "$ac_file_inputs"
    } >"$ac_tmp/config.h" \
      || as_fn_error $? "could not create $ac_file" "$LINENO" 5
    if diff "$ac_file" "$ac_tmp/config.h" >/dev/null 2>&1; then
      { printf "%s\n" "$as_me:${as_lineno-$LINENO}: $ac_file is unchanged" >&5
printf "%s\n" "$as_me: $ac_file is unchanged" >&6;}
    else
      rm -f "$ac_file"
      mv "$ac_tmp/config.h" "$ac_file" \
	|| as_fn_error $? "could not create $ac_file" "$LINENO" 5
    fi
  else
    printf "%s\n" "/* $configure_input  */" >&1 \
      && eval '$AWK -f "$ac_tmp/defines.awk"' "$ac_file_inputs" \
      || as_fn_error $? "could not create -" "$LINENO" 5
  fi
 ;;
  :L)
  #
  # CONFIG_LINK
  #

  if test "$ac_source" = "$ac_file" && test "$srcdir" = '.'; then
    :
  else
    # Prefer the file from the source tree if names are identical.
    if test "$ac_source" = "$ac_file" || test ! -r "$ac_source"; then
      ac_source=$srcdir/$ac_source
    fi

    { printf "%s\n" "$as_me:${as_lineno-$LINENO}: linking $ac_source to $ac_file" >&5
printf "%s\n" "$as_me: linking $ac_source to $ac_file" >&6;}

    if test ! -r "$ac_source"; then
      as_fn_error $? "$ac_source: file not found" "$LINENO" 5
    fi
    rm -f "$ac_file"

    # Try a relative symlink, then a hard link, then a copy.
    case $ac_source in
    [\\/$]* | ?:[\\/]* ) ac_rel_source=$ac_source ;;
	*) ac_rel_source=$ac_top_build_prefix$ac_source ;;
    esac
    ln -s "$ac_rel_source" "$ac_file" 2>/dev/null ||
      ln "$ac_source" "$ac_file" 2>/dev/null ||
      cp -p "$ac_source" "$ac_file" ||
      as_fn_error $? "cannot link or copy $ac_source to $ac_file" "$LINENO" 5
  fi
 ;;
  :C)  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: executing $ac_file commands" >&5
printf "%s\n" "$as_me: executing $ac_file commands" >&6;}
 ;;
  esac


  case $ac_file$ac_mode in
    "libtool":C)

    # See if we are running on zsh, and set the options that allow our
    # commands through without removal of \ escapes.
    if test -n "${ZSH_VERSION+set}"; then
      setopt NO_GLOB_SUBST
    fi

    cfgfile=${ofile}T
    trap "$RM \"$cfgfile\"; exit 1" 1 2 15
    $RM "$cfgfile"

    cat <<_LT_EOF >> "$cfgfile"
#! $SHELL
# Generated automatically by $as_me ($PACKAGE) $VERSION
# NOTE: Changes made to this file will be lost: look at ltmain.sh.

# Provide generalized library-building support services.
# Written by Gordon Matzigkeit, 1996

# Copyright (C) 2024 Free Software Foundation, Inc.
# This is free software; see the source for copying conditions.  There is NO
# warranty; not even for MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.

# GNU Libtool is free software; you can redistribute it and/or modify
# it under the terms of the GNU General Public License as published by
# the Free Software Foundation; either version 2 of the License, or
# (at your option) any later version.
#
# As a special exception to the GNU General Public License, if you
# distribute this file as part of a program or library that is built
# using GNU Libtool, you may include this file under the  same
# distribution terms that you use for the rest of that program.
#
# GNU Libtool is distributed in the hope that it will be useful, but
# WITHOUT ANY WARRANTY; without even the implied warranty of
# MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.  See the
# GNU General Public License for more details.
#
# You should have received a copy of the GNU General Public License
# along with this program.  If not, see <http://www.gnu.org/licenses/>.


# The names of the tagged configurations supported by this script.
available_tags=''

# Configured defaults for sys_lib_dlsearch_path munging.
: \${LT_SYS_LIBRARY_PATH="$configure_time_lt_sys_library_path"}

# ### BEGIN LIBTOOL CONFIG

# Which release of libtool.m4 was used?
macro_version=$macro_version
macro_revision=$macro_revision

# Whether or not to build shared libraries.
build_libtool_libs=$enable_shared

# Whether or not to build static libraries.
build_old_libs=$enable_static

# What type of objects to build.
pic_mode=$pic_mode

# Whether or not to optimize for fast installation.
fast_install=$enable_fast_install

# Shared archive member basename,for filename based shared library versioning on AIX.
shared_archive_member_spec=$shared_archive_member_spec

# Shell to use when invoking shell scripts.
SHELL=$lt_SHELL

# An echo program that protects backslashes.
ECHO=$lt_ECHO

# The PATH separator for the build system.
PATH_SEPARATOR=$lt_PATH_SEPARATOR

# The host system.
host_alias=$host_alias
host=$host
host_os=$host_os

# The build system.
build_alias=$build_alias
build=$build
build_os=$build_os

# A sed program that does not truncate output.
SED=$lt_SED

# Sed that helps us avoid accidentally triggering echo(1) options like -n.
Xsed="\$SED -e 1s/^X//"

# A grep program that handles long lines.
GREP=$lt_GREP

# An ERE matcher.
EGREP=$lt_EGREP

# A literal string matcher.
FGREP=$lt_FGREP

# A BSD- or MS-compatible name lister.
NM=$lt_NM

# Whether we need soft or hard links.
LN_S=$lt_LN_S

# What is the maximum length of a command?
max_cmd_len=$max_cmd_len

# Object file suffix (normally "o").
objext=$ac_objext

# Executable file suffix (normally "").
exeext=$exeext

# whether the shell understands "unset".
lt_unset=$lt_unset

# turn spaces into newlines.
SP2NL=$lt_lt_SP2NL

# turn newlines into spaces.
NL2SP=$lt_lt_NL2SP

# convert \$build file names to \$host format.
to_host_file_cmd=$lt_cv_to_host_file_cmd

# convert \$build files to toolchain format.
to_tool_file_cmd=$lt_cv_to_tool_file_cmd

# A file(cmd) program that detects file types.
FILECMD=$lt_FILECMD

# An object symbol dumper.
OBJDUMP=$lt_OBJDUMP

# Method to check whether dependent libraries are shared objects.
deplibs_check_method=$lt_deplibs_check_method

# Command to use when deplibs_check_method = "file_magic".
file_magic_cmd=$lt_file_magic_cmd

# How to find potential files when deplibs_check_method = "file_magic".
file_magic_glob=$lt_file_magic_glob

# Find potential files using nocaseglob when deplibs_check_method = "file_magic".
want_nocaseglob=$lt_want_nocaseglob

# DLL creation program.
DLLTOOL=$lt_DLLTOOL

# Command to associate shared and link libraries.
sharedlib_from_linklib_cmd=$lt_sharedlib_from_linklib_cmd

# The archiver.
AR=$lt_AR

# Flags to create an archive (by configure).
lt_ar_flags=$lt_ar_flags

# Flags to create an archive.
AR_FLAGS=\${ARFLAGS-"\$lt_ar_flags"}

# How to feed a file listing to the archiver.
archiver_list_spec=$lt_archiver_list_spec

# A symbol stripping program.
STRIP=$lt_STRIP

# Commands used to install an old-style archive.
RANLIB=$lt_RANLIB
old_postinstall_cmds=$lt_old_postinstall_cmds
old_postuninstall_cmds=$lt_old_postuninstall_cmds

# Whether to use a lock for old archive extraction.
lock_old_archive_extraction=$lock_old_archive_extraction

# A C compiler.
LTCC=$lt_CC

# LTCC compiler flags.
LTCFLAGS=$lt_CFLAGS

# Take the output of nm and produce a listing of raw symbols and C names.
global_symbol_pipe=$lt_lt_cv_sys_global_symbol_pipe

# Transform the output of nm in a proper C declaration.
global_symbol_to_cdecl=$lt_lt_cv_sys_global_symbol_to_cdecl

# Transform the output of nm into a list of symbols to manually relocate.
global_symbol_to_import=$lt_lt_cv_sys_global_symbol_to_import

# Transform the output of nm in a C name address pair.
global_symbol_to_c_name_address=$lt_lt_cv_sys_global_symbol_to_c_name_address

# Transform the output of nm in a C name address pair when lib prefix is needed.
global_symbol_to_c_name_address_lib_prefix=$lt_lt_cv_sys_global_symbol_to_c_name_address_lib_prefix

# The name lister interface.
nm_interface=$lt_lt_cv_nm_interface

# Specify filename containing input files for \$NM.
nm_file_list_spec=$lt_nm_file_list_spec

# The root where to search for dependent libraries,and where our libraries should be installed.
lt_sysroot=$lt_sysroot

# Command to truncate a binary pipe.
lt_truncate_bin=$lt_lt_cv_truncate_bin

# The name of the directory that contains temporary libtool files.
objdir=$objdir

# Used to examine libraries when file_magic_cmd begins with "file".
MAGIC_CMD=$MAGIC_CMD

# Must we lock files when doing compilation?
need_locks=$lt_need_locks

# Manifest tool.
MANIFEST_TOOL=$lt_MANIFEST_TOOL

# Tool to manipulate archived DWARF debug symbol files on Mac OS X.
DSYMUTIL=$lt_DSYMUTIL

# Tool to change global to local symbols on Mac OS X.
NMEDIT=$lt_NMEDIT

# Tool to manipulate fat objects and archives on Mac OS X.
LIPO=$lt_LIPO

# ldd/readelf like tool for Mach-O binaries on Mac OS X.
OTOOL=$lt_OTOOL

# ldd/readelf like tool for 64 bit Mach-O binaries on Mac OS X 10.4.
OTOOL64=$lt_OTOOL64

# Old archive suffix (normally "a").
libext=$libext

# Shared library suffix (normally ".so").
shrext_cmds=$lt_shrext_cmds

# The commands to extract the exported symbol list from a shared archive.
extract_expsyms_cmds=$lt_extract_expsyms_cmds

# Variables whose values should be saved in libtool wrapper scripts and
# restored at link time.
variables_saved_for_relink=$lt_variables_saved_for_relink

# Do we need the "lib" prefix for modules?
need_lib_prefix=$need_lib_prefix

# Do we need a version for libraries?
need_version=$need_version

# Library versioning type.
version_type=$version_type

# Shared library runtime path variable.
runpath_var=$runpath_var

# Shared library path variable.
shlibpath_var=$shlibpath_var

# Is shlibpath searched before the hard-coded library search path?
shlibpath_overrides_runpath=$shlibpath_overrides_runpath

# Format of library name prefix.
libname_spec=$lt_libname_spec

# List of archive names.  First name is the real one, the rest are links.
# The last name is the one that the linker finds with -lNAME
library_names_spec=$lt_library_names_spec

# The coded name of the library, if different from the real name.
soname_spec=$lt_soname_spec

# Permission mode override for installation of shared libraries.
install_override_mode=$lt_install_override_mode

# Command to use after installation of a shared archive.
postinstall_cmds=$lt_postinstall_cmds

# Command to use after uninstallation of a shared archive.
postuninstall_cmds=$lt_postuninstall_cmds

# Commands used to finish a libtool library installation in a directory.
finish_cmds=$lt_finish_cmds

# As "finish_cmds", except a single script fragment to be evaled but
# not shown.
finish_eval=$lt_finish_eval

# Whether we should hardcode library paths into libraries.
hardcode_into_libs=$hardcode_into_libs

# Compile-time system search path for libraries.
sys_lib_search_path_spec=$lt_sys_lib_search_path_spec

# Detected run-time system search path for libraries.
sys_lib_dlsearch_path_spec=$lt_configure_time_dlsearch_path

# Explicit LT_SYS_LIBRARY_PATH set during ./configure time.
configure_time_lt_sys_library_path=$lt_configure_time_lt_sys_library_path

# Whether dlopen is supported.
dlopen_support=$enable_dlopen

# Whether dlopen of programs is supported.
dlopen_self=$enable_dlopen_self

# Whether dlopen of statically linked programs is supported.
dlopen_self_static=$enable_dlopen_self_static

# Commands to strip libraries.
old_striplib=$lt_old_striplib
striplib=$lt_striplib


# The linker used to build libraries.
LD=$lt_LD

# How to create reloadable object files.
reload_flag=$lt_reload_flag
reload_cmds=$lt_reload_cmds

# Commands used to build an old-style archive.
old_archive_cmds=$lt_old_archive_cmds

# A language specific compiler.
CC=$lt_compiler

# Is the compiler the GNU compiler?
with_gcc=$GCC

# Compiler flag to turn off builtin functions.
no_builtin_flag=$lt_lt_prog_compiler_no_builtin_flag

# Additional compiler flags for building library objects.
pic_flag=$lt_lt_prog_compiler_pic

# How to pass a linker flag through the compiler.
wl=$lt_lt_prog_compiler_wl

# Compiler flag to prevent dynamic linking.
link_static_flag=$lt_lt_prog_compiler_static

# Does compiler simultaneously support -c and -o options?
compiler_c_o=$lt_lt_cv_prog_compiler_c_o

# Whether or not to add -lc for building shared libraries.
build_libtool_need_lc=$archive_cmds_need_lc

# Whether or not to disallow shared libs when runtime libs are static.
allow_libtool_libs_with_static_runtimes=$enable_shared_with_static_runtimes

# Compiler flag to allow reflexive dlopens.
export_dynamic_flag_spec=$lt_export_dynamic_flag_spec

# Compiler flag to generate shared objects directly from archives.
whole_archive_flag_spec=$lt_whole_archive_flag_spec

# Whether the compiler copes with passing no objects directly.
compiler_needs_object=$lt_compiler_needs_object

# Create an old-style archive from a shared archive.
old_archive_from_new_cmds=$lt_old_archive_from_new_cmds

# Create a temporary old-style archive to link instead of a shared archive.
old_archive_from_expsyms_cmds=$lt_old_archive_from_expsyms_cmds

# Commands used to build a shared archive.
archive_cmds=$lt_archive_cmds
archive_expsym_cmds=$lt_archive_expsym_cmds

# Commands used to build a loadable module if different from building
# a shared archive.
module_cmds=$lt_module_cmds
module_expsym_cmds=$lt_module_expsym_cmds

# Whether we are building with GNU ld or not.
with_gnu_ld=$lt_with_gnu_ld

# Flag that allows shared libraries with undefined symbols to be built.
allow_undefined_flag=$lt_allow_undefined_flag

# Flag that enforces no undefined symbols.
no_undefined_flag=$lt_no_undefined_flag

# Flag to hardcode \$libdir into a binary during linking.
# This must work even if \$libdir does not exist
hardcode_libdir_flag_spec=$lt_hardcode_libdir_flag_spec

# Whether we need a single "-rpath" flag with a separated argument.
hardcode_libdir_separator=$lt_hardcode_libdir_separator

# Set to "yes" if using DIR/libNAME\$shared_ext during linking hardcodes
# DIR into the resulting binary.
hardcode_direct=$hardcode_direct

# Set to "yes" if using DIR/libNAME\$shared_ext during linking hardcodes
# DIR into the resulting binary and the resulting library dependency is
# "absolute",i.e. impossible to change by setting \$shlibpath_var if the
# library is relocated.
hardcode_direct_absolute=$hardcode_direct_absolute

# Set to "yes" if using the -LDIR flag during linking hardcodes DIR
# into the resulting binary.
hardcode_minus_L=$hardcode_minus_L

# Set to "yes" if using SHLIBPATH_VAR=DIR during linking hardcodes DIR
# into the resulting binary.
hardcode_shlibpath_var=$hardcode_shlibpath_var

# Set to "yes" if building a shared library automatically hardcodes DIR
# into the library and all subsequent libraries and executables linked
# against it.
hardcode_automatic=$hardcode_automatic

# Set to yes if linker adds runtime paths of dependent libraries
# to runtime path list.
inherit_rpath=$inherit_rpath

# Whether libtool must link a program against all its dependency libraries.
link_all_deplibs=$link_all_deplibs

# Set to "yes" if exported symbols are required.
always_export_symbols=$always_export_symbols

# The commands to list exported symbols.
export_symbols_cmds=$lt_export_symbols_cmds

# Symbols that should not be listed in the preloaded symbols.
exclude_expsyms=$lt_exclude_expsyms

# Symbols that must always be exported.
include_expsyms=$lt_include_expsyms

# Commands necessary for linking programs (against libraries) with templates.
prelink_cmds=$lt_prelink_cmds

# Commands necessary for finishing linking programs.
postlink_cmds=$lt_postlink_cmds

# Specify filename containing input files.
file_list_spec=$lt_file_list_spec

# How to hardcode a shared library path into an executable.
hardcode_action=$hardcode_action

# ### END LIBTOOL CONFIG

_LT_EOF

    cat <<'_LT_EOF' >> "$cfgfile"

# ### BEGIN FUNCTIONS SHARED WITH CONFIGURE

# func_munge_path_list VARIABLE PATH
# -----------------------------------
# VARIABLE is name of variable containing _space_ separated list of
# directories to be munged by the contents of PATH, which is string
# having a format:
# "DIR[:DIR]:"
#       string "DIR[ DIR]" will be prepended to VARIABLE
# ":DIR[:DIR]"
#       string "DIR[ DIR]" will be appended to VARIABLE
# "DIRP[:DIRP]::[DIRA:]DIRA"
#       string "DIRP[ DIRP]" will be prepended to VARIABLE and string
#       "DIRA[ DIRA]" will be appended to VARIABLE
# "DIR[:DIR]"
#       VARIABLE will be replaced by "DIR[ DIR]"
func_munge_path_list ()
{
    case x$2 in
    x)
        ;;
    *:)
        eval $1=\"`$ECHO $2 | $SED 's/:/ /g'` \$$1\"
        ;;
    x:*)
        eval $1=\"\$$1 `$ECHO $2 | $SED 's/:/ /g'`\"
        ;;
    *::*)
        eval $1=\"\$$1\ `$ECHO $2 | $SED -e 's/.*:://' -e 's/:/ /g'`\"
        eval $1=\"`$ECHO $2 | $SED -e 's/::.*//' -e 's/:/ /g'`\ \$$1\"
        ;;
    *)
        eval $1=\"`$ECHO $2 | $SED 's/:/ /g'`\"
        ;;
    esac
}


# Calculate cc_basename.  Skip known compiler wrappers and cross-prefix.
func_cc_basename ()
{
    for cc_temp in $*""; do
      case $cc_temp in
        compile | *[\\/]compile | ccache | *[\\/]ccache ) ;;
        distcc | *[\\/]distcc | purify | *[\\/]purify ) ;;
        \-*) ;;
        *) break;;
      esac
    done
    func_cc_basename_result=`$ECHO "$cc_temp" | $SED "s%.*/%%; s%^$host_alias-%%"`
}


# ### END FUNCTIONS SHARED WITH CONFIGURE

_LT_EOF

  case $host_os in
  aix3*)
    cat <<\_LT_EOF >> "$cfgfile"
# AIX sometimes has problems with the GCC collect2 program.  For some
# reason, if we set the COLLECT_NAMES environment variable, the problems
# vanish in a puff of smoke.
if test set != "${COLLECT_NAMES+set}"; then
  COLLECT_NAMES=
  export COLLECT_NAMES
fi
_LT_EOF
    ;;
  esac



ltmain=$ac_aux_dir/ltmain.sh


  # We use sed instead of cat because bash on DJGPP gets confused if
  # if finds mixed CR/LF and LF-only lines.  Since sed operates in
  # text mode, it properly converts lines to CR/LF.  This bash problem
  # is reportedly fixed, but why not run on old versions too?
  $SED '$q' "$ltmain" >> "$cfgfile" \
     || (rm -f "$cfgfile"; exit 1)

   mv -f "$cfgfile" "$ofile" ||
    (rm -f "$ofile" && cp "$cfgfile" "$ofile" && rm -f "$cfgfile")
  chmod +x "$ofile"

 ;;
    "runtime/ld.conf":C) rm -f runtime/ld.conf
  test x"$ocaml_additional_stublibs_dir" = 'x' || \
    echo "$ocaml_additional_stublibs_dir" > runtime/ld.conf
  if $supports_shared_libraries; then
    echo ".${default_separator}stublibs" >> runtime/ld.conf
  fi
  echo "." >> runtime/ld.conf ;;

  esac
done # for ac_tag


as_fn_exit 0
+ echo ================================
================================
+ grep -F -e prefix -e DIR= Makefile.config
CONFIGURE_ARGS=--build=i686-pc-cygwin --host=i686-w64-mingw32 --prefix=C:/ocamlmgw-44619 --with-relative-libdir=..\lib\ocaml --enable-runtime-search=always --enable-runtime-search-target --enable-ocamltest --enable-dependency-generation --enable-codegen-invariants
prefix=C:/ocamlmgw-44619
exec_prefix=${prefix}
BINDIR=${exec_prefix}/bin
datarootdir=${prefix}/share
LIBDIR=${exec_prefix}/bin/../lib/ocaml
STUBLIBDIR=${exec_prefix}/bin/../lib/ocaml/stublibs
MANDIR=${prefix}/man
PROGRAMS_MAN_DIR=$(MANDIR)/man1
LIBRARIES_MAN_DIR=$(MANDIR)/man3
MKEXE=flexlink -exe -chain mingw -stack 16777216 -link -municode $(addprefix -link ,$(OC_LDFLAGS))
MKDLL=flexlink -chain mingw -stack 16777216 $(addprefix -link ,$(OC_DLL_LDFLAGS)) 
+ grep -F LIBDIR Makefile.build_config
TARGET_LIBDIR=..\lib\ocaml
TARGET_LIBDIR_IS_RELATIVE=true
+ make -j2
mkdir -p .dep/ocamltest
mkdir -p .dep/runtime
  GEN runtime/caml/opnames.h
  GEN runtime/caml/jumptbl.h
  MKEXE runtime/sak.exe
  CCDEPS .dep/ocamltest/run_stubs.d
  CCDEPS .dep/ocamltest/run_win32.d
  GEN runtime/build_config.h
  CCDEPS .dep/runtime/instrtrace.bpic.d
  CCDEPS .dep/runtime/zstd.bpic.d
  CCDEPS .dep/runtime/startup_byt.bpic.d
  CCDEPS .dep/runtime/interp.bpic.d
  CCDEPS .dep/runtime/fix_code.bpic.d
  CCDEPS .dep/runtime/fail_byt.bpic.d
  CCDEPS .dep/runtime/backtrace_byt.bpic.d
  CCDEPS .dep/runtime/weak.bpic.d
  CCDEPS .dep/runtime/win32.bpic.d
  CCDEPS .dep/runtime/sys.bpic.d
  CCDEPS .dep/runtime/sync.bpic.d
  CCDEPS .dep/runtime/str.bpic.d
  CCDEPS .dep/runtime/startup_aux.bpic.d
  CCDEPS .dep/runtime/skiplist.bpic.d
  CCDEPS .dep/runtime/signals.bpic.d
  CCDEPS .dep/runtime/shared_heap.bpic.d
  CCDEPS .dep/runtime/runtime_events.bpic.d
  CCDEPS .dep/runtime/roots.bpic.d
  CCDEPS .dep/runtime/prng.bpic.d
  CCDEPS .dep/runtime/printexc.bpic.d
  CCDEPS .dep/runtime/platform.bpic.d
  CCDEPS .dep/runtime/parsing.bpic.d
  CCDEPS .dep/runtime/obj.bpic.d
  CCDEPS .dep/runtime/misc.bpic.d
  CCDEPS .dep/runtime/minor_gc.bpic.d
  CCDEPS .dep/runtime/meta.bpic.d
  CCDEPS .dep/runtime/memprof.bpic.d
  CCDEPS .dep/runtime/memory.bpic.d
  CCDEPS .dep/runtime/md5.bpic.d
  CCDEPS .dep/runtime/major_gc.bpic.d
  CCDEPS .dep/runtime/main.bpic.d
  CCDEPS .dep/runtime/lf_skiplist.bpic.d
  CCDEPS .dep/runtime/lexing.bpic.d
  CCDEPS .dep/runtime/io.bpic.d
  CCDEPS .dep/runtime/ints.bpic.d
  CCDEPS .dep/runtime/intern.bpic.d
  CCDEPS .dep/runtime/hash.bpic.d
  CCDEPS .dep/runtime/globroots.bpic.d
  CCDEPS .dep/runtime/gc_stats.bpic.d
  CCDEPS .dep/runtime/gc_ctrl.bpic.d
  CCDEPS .dep/runtime/floats.bpic.d
  CCDEPS .dep/runtime/finalise.bpic.d
  CCDEPS .dep/runtime/fiber.bpic.d
  CCDEPS .dep/runtime/fail.bpic.d
  CCDEPS .dep/runtime/extern.bpic.d
  CCDEPS .dep/runtime/dynlink.bpic.d
  CCDEPS .dep/runtime/domain.bpic.d
  CCDEPS .dep/runtime/debugger.bpic.d
  CCDEPS .dep/runtime/custom.bpic.d
  CCDEPS .dep/runtime/compare.bpic.d
  CCDEPS .dep/runtime/codefrag.bpic.d
  CCDEPS .dep/runtime/callback.bpic.d
  CCDEPS .dep/runtime/blake2.bpic.d
  CCDEPS .dep/runtime/bigarray.bpic.d
  CCDEPS .dep/runtime/backtrace.bpic.d
  CCDEPS .dep/runtime/array.bpic.d
  CCDEPS .dep/runtime/alloc.bpic.d
  CCDEPS .dep/runtime/afl.bpic.d
  CCDEPS .dep/runtime/addrmap.bpic.d
  CCDEPS .dep/runtime/instrtrace.bi.d
  CCDEPS .dep/runtime/zstd.bi.d
  CCDEPS .dep/runtime/startup_byt.bi.d
  CCDEPS .dep/runtime/interp.bi.d
  CCDEPS .dep/runtime/fix_code.bi.d
  CCDEPS .dep/runtime/fail_byt.bi.d
  CCDEPS .dep/runtime/backtrace_byt.bi.d
  CCDEPS .dep/runtime/weak.bi.d
  CCDEPS .dep/runtime/win32.bi.d
  CCDEPS .dep/runtime/sys.bi.d
  CCDEPS .dep/runtime/sync.bi.d
  CCDEPS .dep/runtime/str.bi.d
  CCDEPS .dep/runtime/startup_aux.bi.d
  CCDEPS .dep/runtime/skiplist.bi.d
  CCDEPS .dep/runtime/signals.bi.d
  CCDEPS .dep/runtime/shared_heap.bi.d
  CCDEPS .dep/runtime/runtime_events.bi.d
  CCDEPS .dep/runtime/roots.bi.d
  CCDEPS .dep/runtime/prng.bi.d
  CCDEPS .dep/runtime/printexc.bi.d
  CCDEPS .dep/runtime/platform.bi.d
  CCDEPS .dep/runtime/parsing.bi.d
  CCDEPS .dep/runtime/obj.bi.d
  CCDEPS .dep/runtime/misc.bi.d
  CCDEPS .dep/runtime/minor_gc.bi.d
  CCDEPS .dep/runtime/meta.bi.d
  CCDEPS .dep/runtime/memprof.bi.d
  CCDEPS .dep/runtime/memory.bi.d
  CCDEPS .dep/runtime/md5.bi.d
  CCDEPS .dep/runtime/major_gc.bi.d
  CCDEPS .dep/runtime/main.bi.d
  CCDEPS .dep/runtime/lf_skiplist.bi.d
  CCDEPS .dep/runtime/lexing.bi.d
  CCDEPS .dep/runtime/io.bi.d
  CCDEPS .dep/runtime/ints.bi.d
  CCDEPS .dep/runtime/intern.bi.d
  CCDEPS .dep/runtime/hash.bi.d
  CCDEPS .dep/runtime/globroots.bi.d
  CCDEPS .dep/runtime/gc_stats.bi.d
  CCDEPS .dep/runtime/gc_ctrl.bi.d
  CCDEPS .dep/runtime/floats.bi.d
  CCDEPS .dep/runtime/finalise.bi.d
  CCDEPS .dep/runtime/fiber.bi.d
  CCDEPS .dep/runtime/fail.bi.d
  CCDEPS .dep/runtime/extern.bi.d
  CCDEPS .dep/runtime/dynlink.bi.d
  CCDEPS .dep/runtime/domain.bi.d
  CCDEPS .dep/runtime/debugger.bi.d
  CCDEPS .dep/runtime/custom.bi.d
  CCDEPS .dep/runtime/compare.bi.d
  CCDEPS .dep/runtime/codefrag.bi.d
  CCDEPS .dep/runtime/callback.bi.d
  CCDEPS .dep/runtime/blake2.bi.d
  CCDEPS .dep/runtime/bigarray.bi.d
  CCDEPS .dep/runtime/backtrace.bi.d
  CCDEPS .dep/runtime/array.bi.d
  CCDEPS .dep/runtime/alloc.bi.d
  CCDEPS .dep/runtime/afl.bi.d
  CCDEPS .dep/runtime/addrmap.bi.d
  CCDEPS .dep/runtime/instrtrace.bd.d
  CCDEPS .dep/runtime/zstd.bd.d
  CCDEPS .dep/runtime/startup_byt.bd.d
  CCDEPS .dep/runtime/interp.bd.d
  CCDEPS .dep/runtime/fix_code.bd.d
  CCDEPS .dep/runtime/fail_byt.bd.d
  CCDEPS .dep/runtime/backtrace_byt.bd.d
  CCDEPS .dep/runtime/weak.bd.d
  CCDEPS .dep/runtime/win32.bd.d
  CCDEPS .dep/runtime/sys.bd.d
  CCDEPS .dep/runtime/sync.bd.d
  CCDEPS .dep/runtime/str.bd.d
  CCDEPS .dep/runtime/startup_aux.bd.d
  CCDEPS .dep/runtime/skiplist.bd.d
  CCDEPS .dep/runtime/signals.bd.d
  CCDEPS .dep/runtime/shared_heap.bd.d
  CCDEPS .dep/runtime/runtime_events.bd.d
  CCDEPS .dep/runtime/roots.bd.d
  CCDEPS .dep/runtime/prng.bd.d
  CCDEPS .dep/runtime/printexc.bd.d
  CCDEPS .dep/runtime/platform.bd.d
  CCDEPS .dep/runtime/parsing.bd.d
  CCDEPS .dep/runtime/obj.bd.d
  CCDEPS .dep/runtime/misc.bd.d
  CCDEPS .dep/runtime/minor_gc.bd.d
  CCDEPS .dep/runtime/meta.bd.d
  CCDEPS .dep/runtime/memprof.bd.d
  CCDEPS .dep/runtime/memory.bd.d
  CCDEPS .dep/runtime/md5.bd.d
  CCDEPS .dep/runtime/major_gc.bd.d
  CCDEPS .dep/runtime/main.bd.d
  CCDEPS .dep/runtime/lf_skiplist.bd.d
  CCDEPS .dep/runtime/lexing.bd.d
  CCDEPS .dep/runtime/io.bd.d
  CCDEPS .dep/runtime/ints.bd.d
  CCDEPS .dep/runtime/intern.bd.d
  CCDEPS .dep/runtime/hash.bd.d
  CCDEPS .dep/runtime/globroots.bd.d
  CCDEPS .dep/runtime/gc_stats.bd.d
  CCDEPS .dep/runtime/gc_ctrl.bd.d
  CCDEPS .dep/runtime/floats.bd.d
  CCDEPS .dep/runtime/finalise.bd.d
  CCDEPS .dep/runtime/fiber.bd.d
  CCDEPS .dep/runtime/fail.bd.d
  CCDEPS .dep/runtime/extern.bd.d
  CCDEPS .dep/runtime/dynlink.bd.d
  CCDEPS .dep/runtime/domain.bd.d
  CCDEPS .dep/runtime/debugger.bd.d
  CCDEPS .dep/runtime/custom.bd.d
  CCDEPS .dep/runtime/compare.bd.d
  CCDEPS .dep/runtime/codefrag.bd.d
  CCDEPS .dep/runtime/callback.bd.d
  CCDEPS .dep/runtime/blake2.bd.d
  CCDEPS .dep/runtime/bigarray.bd.d
  CCDEPS .dep/runtime/backtrace.bd.d
  CCDEPS .dep/runtime/array.bd.d
  CCDEPS .dep/runtime/alloc.bd.d
  CCDEPS .dep/runtime/afl.bd.d
  CCDEPS .dep/runtime/addrmap.bd.d
  CCDEPS .dep/runtime/instrtrace.b.d
  CCDEPS .dep/runtime/zstd.b.d
  CCDEPS .dep/runtime/startup_byt.b.d
  CCDEPS .dep/runtime/interp.b.d
  CCDEPS .dep/runtime/fix_code.b.d
  CCDEPS .dep/runtime/fail_byt.b.d
  CCDEPS .dep/runtime/backtrace_byt.b.d
  CCDEPS .dep/runtime/weak.b.d
  CCDEPS .dep/runtime/win32.b.d
  CCDEPS .dep/runtime/sys.b.d
  CCDEPS .dep/runtime/sync.b.d
  CCDEPS .dep/runtime/str.b.d
  CCDEPS .dep/runtime/startup_aux.b.d
  CCDEPS .dep/runtime/skiplist.b.d
  CCDEPS .dep/runtime/signals.b.d
  CCDEPS .dep/runtime/shared_heap.b.d
  CCDEPS .dep/runtime/runtime_events.b.d
  CCDEPS .dep/runtime/roots.b.d
  CCDEPS .dep/runtime/prng.b.d
  CCDEPS .dep/runtime/printexc.b.d
  CCDEPS .dep/runtime/platform.b.d
  CCDEPS .dep/runtime/parsing.b.d
  CCDEPS .dep/runtime/obj.b.d
  CCDEPS .dep/runtime/misc.b.d
  CCDEPS .dep/runtime/minor_gc.b.d
  CCDEPS .dep/runtime/meta.b.d
  CCDEPS .dep/runtime/memprof.b.d
  CCDEPS .dep/runtime/memory.b.d
  CCDEPS .dep/runtime/md5.b.d
  CCDEPS .dep/runtime/major_gc.b.d
  CCDEPS .dep/runtime/main.b.d
  CCDEPS .dep/runtime/lf_skiplist.b.d
  CCDEPS .dep/runtime/lexing.b.d
  CCDEPS .dep/runtime/io.b.d
  CCDEPS .dep/runtime/ints.b.d
  CCDEPS .dep/runtime/intern.b.d
  CCDEPS .dep/runtime/hash.b.d
  CCDEPS .dep/runtime/globroots.b.d
  CCDEPS .dep/runtime/gc_stats.b.d
  CCDEPS .dep/runtime/gc_ctrl.b.d
  CCDEPS .dep/runtime/floats.b.d
  CCDEPS .dep/runtime/finalise.b.d
  CCDEPS .dep/runtime/fiber.b.d
  CCDEPS .dep/runtime/fail.b.d
  CCDEPS .dep/runtime/extern.b.d
  CCDEPS .dep/runtime/dynlink.b.d
  CCDEPS .dep/runtime/domain.b.d
  CCDEPS .dep/runtime/debugger.b.d
  CCDEPS .dep/runtime/custom.b.d
  CCDEPS .dep/runtime/compare.b.d
  CCDEPS .dep/runtime/codefrag.b.d
  CCDEPS .dep/runtime/callback.b.d
  CCDEPS .dep/runtime/blake2.b.d
  CCDEPS .dep/runtime/bigarray.b.d
  CCDEPS .dep/runtime/backtrace.b.d
  CCDEPS .dep/runtime/array.b.d
  CCDEPS .dep/runtime/alloc.b.d
  CCDEPS .dep/runtime/afl.b.d
  CCDEPS .dep/runtime/addrmap.b.d
  GEN runtime/primitives
  CC runtime/addrmap.b.o
  CC runtime/afl.b.o
  CC runtime/alloc.b.o
  CC runtime/array.b.o
  CC runtime/backtrace.b.o
  CC runtime/bigarray.b.o
  CC runtime/blake2.b.o
  CC runtime/callback.b.o
  CC runtime/codefrag.b.o
  CC runtime/compare.b.o
  CC runtime/custom.b.o
  CC runtime/debugger.b.o
  CC runtime/domain.b.o
  CC runtime/dynlink.b.o
  CC runtime/extern.b.o
  CC runtime/fail.b.o
  CC runtime/fiber.b.o
  CC runtime/finalise.b.o
  CC runtime/floats.b.o
  CC runtime/gc_ctrl.b.o
  CC runtime/gc_stats.b.o
  CC runtime/globroots.b.o
  CC runtime/hash.b.o
  CC runtime/intern.b.o
  CC runtime/ints.b.o
  CC runtime/io.b.o
  CC runtime/lexing.b.o
  CC runtime/lf_skiplist.b.o
  CC runtime/main.b.o
  CC runtime/major_gc.b.o
  CC runtime/md5.b.o
  CC runtime/memory.b.o
  CC runtime/memprof.b.o
  CC runtime/meta.b.o
  CC runtime/minor_gc.b.o
  CC runtime/misc.b.o
  CC runtime/obj.b.o
  CC runtime/parsing.b.o
  CC runtime/platform.b.o
  CC runtime/printexc.b.o
  CC runtime/prng.b.o
  CC runtime/roots.b.o
  CC runtime/runtime_events.b.o
  CC runtime/shared_heap.b.o
  CC runtime/signals.b.o
  CC runtime/skiplist.b.o
  CC runtime/startup_aux.b.o
  CC runtime/str.b.o
  CC runtime/sync.b.o
  CC runtime/sys.b.o
  CC runtime/win32_non_shared.b.o
  CC runtime/weak.b.o
  CC runtime/backtrace_byt.b.o
  CC runtime/fail_byt.b.o
  CC runtime/fix_code.b.o
  CC runtime/interp.b.o
  CC runtime/startup_byt.b.o
  CC runtime/zstd.b.o
  CC runtime/win32.b.o
  GEN runtime/prims.c
  MKLIB runtime/libcamlrun_non_shared.a
  CC runtime/prims.o
  MKEXE runtime/ocamlruns.exe
cp runtime/ocamlruns.exe boot/ocamlrun.exe
  MKLIB runtime/libcamlrun.a
cd stdlib; ln -sf ../runtime/libcamlrun.a .
make -C stdlib OCAMLRUN='$(ROOTDIR)/boot/ocamlrun.exe' USE_BOOT_OCAMLC=true all
make[1]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/stdlib'
  OCAMLC camlinternalFormatBasics.cmi
  CC header.o
  OCAMLC camlinternalFormatBasics.cmo
  OCAMLC stdlib.cmi
  MKEXE tmpheader.exe
  OCAMLC stdlib.cmo
i686-w64-mingw32-strip tmpheader.exe
  OCAMLC stdlib__Either.cmi
  OCAMLC stdlib__Sys.cmi
  OCAMLC stdlib__Int32.cmi
  OCAMLC stdlib__Type.cmi
  OCAMLC stdlib__Atomic.cmi
  OCAMLC camlinternalLazy.cmi
  OCAMLC stdlib__Seq.cmi
  OCAMLC stdlib__Pair.cmi
  OCAMLC stdlib__Bool.cmi
  OCAMLC stdlib__Char.cmi
  OCAMLC stdlib__Uchar.cmi
  OCAMLC stdlib__List.cmi
  OCAMLC stdlib__Int.cmi
  OCAMLC stdlib__Array.cmi
  OCAMLC stdlib__Iarray.cmi
  OCAMLC stdlib__Bytes.cmi
  OCAMLC stdlib__String.cmi
  OCAMLC stdlib__Unit.cmi
  OCAMLC stdlib__Marshal.cmi
  OCAMLC stdlib__Float.cmi
  OCAMLC stdlib__Int32.cmo
  OCAMLC stdlib__Int64.cmi
  OCAMLC stdlib__Nativeint.cmi
  OCAMLC stdlib__Lexing.cmi
  OCAMLC stdlib__Repr.cmi
  OCAMLC stdlib__Set.cmi
  OCAMLC stdlib__Map.cmi
  OCAMLC stdlib__Stack.cmi
  OCAMLC stdlib__Queue.cmi
  OCAMLC stdlib__Buffer.cmi
  OCAMLC stdlib__Mutex.cmi
  OCAMLC stdlib__Semaphore.cmi
  OCAMLC stdlib__Domain.cmi
  OCAMLC camlinternalFormat.cmi
  OCAMLC stdlib__Printf.cmi
  OCAMLC stdlib__Arg.cmi
  OCAMLC stdlib__Fun.cmi
  OCAMLC stdlib__Complex.cmi
  OCAMLC stdlib__Digest.cmi
  OCAMLC stdlib__Random.cmi
  OCAMLC stdlib__Hashtbl.cmi
  OCAMLC stdlib__Format.cmi
  OCAMLC stdlib__Scanf.cmi
  OCAMLC stdlib__Callback.cmi
  OCAMLC stdlib__Dynarray.cmi
  OCAMLC stdlib__Pqueue.cmi
  OCAMLC stdlib__Ephemeron.cmi
  OCAMLC stdlib__Filename.cmi
  OCAMLC stdlib__Complex.cmo
  OCAMLC stdlib__ArrayLabels.cmi
  OCAMLC stdlib__ListLabels.cmi
  OCAMLC stdlib__BytesLabels.cmi
  OCAMLC stdlib__StringLabels.cmi
  OCAMLC stdlib__MoreLabels.cmi
  OCAMLC std_exit.cmi
  OCAMLC stdlib__Either.cmo
  OCAMLC stdlib__Sys.cmo
  OCAMLC stdlib__Obj.cmi
  OCAMLC stdlib__Atomic.cmo
  OCAMLC stdlib__Lazy.cmi
  OCAMLC stdlib__Option.cmi
  OCAMLC stdlib__Pair.cmo
  OCAMLC stdlib__Result.cmi
  OCAMLC stdlib__Bool.cmo
  OCAMLC stdlib__Char.cmo
  OCAMLC stdlib__Uchar.cmo
  OCAMLC stdlib__List.cmo
  OCAMLC stdlib__Int.cmo
  OCAMLC stdlib__Array.cmo
  OCAMLC stdlib__Iarray.cmo
  OCAMLC stdlib__Bytes.cmo
  OCAMLC stdlib__String.cmo
  OCAMLC stdlib__Unit.cmo
  OCAMLC stdlib__Marshal.cmo
  OCAMLC stdlib__Float.cmo
  OCAMLC stdlib__Int64.cmo
  OCAMLC stdlib__Nativeint.cmo
  OCAMLC stdlib__Lexing.cmo
  OCAMLC stdlib__Parsing.cmi
  OCAMLC stdlib__Repr.cmo
  OCAMLC stdlib__Set.cmo
  OCAMLC stdlib__Map.cmo
  OCAMLC stdlib__Stack.cmo
  OCAMLC stdlib__Queue.cmo
  OCAMLC stdlib__Buffer.cmo
  OCAMLC stdlib__Mutex.cmo
  OCAMLC stdlib__Condition.cmi
  OCAMLC camlinternalFormat.cmo
  OCAMLC stdlib__Printf.cmo
  OCAMLC stdlib__Arg.cmo
  OCAMLC stdlib__Printexc.cmi
  OCAMLC stdlib__Bigarray.cmi
  OCAMLC stdlib__Hashtbl.cmo
  OCAMLC stdlib__Weak.cmi
  OCAMLC stdlib__Format.cmo
  OCAMLC stdlib__Scanf.cmo
  OCAMLC stdlib__Callback.cmo
  OCAMLC camlinternalOO.cmi
  OCAMLC camlinternalMod.cmi
  OCAMLC stdlib__Pqueue.cmo
  OCAMLC stdlib__Ephemeron.cmo
  OCAMLC stdlib__Filename.cmo
  OCAMLC stdlib__ArrayLabels.cmo
  OCAMLC stdlib__ListLabels.cmo
  OCAMLC stdlib__BytesLabels.cmo
  OCAMLC stdlib__StringLabels.cmo
  OCAMLC stdlib__MoreLabels.cmo
  OCAMLC stdlib__StdLabels.cmi
  OCAMLC stdlib__Effect.cmi
  OCAMLC std_exit.cmo
  OCAMLC stdlib__Obj.cmo
  OCAMLC stdlib__Type.cmo
  OCAMLC camlinternalLazy.cmo
  OCAMLC stdlib__Lazy.cmo
  OCAMLC stdlib__Seq.cmo
  OCAMLC stdlib__Option.cmo
  OCAMLC stdlib__Result.cmo
  OCAMLC stdlib__Parsing.cmo
  OCAMLC stdlib__Condition.cmo
  OCAMLC stdlib__Semaphore.cmo
  OCAMLC stdlib__Domain.cmo
  OCAMLC stdlib__Printexc.cmo
  OCAMLC stdlib__Fun.cmo
  OCAMLC stdlib__Gc.cmi
  OCAMLC stdlib__In_channel.cmi
  OCAMLC stdlib__Out_channel.cmi
  OCAMLC stdlib__Bigarray.cmo
  OCAMLC stdlib__Random.cmo
  OCAMLC stdlib__Weak.cmo
  OCAMLC camlinternalOO.cmo
  OCAMLC stdlib__Oo.cmi
  OCAMLC camlinternalMod.cmo
  OCAMLC stdlib__Dynarray.cmo
  OCAMLC stdlib__StdLabels.cmo
  OCAMLC stdlib__Effect.cmo
  OCAMLC stdlib__Gc.cmo
  OCAMLC stdlib__In_channel.cmo
  OCAMLC stdlib__Out_channel.cmo
  OCAMLC stdlib__Digest.cmo
  OCAMLC stdlib__Oo.cmo
  LINKC stdlib.cma
rm tmpheader.exe
make[1]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/stdlib'
rm -f boot/libcamlrun.a boot/stdlib.cma boot/std_exit.cmo boot/*.cmi boot/runtime-launch-info
cp stdlib/stdlib.cma stdlib/std_exit.cmo stdlib/*.cmi stdlib/runtime-launch-info boot
cd boot; ln -sf ../runtime/libcamlrun.a .
make all
make[1]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
  CC runtime/addrmap.bd.o
  CC runtime/afl.bd.o
  CC runtime/alloc.bd.o
  CC runtime/array.bd.o
  CC runtime/backtrace.bd.o
  CC runtime/bigarray.bd.o
  CC runtime/blake2.bd.o
  CC runtime/callback.bd.o
  CC runtime/codefrag.bd.o
  CC runtime/compare.bd.o
  CC runtime/custom.bd.o
  CC runtime/debugger.bd.o
  CC runtime/domain.bd.o
  CC runtime/dynlink.bd.o
  CC runtime/extern.bd.o
  CC runtime/fail.bd.o
  CC runtime/fiber.bd.o
  CC runtime/finalise.bd.o
  CC runtime/floats.bd.o
  CC runtime/gc_ctrl.bd.o
  CC runtime/gc_stats.bd.o
  CC runtime/globroots.bd.o
  CC runtime/hash.bd.o
  CC runtime/intern.bd.o
  CC runtime/ints.bd.o
  CC runtime/io.bd.o
  CC runtime/lexing.bd.o
  CC runtime/lf_skiplist.bd.o
  CC runtime/main.bd.o
  CC runtime/major_gc.bd.o
  CC runtime/md5.bd.o
  CC runtime/memory.bd.o
  CC runtime/memprof.bd.o
  CC runtime/meta.bd.o
  CC runtime/minor_gc.bd.o
  CC runtime/misc.bd.o
  CC runtime/obj.bd.o
  CC runtime/parsing.bd.o
  CC runtime/platform.bd.o
  CC runtime/printexc.bd.o
  CC runtime/prng.bd.o
  CC runtime/roots.bd.o
  CC runtime/runtime_events.bd.o
  CC runtime/shared_heap.bd.o
  CC runtime/signals.bd.o
  CC runtime/skiplist.bd.o
  CC runtime/startup_aux.bd.o
  CC runtime/str.bd.o
  CC runtime/sync.bd.o
  CC runtime/sys.bd.o
  CC runtime/win32.bd.o
  CC runtime/weak.bd.o
  CC runtime/backtrace_byt.bd.o
  CC runtime/fail_byt.bd.o
  CC runtime/fix_code.bd.o
  CC runtime/interp.bd.o
  CC runtime/startup_byt.bd.o
  CC runtime/zstd.bd.o
  CC runtime/instrtrace.bd.o
  CC runtime/addrmap.bi.o
  CC runtime/afl.bi.o
  CC runtime/alloc.bi.o
  CC runtime/array.bi.o
  CC runtime/backtrace.bi.o
  CC runtime/bigarray.bi.o
  CC runtime/blake2.bi.o
  CC runtime/callback.bi.o
  CC runtime/codefrag.bi.o
  CC runtime/compare.bi.o
  CC runtime/custom.bi.o
  CC runtime/debugger.bi.o
  CC runtime/domain.bi.o
  CC runtime/dynlink.bi.o
  CC runtime/extern.bi.o
  CC runtime/fail.bi.o
  CC runtime/fiber.bi.o
  CC runtime/finalise.bi.o
  CC runtime/floats.bi.o
  CC runtime/gc_ctrl.bi.o
  CC runtime/gc_stats.bi.o
  CC runtime/globroots.bi.o
  CC runtime/hash.bi.o
  CC runtime/intern.bi.o
  CC runtime/ints.bi.o
  CC runtime/io.bi.o
  CC runtime/lexing.bi.o
  CC runtime/lf_skiplist.bi.o
  CC runtime/main.bi.o
  CC runtime/major_gc.bi.o
  CC runtime/md5.bi.o
  CC runtime/memory.bi.o
  CC runtime/memprof.bi.o
  CC runtime/meta.bi.o
  CC runtime/minor_gc.bi.o
  CC runtime/misc.bi.o
  CC runtime/obj.bi.o
  CC runtime/parsing.bi.o
  CC runtime/platform.bi.o
  CC runtime/printexc.bi.o
  CC runtime/prng.bi.o
  CC runtime/roots.bi.o
  CC runtime/runtime_events.bi.o
  CC runtime/shared_heap.bi.o
  CC runtime/signals.bi.o
  CC runtime/skiplist.bi.o
  CC runtime/startup_aux.bi.o
  CC runtime/str.bi.o
  CC runtime/sync.bi.o
  CC runtime/sys.bi.o
  CC runtime/win32.bi.o
  CC runtime/weak.bi.o
  CC runtime/backtrace_byt.bi.o
  CC runtime/fail_byt.bi.o
  CC runtime/fix_code.bi.o
  CC runtime/interp.bi.o
  CC runtime/startup_byt.bi.o
  CC runtime/zstd.bi.o
rm -f flexdll/flexlink.exe
make -C flexdll MSVCC_ROOT= MSVCC=i686-w64-mingw32-gcc MSVCC64=i686-w64-mingw32-gcc MSVC_DETECT=0 OCAML_CONFIG_FILE=../Makefile.config CHAINS=mingw ROOTDIR=.. \
  OCAMLRUN='$(ROOTDIR)/boot/ocamlrun.exe' NATDYNLINK=false \
  OCAMLOPT='$(OCAMLRUN) $(ROOTDIR)/boot/ocamlc -use-prims ../runtime/primitives -launch-method '\''exe C:/ocamlmgw-44619/bin'\'' -runtime-search always -nostdlib -I ../stdlib' \
  flexlink.exe support
make[2]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/flexdll'
mkdir -p byte/bin
  MKLIB runtime/libcamlrund.a
  MKLIB runtime/libcamlruni.a
make[2]: Nothing to be done for 'support'.
Building flexlink.exe with TOOLCHAIN=mingw for OCaml 5.5.0
rm -f flexlink.exe
../boot/ocamlrun.exe ../boot/ocamlc -use-prims ../runtime/primitives -launch-method 'exe C:/ocamlmgw-44619/bin' -runtime-search always -nostdlib -I ../stdlib -o flexlink.exe -cclib "version_res.o" version.ml Compat.ml coff.ml cmdline.ml create_dll.ml reloc.ml
make[2]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/flexdll'
cp flexdll/flexlink.exe flexlink.byte.exe
cp flexdll/flexdll_mingw.o flexdll/flexdll_initer_mingw.o .
rm -f byte/bin/flexlink.exe
cp boot/ocamlrun.exe byte/bin/flexlink.exe
cat flexlink.byte.exe >> byte/bin/flexlink.exe
  MKEXE runtime/ocamlrun.exe
  MKEXE runtime/ocamlrund.exe
  MKEXE runtime/ocamlruni.exe
make ocamlc
make[2]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
  OCAMLC utils/config.cmi
  OCAMLC utils/build_path_prefix_map.cmi
  OCAMLC utils/format_doc.cmi
  OCAMLC utils/identifiable.cmi
  OCAMLC utils/arg_helper.cmi
  OCAMLC utils/local_store.cmi
  OCAMLC utils/load_path.cmi
  OCAMLC utils/profile.cmi
  OCAMLC utils/terminfo.cmi
  OCAMLC utils/ccomp.cmi
  OCAMLC utils/warnings.cmi
  OCAMLC utils/linkdeps.cmi
  OCAMLC utils/strongly_connected_components.cmi
  OCAMLC utils/targetint.cmi
  OCAMLC utils/int_replace_polymorphic_compare.cmi
  GEN utils/domainstate.mli
  OCAMLC utils/binutils.cmi
  OCAMLC utils/lazy_backtrack.cmi
  OCAMLC utils/compression.cmi
  OCAMLC parsing/location.cmi
  OCAMLC parsing/unit_info.cmi
  GEN parsing/camlinternalMenhirLib.mli
  OCAMLC typing/value_rec_types.cmi
  OCAMLC typing/ident.cmi
  OCAMLC lambda/switch.cmi
  OCAMLC lambda/runtimedef.cmi
  OCAMLC file_formats/cmo_format.cmi
  OCAMLC middle_end/linkage_name.cmi
  OCAMLC middle_end/flambda/base_types/tag.cmi
  OCAMLC middle_end/flambda/base_types/static_exception.cmi
  OCAMLC middle_end/flambda/allocated_const.cmi
  OCAMLC file_formats/cmxs_format.cmi
  OCAMLC tools/make_opcodes.cmi
  OCAMLLEX tools/make_opcodes.ml
  OCAMLC bytecomp/bytesections.cmi
  OCAMLC bytecomp/dll.cmi
  OCAMLC driver/main_args.cmi
  OCAMLC driver/makedepend.cmi
mkdir -p utils/config
  OCAMLC utils/build_path_prefix_map.cmo
  OCAMLC utils/format_doc.cmo
  OCAMLC utils/arg_helper.cmo
  OCAMLC utils/local_store.cmo
  OCAMLC utils/terminfo.cmo
  OCAMLC utils/int_replace_polymorphic_compare.cmo
  GEN utils/domainstate.ml
  OCAMLC utils/binutils.cmo
  OCAMLC utils/lazy_backtrack.cmo
  OCAMLC utils/compression.cmo
  GEN parsing/camlinternalMenhirLib.ml
  OCAMLLEX parsing/lexer.ml
  OCAMLC lambda/switch.cmo
  GEN lambda/runtimedef.ml
  OCAMLC bytecomp/bytesections.cmo
cp utils/config.mli utils/config/config_main.mli
  GEN utils/config/config_boot.ml
cp utils/config.mli utils/config/config_boot.mli
  OCAMLC bytecomp/bytelibrarian.cmi
  OCAMLC driver/errors.cmi
  OCAMLC driver/maindriver.cmi
  OCAMLLEX bytecomp/byterntm.ml
  OCAMLC driver/errors.cmo
  OCAMLC driver/main.cmi
  OCAMLC utils/misc.cmi
  OCAMLC utils/numbers.cmi
  OCAMLC utils/domainstate.cmi
  OCAMLC utils/diffing.cmi
  OCAMLC parsing/asttypes.cmi
  OCAMLC parsing/longident.cmi
  OCAMLC parsing/syntaxerr.cmi
  OCAMLC parsing/camlinternalMenhirLib.cmi
  OCAMLC typing/annot.cmi
  OCAMLC typing/path.cmi
  OCAMLC lambda/debuginfo.cmi
  OCAMLC middle_end/compilation_unit.cmi
  OCAMLC tools/make_opcodes.cmo
  GEN utils/config/config_main.ml
  OCAMLC utils/misc.cmo
  OCAMLC utils/identifiable.cmo
  OCAMLC utils/numbers.cmo
  OCAMLC utils/load_path.cmo
  OCAMLC utils/profile.cmo
  OCAMLC utils/warnings.cmo
  OCAMLC utils/linkdeps.cmo
  OCAMLC utils/strongly_connected_components.cmo
  OCAMLC utils/targetint.cmo
  OCAMLC utils/domainstate.cmo
  OCAMLC utils/diffing.cmo
  OCAMLC parsing/unit_info.cmo
  OCAMLC parsing/asttypes.cmo
  OCAMLC parsing/longident.cmo
  OCAMLC parsing/syntaxerr.cmo
  OCAMLC parsing/camlinternalMenhirLib.cmo
  OCAMLC lambda/debuginfo.cmo
  OCAMLC lambda/runtimedef.cmo
  OCAMLC bytecomp/dll.cmo
  OCAMLC utils/config/config_main.cmi
  OCAMLC utils/config/config_boot.cmi
  OCAMLC bytecomp/byterntm.cmi
  OCAMLC driver/main.cmo
  OCAMLC utils/clflags.cmi
  OCAMLC utils/consistbl.cmi
  OCAMLC utils/diffing_with_keys.cmi
  OCAMLC parsing/parsetree.cmi
  OCAMLC typing/shape.cmi
  OCAMLC middle_end/flambda/base_types/set_of_closures_id.cmi
  OCAMLC middle_end/flambda/base_types/export_id.cmi
  OCAMLC middle_end/backend_var.cmi
  LINKC tools/make_opcodes.exe
  OCAMLC driver/pparse.cmi
  OCAMLC driver/compenv.cmi
  GEN utils/config.ml
  OCAMLC utils/clflags.cmo
  OCAMLC utils/ccomp.cmo
  OCAMLC utils/consistbl.cmo
  OCAMLC utils/diffing_with_keys.cmo
  OCAMLC parsing/location.cmo
  OCAMLC typing/ident.cmo
  OCAMLC typing/shape.cmo
  OCAMLC driver/compenv.cmo
  OCAMLC driver/main_args.cmo
  OCAMLC utils/config/config_main.cmo
  OCAMLC utils/config/config_boot.cmo
  OCAMLC bytecomp/byterntm.cmo
  OCAMLC parsing/docstrings.cmi
  OCAMLC parsing/ast_iterator.cmi
  OCAMLC parsing/builtin_attributes.cmi
  OCAMLC parsing/pprintast.cmi
  OCAMLC parsing/parse.cmi
  OCAMLC parsing/printast.cmi
  OCAMLC parsing/ast_mapper.cmi
  OCAMLC parsing/attr_helper.cmi
  OCAMLC parsing/ast_invariants.cmi
  OCAMLC parsing/depend.cmi
  OCAMLC typing/type_immediacy.cmi
  OCAMLC middle_end/flambda/base_types/set_of_closures_origin.cmi
  GEN bytecomp/opcodes.ml
  OCAMLC utils/config.cmo
  OCAMLC parsing/docstrings.cmo
  OCAMLC parsing/ast_iterator.cmo
  OCAMLC parsing/printast.cmo
  OCAMLC parsing/attr_helper.cmo
  OCAMLC parsing/ast_invariants.cmo
  OCAMLC parsing/depend.cmo
  OCAMLC typing/type_immediacy.cmo
  OCAMLC driver/pparse.cmo
  OCAMLC parsing/ast_helper.cmi
  OCAMLC typing/outcometree.cmi
  GEN bytecomp/opcodes.mli
  OCAMLC parsing/ast_helper.cmo
  OCAMLC parsing/builtin_attributes.cmo
  GEN parsing/parser.ml
  OCAMLC parsing/ast_mapper.cmo
  GEN parsing/parser.mli
  OCAMLC typing/primitive.cmi
  OCAMLC typing/oprint.cmi
  OCAMLC bytecomp/opcodes.cmi
  OCAMLC typing/primitive.cmo
  OCAMLC bytecomp/opcodes.cmo
  OCAMLC parsing/parser.cmi
  OCAMLC typing/types.cmi
  OCAMLC parsing/parser.cmo
  OCAMLC parsing/lexer.cmi
  OCAMLC typing/types.cmo
  OCAMLC typing/oprint.cmo
  OCAMLC driver/makedepend.cmo
  OCAMLC typing/data_types.cmi
  OCAMLC typing/rawprinttyp.cmi
  OCAMLC typing/gprinttyp.cmi
  OCAMLC typing/btype.cmi
  OCAMLC typing/subst.cmi
  OCAMLC typing/predef.cmi
  OCAMLC typing/datarepr.cmi
  OCAMLC file_formats/cmi_format.cmi
  OCAMLC typing/errortrace.cmi
  OCAMLC typing/signature_group.cmi
  OCAMLC parsing/lexer.cmo
  OCAMLC parsing/pprintast.cmo
  OCAMLC parsing/parse.cmo
  OCAMLC typing/path.cmo
  OCAMLC typing/data_types.cmo
  OCAMLC typing/rawprinttyp.cmo
  OCAMLC typing/gprinttyp.cmo
  OCAMLC typing/btype.cmo
  OCAMLC typing/subst.cmo
  OCAMLC typing/predef.cmo
  OCAMLC typing/datarepr.cmo
  OCAMLC file_formats/cmi_format.cmo
  OCAMLC typing/errortrace.cmo
  OCAMLC typing/signature_group.cmo
  OCAMLC typing/persistent_env.cmi
  OCAMLC typing/env.cmi
  OCAMLC typing/persistent_env.cmo
  OCAMLC typing/env.cmo
  OCAMLC bytecomp/bytepackager.cmi
  OCAMLC typing/typedtree.cmi
  OCAMLC typing/ctype.cmi
  OCAMLC typing/out_type.cmi
  OCAMLC typing/mtype.cmi
  OCAMLC typing/envaux.cmi
  OCAMLC typing/includecore.cmi
  OCAMLC typing/tast_iterator.cmi
  OCAMLC typing/tast_mapper.cmi
  OCAMLC typing/stypes.cmi
  OCAMLC typing/shape_reduce.cmi
  OCAMLC typing/untypeast.cmi
  OCAMLC typing/includemod.cmi
  OCAMLC typing/typetexp.cmi
  OCAMLC typing/printpat.cmi
  OCAMLC typing/patterns.cmi
  OCAMLC typing/parmatch.cmi
  OCAMLC typing/typedecl_properties.cmi
  OCAMLC typing/typedecl_unboxed.cmi
  OCAMLC lambda/lambda.cmi
  OCAMLC typing/value_rec_check.cmi
  OCAMLC typing/typecore.cmi
  OCAMLC typing/typeclass.cmi
  OCAMLC lambda/printlambda.cmi
  OCAMLC lambda/matching.cmi
  OCAMLC lambda/value_rec_compiler.cmi
  OCAMLC lambda/translobj.cmi
  OCAMLC lambda/translattribute.cmi
  OCAMLC lambda/translprim.cmi
  OCAMLC lambda/translcore.cmi
  OCAMLC lambda/translclass.cmi
  OCAMLC lambda/translmod.cmi
  OCAMLC lambda/tmc.cmi
  OCAMLC lambda/simplif.cmi
  OCAMLC middle_end/internal_variable_names.cmi
  OCAMLC middle_end/clambda_primitives.cmi
  OCAMLC bytecomp/symtable.cmi
  OCAMLC driver/compmisc.cmi
  OCAMLC driver/compile_common.cmi
  OCAMLC typing/typedtree.cmo
  OCAMLC typing/ctype.cmo
  OCAMLC typing/out_type.cmo
  OCAMLC typing/mtype.cmo
  OCAMLC typing/tast_iterator.cmo
  OCAMLC typing/tast_mapper.cmo
  OCAMLC typing/shape_reduce.cmo
  OCAMLC typing/untypeast.cmo
  OCAMLC typing/printpat.cmo
  OCAMLC typing/patterns.cmo
  OCAMLC typing/parmatch.cmo
  OCAMLC typing/typedecl_properties.cmo
  OCAMLC typing/typedecl_unboxed.cmo
  OCAMLC lambda/lambda.cmo
  OCAMLC lambda/value_rec_compiler.cmo
  OCAMLC lambda/translobj.cmo
  OCAMLC lambda/translattribute.cmo
  OCAMLC lambda/translmod.cmo
  OCAMLC lambda/tmc.cmo
  OCAMLC lambda/simplif.cmo
  OCAMLC bytecomp/symtable.cmo
  OCAMLC bytecomp/instruct.cmi
  OCAMLC bytecomp/bytelink.cmi
  OCAMLC driver/compile.cmi
  OCAMLC bytecomp/instruct.cmo
  OCAMLC typing/printtyped.cmi
  OCAMLC typing/printtyp.cmi
  OCAMLC typing/errortrace_report.cmi
  OCAMLC typing/includeclass.cmi
  OCAMLC file_formats/cmt_format.cmi
  OCAMLC typing/includemod_errorprinter.cmi
  OCAMLC typing/typedecl_variance.cmi
  OCAMLC typing/typedecl_immediacy.cmi
  OCAMLC typing/typedecl_separability.cmi
  OCAMLC typing/typeopt.cmi
  OCAMLC middle_end/variable.cmi
  OCAMLC middle_end/clambda.cmi
  OCAMLC typing/printtyped.cmo
  OCAMLC typing/printtyp.cmo
  OCAMLC typing/errortrace_report.cmo
  OCAMLC typing/includeclass.cmo
  OCAMLC typing/envaux.cmo
  OCAMLC typing/includecore.cmo
  OCAMLC typing/stypes.cmo
  OCAMLC file_formats/cmt_format.cmo
  OCAMLC typing/includemod.cmo
  OCAMLC typing/includemod_errorprinter.cmo
  OCAMLC typing/typetexp.cmo
  OCAMLC typing/typedecl_variance.cmo
  OCAMLC typing/typedecl_immediacy.cmo
  OCAMLC typing/typedecl_separability.cmo
  OCAMLC typing/typeopt.cmo
  OCAMLC typing/value_rec_check.cmo
  OCAMLC typing/typecore.cmo
  OCAMLC lambda/printlambda.cmo
  OCAMLC lambda/matching.cmo
  OCAMLC lambda/translprim.cmo
  OCAMLC lambda/translcore.cmo
  OCAMLC lambda/translclass.cmo
  OCAMLC bytecomp/bytegen.cmi
  OCAMLC bytecomp/printinstr.cmi
  OCAMLC bytecomp/emitcode.cmi
  OCAMLC bytecomp/bytegen.cmo
  OCAMLC bytecomp/printinstr.cmo
  OCAMLC bytecomp/emitcode.cmo
  OCAMLC bytecomp/bytelink.cmo
  OCAMLC bytecomp/bytelibrarian.cmo
  OCAMLC driver/compile.cmo
  OCAMLC driver/maindriver.cmo
  OCAMLC typing/cmt2annot.cmi
  OCAMLC typing/typedecl.cmi
  OCAMLC middle_end/flambda/base_types/closure_element.cmi
  OCAMLC middle_end/symbol.cmi
  OCAMLC middle_end/flambda/parameter.cmi
  OCAMLC middle_end/flambda/base_types/mutable_variable.cmi
  OCAMLC middle_end/flambda/base_types/closure_id.cmi
  OCAMLC typing/cmt2annot.cmo
  OCAMLC typing/typedecl.cmo
  OCAMLC typing/typeclass.cmo
  OCAMLC typing/typemod.cmi
  OCAMLC middle_end/flambda/base_types/var_within_closure.cmi
  OCAMLC middle_end/flambda/base_types/closure_origin.cmi
  OCAMLC typing/typemod.cmo
  OCAMLC driver/compmisc.cmo
  OCAMLC driver/compile_common.cmo
  OCAMLC bytecomp/bytepackager.cmo
  OCAMLC middle_end/flambda/projection.cmi
  LINKC compilerlibs/ocamlbytecomp.cma
  OCAMLC middle_end/flambda/flambda.cmi
  OCAMLC middle_end/flambda/freshening.cmi
  OCAMLC middle_end/flambda/simple_value_approx.cmi
  OCAMLC middle_end/flambda/export_info.cmi
  OCAMLC file_formats/cmx_format.cmi
  LINKC compilerlibs/ocamlcommon.cma
  LINKC ocamlc.exe
make[2]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make ocamllex ocamltools library
make[2]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
  CC yacc/wstr.o
  CC yacc/closure.o
  CC yacc/error.o
  CC yacc/lalr.o
  CC yacc/lr0.o
  CC yacc/main.o
  CC yacc/mkpar.o
  CC yacc/output.o
  CC yacc/reader.o
  CC yacc/skeleton.o
  CC yacc/symtab.o
  CC yacc/verbose.o
  CC yacc/warshall.o
make -C stdlib all
  MKEXE yacc/ocamlyacc.exe
make[3]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/stdlib'
  OCAMLC camlinternalFormatBasics.cmi
  OCAMLC camlinternalFormatBasics.cmo
  OCAMLC stdlib.cmi
  OCAMLC stdlib.cmo
  OCAMLC stdlib__Either.cmi
  OCAMLC stdlib__Sys.cmi
  OCAMLC stdlib__Int32.cmi
make lex-all
make[3]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
  OCAMLC stdlib__Type.cmi
  OCAMLC stdlib__Atomic.cmi
  OCAMLC camlinternalLazy.cmi
  OCAMLC lex/cset.cmi
  OCAMLYACC lex/parser.mli
  OCAMLC stdlib__Seq.cmi
  OCAMLLEX lex/lexer.ml
  OCAMLC stdlib__Pair.cmi
  OCAMLC lex/table.cmi
  OCAMLC stdlib__Result.cmi
  OCAMLC lex/main.cmi
  OCAMLC stdlib__Bool.cmi
  OCAMLC stdlib__Char.cmi
  OCAMLC lex/cset.cmo
  OCAMLC lex/syntax.cmi
  OCAMLC stdlib__Uchar.cmi
  OCAMLC stdlib__List.cmi
  OCAMLC lex/table.cmo
  OCAMLC stdlib__Int.cmi
  OCAMLC lex/lexgen.cmi
  OCAMLC stdlib__Array.cmi
  OCAMLC stdlib__Iarray.cmi
  OCAMLC stdlib__Bytes.cmi
  OCAMLC lex/syntax.cmo
  OCAMLC lex/parser.cmi
  OCAMLC stdlib__String.cmi
  OCAMLC lex/lexgen.cmo
  OCAMLC stdlib__Unit.cmi
  OCAMLC lex/compact.cmi
  OCAMLC stdlib__Marshal.cmi
  OCAMLC stdlib__Float.cmi
  OCAMLC stdlib__Int32.cmo
  OCAMLC stdlib__Int64.cmi
  OCAMLC stdlib__Nativeint.cmi
  OCAMLC lex/common.cmi
  OCAMLC stdlib__Lexing.cmi
  OCAMLC stdlib__Repr.cmi
  OCAMLC lex/parser.cmo
  OCAMLC lex/lexer.cmi
  OCAMLC stdlib__Set.cmi
  OCAMLC stdlib__Map.cmi
  OCAMLC stdlib__Stack.cmi
  OCAMLC lex/compact.cmo
  OCAMLC stdlib__Queue.cmi
  OCAMLC lex/common.cmo
  OCAMLC stdlib__Buffer.cmi
  OCAMLC stdlib__Mutex.cmi
  OCAMLC lex/output.cmi
  OCAMLC stdlib__Semaphore.cmi
  OCAMLC stdlib__Domain.cmi
  OCAMLC lex/outputbis.cmi
  OCAMLC camlinternalFormat.cmi
  OCAMLC stdlib__Printf.cmi
  OCAMLC lex/lexer.cmo
  OCAMLC lex/output.cmo
  OCAMLC stdlib__Arg.cmi
  OCAMLC stdlib__Fun.cmi
  OCAMLC stdlib__Complex.cmi
  OCAMLC lex/outputbis.cmo
  OCAMLC stdlib__Digest.cmi
  OCAMLC stdlib__Random.cmi
  OCAMLC stdlib__Hashtbl.cmi
  OCAMLC lex/main.cmo
  OCAMLC stdlib__Format.cmi
  OCAMLC stdlib__Scanf.cmi
  OCAMLC stdlib__Callback.cmi
  LINKC lex/ocamllex.exe
  OCAMLC stdlib__Dynarray.cmi
make[3]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make tools-all
make[3]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
  OCAMLC stdlib__Pqueue.cmi
  OCAMLC stdlib__Ephemeron.cmi
  OCAMLC stdlib__Filename.cmi
  OCAMLC stdlib__Complex.cmo
  OCAMLC stdlib__ArrayLabels.cmi
  OCAMLC tools/ocamldep.cmi
  OCAMLC middle_end/printclambda_primitives.cmi
  OCAMLC stdlib__ListLabels.cmi
  OCAMLC middle_end/printclambda.cmi
  OCAMLC middle_end/semantics_of_primitives.cmi
  OCAMLC stdlib__BytesLabels.cmi
  OCAMLC middle_end/convert_primitives.cmi
  OCAMLC middle_end/flambda/base_types/id_types.cmi
  OCAMLC stdlib__StringLabels.cmi
  OCAMLC middle_end/flambda/pass_wrapper.cmi
  OCAMLC middle_end/flambda/flambda_iterators.cmi
  OCAMLC stdlib__MoreLabels.cmi
  OCAMLC middle_end/flambda/flambda_utils.cmi
  OCAMLC stdlib__StdLabels.cmi
  OCAMLC middle_end/flambda/effect_analysis.cmi
  OCAMLC middle_end/flambda/inlining_cost.cmi
  OCAMLC middle_end/flambda/export_info_for_pack.cmi
  OCAMLC std_exit.cmi
  OCAMLC middle_end/compilenv.cmi
  OCAMLC middle_end/backend_intf.cmi
  OCAMLC stdlib__Either.cmo
  OCAMLC stdlib__Sys.cmo
  OCAMLC middle_end/flambda/import_approx.cmi
  OCAMLC stdlib__Obj.cmi
  OCAMLC middle_end/flambda/lift_code.cmi
  OCAMLC stdlib__Atomic.cmo
  OCAMLC middle_end/flambda/closure_conversion_aux.cmi
  OCAMLC camlinternalLazy.cmo
  OCAMLC stdlib__Lazy.cmi
  OCAMLC middle_end/flambda/closure_conversion.cmi
  OCAMLC stdlib__Option.cmi
  OCAMLC middle_end/flambda/initialize_symbol_to_let_symbol.cmi
  OCAMLC stdlib__Pair.cmo
  OCAMLC middle_end/flambda/lift_let_to_initialize_symbol.cmi
  OCAMLC stdlib__Result.cmo
  OCAMLC middle_end/flambda/find_recursive_functions.cmi
  OCAMLC stdlib__Bool.cmo
  OCAMLC middle_end/flambda/invariant_params.cmi
  OCAMLC stdlib__Char.cmo
  OCAMLC middle_end/flambda/inconstant_idents.cmi
  OCAMLC stdlib__Uchar.cmo
  OCAMLC middle_end/flambda/alias_analysis.cmi
  OCAMLC stdlib__List.cmo
  OCAMLC middle_end/flambda/lift_constants.cmi
  OCAMLC stdlib__Int.cmo
  OCAMLC middle_end/flambda/share_constants.cmi
  OCAMLC middle_end/flambda/simplify_common.cmi
  OCAMLC middle_end/flambda/remove_unused_arguments.cmi
  OCAMLC stdlib__Array.cmo
  OCAMLC middle_end/flambda/remove_unused_closure_vars.cmi
  OCAMLC stdlib__Iarray.cmo
  OCAMLC middle_end/flambda/remove_unused_program_constructs.cmi
  OCAMLC middle_end/flambda/simplify_boxed_integer_ops_intf.cmi
  OCAMLC stdlib__Bytes.cmo
  OCAMLC middle_end/flambda/simplify_primitives.cmi
  OCAMLC stdlib__String.cmo
  OCAMLC middle_end/flambda/inlining_stats_types.cmi
  OCAMLC middle_end/flambda/remove_free_vars_equal_to_args.cmi
  OCAMLC middle_end/flambda/ref_to_variables.cmi
  OCAMLC middle_end/flambda/flambda_invariants.cmi
  OCAMLC stdlib__Unit.cmo
  OCAMLC middle_end/flambda/traverse_for_exported_symbols.cmi
  OCAMLC stdlib__Marshal.cmo
  OCAMLC middle_end/flambda/build_export_info.cmi
  OCAMLC stdlib__Float.cmo
  OCAMLC middle_end/flambda/closure_offsets.cmi
  OCAMLC stdlib__Int64.cmo
  OCAMLC middle_end/flambda/un_anf.cmi
  OCAMLC middle_end/flambda/flambda_to_clambda.cmi
  OCAMLC stdlib__Nativeint.cmo
  OCAMLC middle_end/flambda/flambda_middle_end.cmi
  OCAMLC stdlib__Lexing.cmo
  OCAMLC middle_end/internal_variable_names.cmo
  OCAMLC stdlib__Parsing.cmi
  OCAMLC middle_end/linkage_name.cmo
  OCAMLC stdlib__Repr.cmo
  OCAMLC stdlib__Set.cmo
  OCAMLC stdlib__Map.cmo
  OCAMLC middle_end/compilation_unit.cmo
  OCAMLC middle_end/variable.cmo
  OCAMLC stdlib__Stack.cmo
  OCAMLC middle_end/flambda/base_types/closure_element.cmo
  OCAMLC stdlib__Queue.cmo
  OCAMLC stdlib__Buffer.cmo
  OCAMLC middle_end/flambda/base_types/closure_id.cmo
  OCAMLC stdlib__Mutex.cmo
  OCAMLC middle_end/symbol.cmo
  OCAMLC stdlib__Condition.cmi
  OCAMLC middle_end/backend_var.cmo
  OCAMLC camlinternalFormat.cmo
  OCAMLC stdlib__Printf.cmo
  OCAMLC middle_end/clambda_primitives.cmo
  OCAMLC middle_end/printclambda_primitives.cmo
  OCAMLC middle_end/clambda.cmo
  OCAMLC middle_end/printclambda.cmo
  OCAMLC middle_end/semantics_of_primitives.cmo
  OCAMLC middle_end/convert_primitives.cmo
  OCAMLC middle_end/flambda/base_types/id_types.cmo
  OCAMLC middle_end/flambda/base_types/export_id.cmo
  OCAMLC middle_end/flambda/base_types/tag.cmo
  OCAMLC middle_end/flambda/base_types/mutable_variable.cmo
  OCAMLC middle_end/flambda/base_types/set_of_closures_id.cmo
  OCAMLC stdlib__Arg.cmo
  OCAMLC middle_end/flambda/base_types/set_of_closures_origin.cmo
  OCAMLC stdlib__Printexc.cmi
  OCAMLC middle_end/flambda/base_types/closure_origin.cmo
  OCAMLC stdlib__Bigarray.cmi
  OCAMLC middle_end/flambda/base_types/var_within_closure.cmo
  OCAMLC stdlib__Hashtbl.cmo
  OCAMLC middle_end/flambda/base_types/static_exception.cmo
  OCAMLC stdlib__Weak.cmi
  OCAMLC middle_end/flambda/pass_wrapper.cmo
  OCAMLC stdlib__Format.cmo
  OCAMLC middle_end/flambda/allocated_const.cmo
  OCAMLC stdlib__Scanf.cmo
  OCAMLC middle_end/flambda/parameter.cmo
  OCAMLC middle_end/flambda/projection.cmo
  OCAMLC middle_end/flambda/flambda.cmo
  OCAMLC stdlib__Callback.cmo
  OCAMLC middle_end/flambda/flambda_iterators.cmo
  OCAMLC camlinternalOO.cmi
  OCAMLC camlinternalMod.cmi
  OCAMLC stdlib__Dynarray.cmo
  OCAMLC stdlib__Pqueue.cmo
  OCAMLC middle_end/flambda/flambda_utils.cmo
  OCAMLC stdlib__Ephemeron.cmo
  OCAMLC stdlib__Filename.cmo
  OCAMLC middle_end/flambda/freshening.cmo
  OCAMLC stdlib__ArrayLabels.cmo
  OCAMLC stdlib__ListLabels.cmo
  OCAMLC middle_end/flambda/effect_analysis.cmo
  OCAMLC stdlib__BytesLabels.cmo
  OCAMLC stdlib__StringLabels.cmo
  OCAMLC stdlib__MoreLabels.cmo
  OCAMLC stdlib__StdLabels.cmo
  OCAMLC middle_end/flambda/inlining_cost.cmo
  OCAMLC stdlib__Effect.cmi
  OCAMLC std_exit.cmo
  OCAMLC middle_end/flambda/simple_value_approx.cmo
  OCAMLC stdlib__Obj.cmo
  OCAMLC stdlib__Type.cmo
  OCAMLC stdlib__Lazy.cmo
  OCAMLC stdlib__Seq.cmo
  OCAMLC middle_end/flambda/export_info.cmo
  OCAMLC stdlib__Option.cmo
  OCAMLC stdlib__Parsing.cmo
  OCAMLC stdlib__Condition.cmo
  OCAMLC stdlib__Semaphore.cmo
  OCAMLC middle_end/flambda/export_info_for_pack.cmo
  OCAMLC stdlib__Domain.cmo
  OCAMLC stdlib__Printexc.cmo
  OCAMLC stdlib__Fun.cmo
  OCAMLC stdlib__Gc.cmi
  OCAMLC stdlib__In_channel.cmi
  OCAMLC middle_end/compilenv.cmo
  OCAMLC stdlib__Out_channel.cmi
  OCAMLC stdlib__Digest.cmo
  OCAMLC stdlib__Bigarray.cmo
  OCAMLC middle_end/flambda/import_approx.cmo
  OCAMLC stdlib__Random.cmo
  OCAMLC stdlib__Weak.cmo
  OCAMLC middle_end/flambda/lift_code.cmo
  OCAMLC camlinternalOO.cmo
  OCAMLC middle_end/flambda/closure_conversion_aux.cmo
  OCAMLC stdlib__Oo.cmi
  OCAMLC middle_end/flambda/closure_conversion.cmo
  OCAMLC camlinternalMod.cmo
  OCAMLC middle_end/flambda/initialize_symbol_to_let_symbol.cmo
  OCAMLC stdlib__Effect.cmo
  OCAMLC stdlib__Gc.cmo
  OCAMLC stdlib__In_channel.cmo
  OCAMLC middle_end/flambda/lift_let_to_initialize_symbol.cmo
  OCAMLC stdlib__Out_channel.cmo
  OCAMLC middle_end/flambda/find_recursive_functions.cmo
  OCAMLC stdlib__Oo.cmo
  LINKC stdlib.cma
  OCAMLC middle_end/flambda/invariant_params.cmo
make[3]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/stdlib'
  OCAMLC middle_end/flambda/inconstant_idents.cmo
  OCAMLC middle_end/flambda/alias_analysis.cmo
  OCAMLC middle_end/flambda/lift_constants.cmo
  OCAMLC middle_end/flambda/share_constants.cmo
  OCAMLC middle_end/flambda/simplify_common.cmo
  OCAMLC middle_end/flambda/remove_unused_arguments.cmo
  OCAMLC middle_end/flambda/remove_unused_closure_vars.cmo
  OCAMLC middle_end/flambda/remove_unused_program_constructs.cmo
  OCAMLC middle_end/flambda/inlining_stats_types.cmo
  OCAMLC middle_end/flambda/remove_free_vars_equal_to_args.cmo
  OCAMLC middle_end/flambda/ref_to_variables.cmo
  OCAMLC middle_end/flambda/flambda_invariants.cmo
  OCAMLC middle_end/flambda/traverse_for_exported_symbols.cmo
  OCAMLC middle_end/flambda/closure_offsets.cmo
  OCAMLC middle_end/flambda/un_anf.cmo
  OCAMLC middle_end/flambda/flambda_to_clambda.cmo
  OCAMLC tools/objinfo.cmi
  OCAMLC tools/ocamlcmt.cmi
  OCAMLC tools/ocamlprof.cmi
  OCAMLC tools/ocamlcp_common.cmi
  OCAMLC tools/ocamlcp.cmi
  OCAMLC tools/ocamlmklib.cmi
  OCAMLC tools/ocamlmktop.cmi
  GEN tools/opnames.ml
  OCAMLC tools/opnames.cmi
  OCAMLC tools/dumpobj.cmi
  OCAMLC tools/primreq.cmi
  OCAMLC tools/stripdebug.cmi
  OCAMLC tools/cmpbyt.cmi
  OCAMLC tools/profiling.cmi
  OCAMLC tools/ocamldep.cmo
  OCAMLC middle_end/closure/closure.cmi
  OCAMLC middle_end/closure/closure_middle_end.cmi
  OCAMLC middle_end/flambda/simplify_boxed_integer_ops.cmi
  OCAMLC middle_end/flambda/inlining_stats.cmi
  OCAMLC middle_end/flambda/inline_and_simplify_aux.cmi
  OCAMLC middle_end/closure/closure.cmo
  OCAMLC middle_end/closure/closure_middle_end.cmo
  OCAMLC middle_end/flambda/simplify_boxed_integer_ops.cmo
  OCAMLC middle_end/flambda/simplify_primitives.cmo
  OCAMLC middle_end/flambda/inlining_stats.cmo
  OCAMLC middle_end/flambda/inline_and_simplify_aux.cmo
  OCAMLC middle_end/flambda/build_export_info.cmo
  OCAMLC tools/objinfo.cmo
  OCAMLC tools/ocamlcmt.cmo
  OCAMLC tools/ocamlprof.cmo
  OCAMLC tools/ocamlcp_common.cmo
  OCAMLC tools/ocamlcp.cmo
  OCAMLC tools/ocamlmklib.cmo
  OCAMLC tools/ocamlmktop.cmo
  OCAMLC tools/opnames.cmo
  OCAMLC tools/dumpobj.cmo
  OCAMLC tools/primreq.cmo
  OCAMLC tools/stripdebug.cmo
  OCAMLC tools/cmpbyt.cmo
  OCAMLC tools/profiling.cmo
  LINKC tools/ocamldep.exe
  OCAMLC middle_end/flambda/inlining_decision_intf.cmi
  OCAMLC middle_end/flambda/extract_projections.cmi
  OCAMLC middle_end/flambda/augment_specialised_args.cmi
  OCAMLC middle_end/flambda/unbox_free_vars_of_closures.cmi
  OCAMLC middle_end/flambda/unbox_specialised_args.cmi
  OCAMLC middle_end/flambda/unbox_closures.cmi
  OCAMLC middle_end/flambda/inlining_transforms.cmi
  OCAMLC middle_end/flambda/inlining_decision.cmi
  OCAMLC middle_end/flambda/inline_and_simplify.cmi
  OCAMLC middle_end/flambda/extract_projections.cmo
  OCAMLC middle_end/flambda/augment_specialised_args.cmo
  OCAMLC middle_end/flambda/unbox_free_vars_of_closures.cmo
  OCAMLC middle_end/flambda/unbox_specialised_args.cmo
  OCAMLC middle_end/flambda/unbox_closures.cmo
  OCAMLC middle_end/flambda/inlining_transforms.cmo
  OCAMLC middle_end/flambda/inlining_decision.cmo
  OCAMLC middle_end/flambda/inline_and_simplify.cmo
  OCAMLC middle_end/flambda/flambda_middle_end.cmo
  LINKC tools/ocamlcmt.exe
  LINKC tools/ocamlprof.exe
  LINKC tools/ocamlcp.exe
  LINKC tools/ocamlmklib.exe
  LINKC tools/ocamlmktop.exe
  LINKC tools/dumpobj.exe
  LINKC tools/primreq.exe
  LINKC tools/stripdebug.exe
  LINKC tools/cmpbyt.exe
  LINKC compilerlibs/ocamlmiddleend.cma
  LINKC tools/ocamlobjinfo.exe
make[3]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make[2]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make ocaml
make[2]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
  OCAMLC toplevel/expunge.cmi
  OCAMLC toplevel/genprintval.cmi
  OCAMLC toplevel/trace.cmi
  OCAMLC toplevel/toploop.cmi
  OCAMLC toplevel/topprinters.cmi
  OCAMLC toplevel/topdirs.cmi
  OCAMLC toplevel/topmain.cmi
  OCAMLC toplevel/genprintval.cmo
  OCAMLC toplevel/topprinters.cmo
  OCAMLC toplevel/topstart.cmi
  OCAMLC toplevel/expunge.cmo
  OCAMLC toplevel/topcommon.cmi
cp toplevel/trace.cmi toplevel/trace.mli toplevel/byte
cp toplevel/topmain.cmi toplevel/topmain.mli toplevel/byte
  OCAMLC toplevel/topstart.cmo
  LINKC expunge.exe
  OCAMLC toplevel/topeval.cmi
  OCAMLC toplevel/topcommon.cmo
  OCAMLC toplevel/byte/topmain.cmo
cp toplevel/topeval.cmi toplevel/topeval.mli toplevel/byte
  OCAMLC toplevel/toploop.cmo
  OCAMLC toplevel/topdirs.cmo
  OCAMLC toplevel/byte/topeval.cmo
  OCAMLC toplevel/byte/trace.cmo
  LINKC compilerlibs/ocamltoplevel.cma
  LINKC ocaml.tmp
  GEN ocaml.exe
rm ocaml.tmp
make[2]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make otherlibraries ocamldebug ocamldoc \
         ocamltest
make[2]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make lex-all
  OCAMLC otherlibs/dynlink/dynlink_config.cmi
make[3]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
  OCAMLC otherlibs/dynlink/dynlink_types.cmi
  OCAMLC otherlibs/dynlink/dynlink_cmo_format.cmi
  OCAMLC otherlibs/dynlink/dynlink.cmi
make[3]: Nothing to be done for 'lex-all'.
make[3]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
  OCAMLC otherlibs/dynlink/dynlink_config.cmo
  OCAMLC otherlibs/dynlink/dynlink_types.cmo
  OCAMLC debugger/int64ops.cmi
  OCAMLC otherlibs/unix/unix.cmi
  OCAMLC debugger/debugger_config.cmi
  OCAMLC debugger/parameters.cmi
  OCAMLLEX debugger/debugger_lexer.ml
  OCAMLYACC debugger/debugger_parser.mli
  OCAMLC debugger/question.cmi
  OCAMLC debugger/exec.cmi
  OCAMLC debugger/source.cmi
  OCAMLC debugger/events.cmi
  OCAMLC debugger/history.cmi
  OCAMLC debugger/show_source.cmi
  OCAMLC debugger/program_management.cmi
  OCAMLC debugger/frames.cmi
  OCAMLC debugger/show_information.cmi
  OCAMLC debugger/loadprinter.cmi
  OCAMLC debugger/command_line.cmi
  OCAMLC debugger/main.cmi
  OCAMLC debugger/ocamldebug_entry.cmi
  OCAMLC ocamldoc/odoc_config.cmi
  OCAMLC ocamldoc/odoc_messages.cmi
  OCAMLC ocamldoc/odoc_types.cmi
  OCAMLYACC ocamldoc/odoc_text_parser.mli
  OCAMLC ocamldoc/odoc_name.cmi
  OCAMLC ocamldoc/odoc_print.cmi
  OCAMLC ocamldoc/odoc_comments_global.cmi
  OCAMLYACC ocamldoc/odoc_parser.mli
  OCAMLC ocamldoc/odoc_env.cmi
  OCAMLC otherlibs/str/str.cmi
  OCAMLC ocamldoc/odoc_config.cmo
  OCAMLC ocamldoc/odoc_types.cmo
  OCAMLLEX ocamldoc/odoc_text_lexer.ml
  OCAMLC ocamldoc/odoc_print.cmo
  OCAMLC ocamldoc/odoc_comments_global.cmo
  OCAMLLEX ocamldoc/odoc_lexer.ml
  OCAMLLEX ocamldoc/odoc_see_lexer.ml
  OCAMLC ocamldoc/odoc_env.cmo
  OCAMLC ocamldoc/odoc_ocamlhtml.cmi
  OCAMLLEX ocamldoc/odoc_ocamlhtml.ml
  OCAMLC ocamldoc/odoc_latex_style.cmi
  OCAMLC ocamldoc/odoc.cmi
  OCAMLC ocamldoc/odoc_test.cmi
  CC ocamltest/run_win32.b.o
  CC ocamltest/run_stubs.b.o
  OCAMLC ocamltest/ocamltest_config.cmi
./config.status ocamltest/ocamltest_unix.ml
  OCAMLC ocamltest/ocamltest_unix.cmi
  OCAMLC ocamltest/run_command.cmi
  OCAMLC ocamltest/filecompare.cmi
  OCAMLC ocamltest/variables.cmi
  OCAMLC ocamltest/result.cmi
  OCAMLC ocamltest/strace.cmi
  OCAMLC ocamltest/tsl_ast.cmi
  OCAMLYACC ocamltest/tsl_parser.mli
  OCAMLLEX ocamltest/tsl_lexer.ml
  OCAMLC ocamltest/builtin_variables.cmi
  OCAMLC ocamltest/translate.cmi
  OCAMLC ocamltest/ocaml_backends.cmi
  OCAMLC ocamltest/ocaml_variables.cmi
  OCAMLC ocamltest/ocaml_directories.cmi
  OCAMLC ocamltest/ocaml_files.cmi
  OCAMLC ocamltest/ocaml_commands.cmi
  OCAMLC ocamltest/debugger_flags.cmi
  OCAMLC ocamltest/debugger_variables.cmi
  OCAMLC ocamltest/options.cmi
  OCAMLC ocamltest/main.cmi
  OCAMLC testsuite/lib/lib.cmi
  OCAMLC testsuite/lib/testing.cmi
  OCAMLC testsuite/tools/expect.cmi
make tools-all
  OCAMLC otherlibs/dynlink/dynlink_platform_intf.cmi
make[3]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
config.status: linking ocamltest/ocamltest_unix_real.ml to ocamltest/ocamltest_unix.ml
  OCAMLC otherlibs/dynlink/byte/dynlink_symtable.cmi
make[3]: Nothing to be done for 'tools-all'.
make[3]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
cp otherlibs/dynlink/dynlink.cmi otherlibs/dynlink/dynlink.mli otherlibs/dynlink/byte/
  OCAMLC otherlibs/dynlink/dynlink_platform_intf.cmo
  OCAMLC debugger/int64ops.cmo
  OCAMLC debugger/primitives.cmi
  OCAMLC debugger/unix_tools.cmi
  OCAMLC debugger/debugger_config.cmo
  OCAMLC debugger/parameters.cmo
  OCAMLC debugger/debugcom.cmi
  OCAMLC debugger/input_handling.cmi
  OCAMLC debugger/exec.cmo
  OCAMLC debugger/source.cmo
  OCAMLC debugger/pos.cmi
  OCAMLC debugger/checkpoints.cmi
  OCAMLC debugger/events.cmo
  OCAMLC debugger/program_loading.cmi
  OCAMLC debugger/symbols.cmi
  OCAMLC debugger/breakpoints.cmi
  OCAMLC debugger/trap_barrier.cmi
  OCAMLC debugger/history.cmo
  OCAMLC debugger/show_source.cmo
  OCAMLC debugger/time_travel.cmi
  OCAMLC debugger/frames.cmo
  OCAMLC debugger/loadprinter.cmo
  OCAMLC debugger/main.cmo
  OCAMLC ocamldoc/odoc_global.cmi
  OCAMLC ocamldoc/odoc_misc.cmi
  OCAMLC ocamldoc/odoc_text_parser.cmi
  OCAMLC ocamldoc/odoc_text.cmi
  OCAMLC ocamldoc/odoc_parameter.cmi
  OCAMLC ocamldoc/odoc_type.cmi
  OCAMLC ocamldoc/odoc_parser.cmi
  OCAMLC ocamldoc/odoc_messages.cmo
  OCAMLC ocamldoc/odoc_global.cmo
  OCAMLC ocamldoc/odoc_misc.cmo
  OCAMLC ocamldoc/odoc_text_parser.cmo
  OCAMLC ocamldoc/odoc_name.cmo
  OCAMLC ocamldoc/odoc_parameter.cmo
  OCAMLC ocamldoc/odoc_type.cmo
  OCAMLC ocamldoc/odoc_parser.cmo
  OCAMLC ocamldoc/odoc_ocamlhtml.cmo
  OCAMLC ocamldoc/odoc_latex_style.cmo
  OCAMLC ocamltest/ocamltest_config.cmo
  OCAMLC ocamltest/ocamltest_unix.cmo
  OCAMLC ocamltest/ocamltest_stdlib.cmi
  OCAMLC ocamltest/variables.cmo
  OCAMLC ocamltest/environments.cmi
  OCAMLC ocamltest/result.cmo
  OCAMLC ocamltest/strace.cmo
  OCAMLC ocamltest/tsl_ast.cmo
  OCAMLC ocamltest/tsl_parser.cmi
  OCAMLC ocamltest/modifier_parser.cmi
  OCAMLC ocamltest/builtin_variables.cmo
  OCAMLC ocamltest/ocaml_backends.cmo
  OCAMLC ocamltest/ocaml_filetypes.cmi
  OCAMLC ocamltest/ocaml_variables.cmo
  OCAMLC ocamltest/ocaml_modifiers.cmi
  OCAMLC ocamltest/ocaml_directories.cmo
  OCAMLC ocamltest/ocaml_files.cmo
  OCAMLC ocamltest/ocaml_flags.cmi
  OCAMLC ocamltest/ocaml_commands.cmo
  OCAMLC ocamltest/ocaml_tools.cmi
  OCAMLC ocamltest/debugger_flags.cmo
  OCAMLC ocamltest/debugger_variables.cmo
  OCAMLC testsuite/lib/lib.cmo
  OCAMLC testsuite/lib/testing.cmo
  OCAMLC testsuite/tools/expect.cmo
  OCAMLC otherlibs/dynlink/dynlink_common.cmi
  OCAMLC otherlibs/dynlink/byte/dynlink_symtable.cmo
  OCAMLC otherlibs/dynlink/byte/dynlink.cmo
  OCAMLC debugger/primitives.cmo
  OCAMLC debugger/unix_tools.cmo
  OCAMLC debugger/parser_aux.cmi
  OCAMLC debugger/input_handling.cmo
  OCAMLC debugger/debugcom.cmo
  OCAMLC debugger/pos.cmo
  OCAMLC debugger/checkpoints.cmo
  OCAMLC debugger/program_loading.cmo
  OCAMLC debugger/symbols.cmo
  OCAMLC debugger/breakpoints.cmo
  OCAMLC debugger/trap_barrier.cmo
  OCAMLC debugger/printval.cmi
  OCAMLC debugger/time_travel.cmo
  OCAMLC debugger/program_management.cmo
  OCAMLC debugger/eval.cmi
  OCAMLC debugger/show_information.cmo
  OCAMLC ocamldoc/odoc_text_lexer.cmi
  OCAMLC ocamldoc/odoc_value.cmi
  OCAMLC ocamldoc/odoc_extension.cmi
  OCAMLC ocamldoc/odoc_exception.cmi
  OCAMLC ocamldoc/odoc_class.cmi
  OCAMLC ocamldoc/odoc_lexer.cmi
  OCAMLC ocamldoc/odoc_see_lexer.cmi
  OCAMLC ocamldoc/odoc_text_lexer.cmo
  OCAMLC ocamldoc/odoc_text.cmo
  OCAMLC ocamldoc/odoc_value.cmo
  OCAMLC ocamldoc/odoc_extension.cmo
  OCAMLC ocamldoc/odoc_exception.cmo
  OCAMLC ocamldoc/odoc_class.cmo
  OCAMLC ocamldoc/odoc_lexer.cmo
  OCAMLC ocamldoc/odoc_see_lexer.cmo
  OCAMLC ocamltest/ocamltest_stdlib.cmo
  OCAMLC ocamltest/run_command.cmo
  OCAMLC ocamltest/filecompare.cmo
  OCAMLC ocamltest/environments.cmo
  OCAMLC ocamltest/actions.cmi
  OCAMLC ocamltest/tsl_parser.cmo
  OCAMLC ocamltest/tsl_lexer.cmi
  OCAMLC ocamltest/actions_helpers.cmi
  OCAMLC ocamltest/builtin_actions.cmi
  OCAMLC ocamltest/ocaml_filetypes.cmo
  OCAMLC ocamltest/ocaml_modifiers.cmo
  OCAMLC ocamltest/ocaml_flags.cmo
  OCAMLC ocamltest/ocaml_tools.cmo
  OCAMLC ocamltest/ocaml_compilers.cmi
  OCAMLC ocamltest/ocaml_actions.cmi
  OCAMLC ocamltest/debugger_actions.cmi
  LINKC testsuite/lib/testing.cma
  LINKC testsuite/tools/expect.exe
  OCAMLC otherlibs/dynlink/dynlink_common.cmo
  OCAMLC debugger/debugger_parser.cmi
  OCAMLC debugger/printval.cmo
  OCAMLC debugger/eval.cmo
  OCAMLC debugger/debugger_parser.cmo
  OCAMLC ocamldoc/odoc_module.cmi
  OCAMLC ocamldoc/odoc_str.cmi
  OCAMLC ocamltest/actions.cmo
  OCAMLC ocamltest/tests.cmi
  OCAMLC ocamltest/tsl_lexer.cmo
  OCAMLC ocamltest/modifier_parser.cmo
  OCAMLC ocamltest/tsl_semantics.cmi
  OCAMLC ocamltest/actions_helpers.cmo
  OCAMLC ocamltest/builtin_actions.cmo
  OCAMLC ocamltest/translate.cmo
  OCAMLC ocamltest/ocaml_compilers.cmo
  OCAMLC ocamltest/ocaml_toplevels.cmi
  OCAMLC ocamltest/ocaml_tests.cmi
  OCAMLC ocamltest/debugger_actions.cmo
  OCAMLC ocamltest/options.cmo
  OCAMLC ocamltest/main.cmo
  LINKC otherlibs/dynlink/dynlink.cma
  OCAMLC debugger/debugger_lexer.cmi
  OCAMLC ocamldoc/odoc_merge.cmi
  OCAMLC ocamldoc/odoc_sig.cmi
  OCAMLC ocamldoc/odoc_search.cmi
  OCAMLC ocamldoc/odoc_scan.cmi
  OCAMLC ocamldoc/odoc_cross.cmi
  OCAMLC ocamldoc/odoc_comments.cmi
  OCAMLC ocamldoc/odoc_dep.cmi
  OCAMLC ocamldoc/odoc_analyse.cmi
  OCAMLC ocamldoc/odoc_info.cmi
  OCAMLC ocamldoc/odoc_module.cmo
  OCAMLC ocamldoc/odoc_str.cmo
  OCAMLC ocamldoc/odoc_merge.cmo
  OCAMLC ocamldoc/odoc_sig.cmo
  OCAMLC ocamldoc/odoc_search.cmo
  OCAMLC ocamldoc/odoc_scan.cmo
  OCAMLC ocamldoc/odoc_cross.cmo
  OCAMLC ocamldoc/odoc_comments.cmo
  OCAMLC ocamldoc/odoc_dep.cmo
  OCAMLC ocamldoc/odoc_info.cmo
  OCAMLC ocamldoc/odoc_dag2html.cmi
  OCAMLC ocamldoc/odoc_to_text.cmi
  OCAMLC ocamldoc/odoc_html.cmi
  OCAMLC ocamldoc/odoc_man.cmi
  OCAMLC ocamldoc/odoc_latex.cmi
  OCAMLC ocamldoc/odoc_texi.cmi
  OCAMLC ocamldoc/odoc_dot.cmi
  OCAMLC ocamltest/tests.cmo
  OCAMLC ocamltest/tsl_semantics.cmo
  OCAMLC ocamltest/ocaml_toplevels.cmo
  OCAMLC ocamltest/ocaml_actions.cmo
  OCAMLC ocamltest/ocaml_tests.cmo
make -C otherlibs all
  OCAMLC debugger/debugger_lexer.cmo
make[3]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs'
for lib in runtime_events unix str systhreads; do (make -C $lib all) || exit $?; done
make[4]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/runtime_events'
  OCAMLC debugger/question.cmo
mkdir -p .dep
  CCDEPS .dep/runtime_events_consumer.d
  OCAMLC debugger/command_line.cmo
  OCAMLC ocamldoc/odoc_ast.cmi
  CC runtime_events_consumer.b.o
  CC runtime_events_consumer.n.o
  OCAMLC runtime_events.cmi
  OCAMLC runtime_events.cmo
  OCAMLC ocamldoc/odoc_dag2html.cmo
  OCAMLC ocamldoc/odoc_to_text.cmo
  OCAMLMKLIB libcamlruntime_eventsbyt.a
  OCAMLMKLIB runtime_events.cma
  OCAMLC ocamldoc/odoc_html.cmo
  OCAMLC ocamldoc/odoc_man.cmo
make[4]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/runtime_events'
make[4]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/unix'
mkdir -p .dep
  CCDEPS .dep/winworker.d
  CCDEPS .dep/winwait.d
  CCDEPS .dep/winlist.d
  CCDEPS .dep/windir.d
  CCDEPS .dep/windbug.d
  CCDEPS .dep/system.d
  OCAMLC ocamldoc/odoc_latex.cmo
  CCDEPS .dep/startup.d
  CCDEPS .dep/nonblock.d
  CCDEPS .dep/createprocess.d
  CCDEPS .dep/close_on.d
  OCAMLC ocamldoc/odoc_texi.cmo
  CCDEPS .dep/write_win32.d
  CCDEPS .dep/utimes_win32.d
  CCDEPS .dep/unixsupport_win32.d
  OCAMLC ocamldoc/odoc_dot.cmo
  CCDEPS .dep/truncate_win32.d
  CCDEPS .dep/times_win32.d
  CCDEPS .dep/symlink_win32.d
  CCDEPS .dep/stat_win32.d
  OCAMLC ocamldoc/odoc_gen.cmi
  CCDEPS .dep/sockopt_win32.d
  CCDEPS .dep/socketpair_win32.d
  CCDEPS .dep/socket_win32.d
  OCAMLC debugger/ocamldebug.cmo
  OCAMLC ocamldoc/odoc_ast.cmo
  CCDEPS .dep/sleep_win32.d
  OCAMLC ocamldoc/odoc_analyse.cmo
  CCDEPS .dep/shutdown_win32.d
  CCDEPS .dep/sendrecv_win32.d
  CCDEPS .dep/select_win32.d
  OCAMLC ocamldoc/odoc_gen.cmo
  CCDEPS .dep/realpath_win32.d
  CCDEPS .dep/readlink_win32.d
  OCAMLC ocamldoc/odoc_args.cmi
  CCDEPS .dep/read_win32.d
  CCDEPS .dep/pipe_win32.d
  CCDEPS .dep/open_win32.d
  OCAMLC debugger/ocamldebug_entry.cmo
  CCDEPS .dep/mmap_win32.d
  LINKC ocamldoc/odoc_info.cma
  CCDEPS .dep/lseek_win32.d
  OCAMLC ocamldoc/odoc_args.cmo
  OCAMLC ocamldoc/odoc.cmo
  CCDEPS .dep/lockf_win32.d
  CCDEPS .dep/listen_win32.d
  CCDEPS .dep/link_win32.d
  CCDEPS .dep/isatty_win32.d
  CCDEPS .dep/gettimeofday_win32.d
  CCDEPS .dep/getsockname_win32.d
  OCAMLC ocamldoc/odoc_test.cmo
  CCDEPS .dep/getpid_win32.d
  CCDEPS .dep/getpeername_win32.d
  CCDEPS .dep/errmsg_win32.d
  CCDEPS .dep/envir_win32.d
  CCDEPS .dep/dup_win32.d
  CCDEPS .dep/connect_win32.d
  CCDEPS .dep/close_win32.d
  CCDEPS .dep/channels_win32.d
  CCDEPS .dep/bind_win32.d
  CCDEPS .dep/accept_win32.d
  CCDEPS .dep/unlink.d
  CCDEPS .dep/time.d
  CCDEPS .dep/strofaddr.d
  CCDEPS .dep/socketaddr.d
  CCDEPS .dep/rmdir.d
  CCDEPS .dep/rename.d
  CCDEPS .dep/putenv.d
  CCDEPS .dep/mmap_ba.d
  CCDEPS .dep/gmtime.d
  CCDEPS .dep/getserv.d
  CCDEPS .dep/getproto.d
  CCDEPS .dep/getnameinfo.d
  CCDEPS .dep/gethostname.d
  CCDEPS .dep/gethost.d
  CCDEPS .dep/getcwd.d
  CCDEPS .dep/getaddrinfo.d
  CCDEPS .dep/exit.d
  CCDEPS .dep/mkdir.d
  CCDEPS .dep/fsync.d
  CCDEPS .dep/execvp.d
  CCDEPS .dep/execve.d
  CCDEPS .dep/execv.d
  CCDEPS .dep/cstringv.d
  CCDEPS .dep/cst2constr.d
  CCDEPS .dep/chmod.d
  CCDEPS .dep/chdir.d
  CCDEPS .dep/addrofstr.d
  CCDEPS .dep/access.d
  CC access.b.o
  CC addrofstr.b.o
  CC chdir.b.o
  CC chmod.b.o
  CC cst2constr.b.o
  CC cstringv.b.o
  CC execv.b.o
  CC execve.b.o
  CC execvp.b.o
  CC fsync.b.o
  CC mkdir.b.o
  CC exit.b.o
  CC getaddrinfo.b.o
  CC getcwd.b.o
  CC gethost.b.o
  CC gethostname.b.o
  CC getnameinfo.b.o
  CC getproto.b.o
  CC getserv.b.o
  CC gmtime.b.o
  CC mmap_ba.b.o
  CC putenv.b.o
  CC rename.b.o
  CC rmdir.b.o
  CC socketaddr.b.o
  CC strofaddr.b.o
  CC time.b.o
  CC unlink.b.o
  CC accept_win32.b.o
  CC bind_win32.b.o
  CC channels_win32.b.o
  CC close_win32.b.o
  CC connect_win32.b.o
  CC dup_win32.b.o
  CC envir_win32.b.o
  CC errmsg_win32.b.o
  CC getpeername_win32.b.o
  CC getpid_win32.b.o
  CC getsockname_win32.b.o
  CC gettimeofday_win32.b.o
  CC isatty_win32.b.o
  CC link_win32.b.o
  CC listen_win32.b.o
  CC lockf_win32.b.o
  CC lseek_win32.b.o
  CC mmap_win32.b.o
  CC open_win32.b.o
  CC pipe_win32.b.o
  CC read_win32.b.o
  CC readlink_win32.b.o
  CC realpath_win32.b.o
  CC select_win32.b.o
  CC sendrecv_win32.b.o
  CC shutdown_win32.b.o
  CC sleep_win32.b.o
  CC socket_win32.b.o
  CC socketpair_win32.b.o
  CC sockopt_win32.b.o
  CC stat_win32.b.o
  CC symlink_win32.b.o
  CC times_win32.b.o
  CC truncate_win32.b.o
  CC unixsupport_win32.b.o
  CC utimes_win32.b.o
  CC write_win32.b.o
  CC close_on.b.o
  CC createprocess.b.o
  CC nonblock.b.o
  CC startup.b.o
  CC system.b.o
  CC windbug.b.o
  CC windir.b.o
  CC winlist.b.o
  CC winwait.b.o
  CC winworker.b.o
  CC access.n.o
  CC addrofstr.n.o
  CC chdir.n.o
  CC chmod.n.o
  CC cst2constr.n.o
  CC cstringv.n.o
  CC execv.n.o
  CC execve.n.o
  CC execvp.n.o
  CC fsync.n.o
  CC mkdir.n.o
  CC exit.n.o
  CC getaddrinfo.n.o
  CC getcwd.n.o
  CC gethost.n.o
  CC gethostname.n.o
  CC getnameinfo.n.o
  CC getproto.n.o
  CC getserv.n.o
  CC gmtime.n.o
  CC mmap_ba.n.o
  CC putenv.n.o
  CC rename.n.o
  CC rmdir.n.o
  CC socketaddr.n.o
  CC strofaddr.n.o
  CC time.n.o
  CC unlink.n.o
  CC accept_win32.n.o
  CC bind_win32.n.o
  CC channels_win32.n.o
  CC close_win32.n.o
  CC connect_win32.n.o
  CC dup_win32.n.o
  CC envir_win32.n.o
  CC errmsg_win32.n.o
  CC getpeername_win32.n.o
  CC getpid_win32.n.o
  CC getsockname_win32.n.o
  CC gettimeofday_win32.n.o
  CC isatty_win32.n.o
  CC link_win32.n.o
  CC listen_win32.n.o
  CC lockf_win32.n.o
  CC lseek_win32.n.o
  CC mmap_win32.n.o
  CC open_win32.n.o
  CC pipe_win32.n.o
  CC read_win32.n.o
  CC readlink_win32.n.o
  CC realpath_win32.n.o
  CC select_win32.n.o
  CC sendrecv_win32.n.o
  CC shutdown_win32.n.o
  CC sleep_win32.n.o
  CC socket_win32.n.o
  CC socketpair_win32.n.o
  CC sockopt_win32.n.o
  CC stat_win32.n.o
  CC symlink_win32.n.o
  CC times_win32.n.o
  CC truncate_win32.n.o
  CC unixsupport_win32.n.o
  CC utimes_win32.n.o
  CC write_win32.n.o
  CC close_on.n.o
  CC createprocess.n.o
  CC nonblock.n.o
  CC startup.n.o
  CC system.n.o
  CC windbug.n.o
  CC windir.n.o
  CC winlist.n.o
  CC winwait.n.o
  CC winworker.n.o
  OCAMLC unix.cmo
  OCAMLC unixLabels.cmi
  OCAMLMKLIB libunixbyt.a
  OCAMLC unixLabels.cmo
  OCAMLMKLIB unix.cma
make[4]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/unix'
make[4]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/str'
mkdir -p .dep
  CCDEPS .dep/strstubs.d
  CC strstubs.b.o
  CC strstubs.n.o
  OCAMLC str.cmo
  OCAMLMKLIB libcamlstrbyt.a
  OCAMLMKLIB str.cma
make[4]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/str'
make[4]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/systhreads'
mkdir -p .dep
  CCDEPS .dep/st_stubs.b.d
  CC st_stubs.b.o
  CC st_stubs_shared.b.o
  OCAMLC thread.cmi
  OCAMLC event.cmi
  OCAMLMKLIB libthreads.a
  OCAMLC thread.cmo
  OCAMLC event.cmo
  OCAMLMKLIB threads.cma
make[4]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/systhreads'
make[3]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs'
  LINKC debugger/ocamldebug.exe
  LINKC ocamldoc/ocamldoc.exe
  LINKC ocamltest/ocamltest.exe
make[2]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make othertools
make[2]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make lex-all
make[3]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
  OCAMLC tools/ocamltex.cmi
  OCAMLC tools/ocamltex.cmo
make[3]: Nothing to be done for 'lex-all'.
make[3]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make tools-all
make[3]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make[3]: Nothing to be done for 'tools-all'.
make[3]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make -C otherlibs all
make[3]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs'
for lib in runtime_events unix str systhreads; do (make -C $lib all) || exit $?; done
make[4]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/runtime_events'
make[4]: Nothing to be done for 'all'.
make[4]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/runtime_events'
make[4]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/unix'
make[4]: Nothing to be done for 'all'.
make[4]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/unix'
make[4]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/str'
make[4]: Nothing to be done for 'all'.
make[4]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/str'
make[4]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/systhreads'
make[4]: Nothing to be done for 'all'.
make[4]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/systhreads'
make[3]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs'
  LINKC tools/ocamltex.exe
make[2]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make manpages
make[2]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make -C api_docgen man
make[3]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/api_docgen'
make -C ocamldoc man
make[4]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/api_docgen/ocamldoc'
mkdir -p build/
mkdir -p build/libref
mkdir -p build/compilerlibref
mkdir -p build/man
  GEN build/Format_tutorial.mld
  GEN build/Ocaml_operators.mld
  OCAMLDOC build/libref/arg.odoc
  OCAMLDOC build/libref/array.odoc
  OCAMLDOC build/libref/arrayLabels.odoc
  OCAMLDOC build/libref/atomic.odoc
  OCAMLDOC build/libref/bigarray.odoc
  OCAMLDOC build/libref/bool.odoc
  OCAMLDOC build/libref/buffer.odoc
  OCAMLDOC build/libref/bytes.odoc
  OCAMLDOC build/libref/bytesLabels.odoc
  OCAMLDOC build/libref/callback.odoc
  OCAMLDOC build/libref/char.odoc
  OCAMLDOC build/libref/complex.odoc
  OCAMLDOC build/libref/condition.odoc
  OCAMLDOC build/libref/digest.odoc
  OCAMLDOC build/libref/domain.odoc
  OCAMLDOC build/libref/dynarray.odoc
  OCAMLDOC build/libref/dynlink.odoc
  OCAMLDOC build/libref/effect.odoc
  OCAMLDOC build/libref/either.odoc
  OCAMLDOC build/libref/ephemeron.odoc
  OCAMLDOC build/libref/event.odoc
  OCAMLDOC build/libref/filename.odoc
  OCAMLDOC build/libref/float.odoc
  OCAMLDOC build/libref/format.odoc
  OCAMLDOC build/libref/fun.odoc
  OCAMLDOC build/libref/gc.odoc
  OCAMLDOC build/libref/hashtbl.odoc
  OCAMLDOC build/libref/iarray.odoc
  OCAMLDOC build/libref/in_channel.odoc
  OCAMLDOC build/libref/int.odoc
  OCAMLDOC build/libref/int32.odoc
  OCAMLDOC build/libref/int64.odoc
  OCAMLDOC build/libref/lazy.odoc
  OCAMLDOC build/libref/lexing.odoc
  OCAMLDOC build/libref/list.odoc
  OCAMLDOC build/libref/listLabels.odoc
  OCAMLDOC build/libref/map.odoc
  OCAMLDOC build/libref/marshal.odoc
  OCAMLDOC build/libref/moreLabels.odoc
  OCAMLDOC build/libref/mutex.odoc
  OCAMLDOC build/libref/nativeint.odoc
  OCAMLDOC build/libref/obj.odoc
  OCAMLDOC build/libref/oo.odoc
  OCAMLDOC build/libref/option.odoc
  OCAMLDOC build/libref/out_channel.odoc
  OCAMLDOC build/libref/pair.odoc
  OCAMLDOC build/libref/parsing.odoc
  OCAMLDOC build/libref/pqueue.odoc
  OCAMLDOC build/libref/printexc.odoc
  OCAMLDOC build/libref/printf.odoc
  OCAMLDOC build/libref/queue.odoc
  OCAMLDOC build/libref/random.odoc
  OCAMLDOC build/libref/repr.odoc
  OCAMLDOC build/libref/result.odoc
  OCAMLDOC build/libref/runtime_events.odoc
  OCAMLDOC build/libref/scanf.odoc
  OCAMLDOC build/libref/semaphore.odoc
  OCAMLDOC build/libref/seq.odoc
  OCAMLDOC build/libref/set.odoc
  OCAMLDOC build/libref/stack.odoc
  OCAMLDOC build/libref/stdLabels.odoc
  OCAMLDOC build/libref/stdlib.odoc
  OCAMLDOC build/libref/str.odoc
  OCAMLDOC build/libref/string.odoc
  OCAMLDOC build/libref/stringLabels.odoc
  OCAMLDOC build/libref/sys.odoc
  OCAMLDOC build/libref/thread.odoc
  OCAMLDOC build/libref/type.odoc
  OCAMLDOC build/libref/uchar.odoc
  OCAMLDOC build/libref/unit.odoc
  OCAMLDOC build/libref/unix.odoc
  OCAMLDOC build/libref/unixLabels.odoc
  OCAMLDOC build/libref/weak.odoc
  OCAMLDOC build/libref/camlinternalFormat.odoc
  OCAMLDOC build/libref/camlinternalFormatBasics.odoc
  OCAMLDOC build/libref/camlinternalLazy.odoc
  OCAMLDOC build/libref/camlinternalMod.odoc
  OCAMLDOC build/libref/camlinternalOO.odoc
  GEN build/Compiler_libs.mld
  OCAMLDOC build/compilerlibref/ast_helper.odoc
  OCAMLDOC build/compilerlibref/ast_invariants.odoc
  OCAMLDOC build/compilerlibref/ast_iterator.odoc
  OCAMLDOC build/compilerlibref/ast_mapper.odoc
  OCAMLDOC build/compilerlibref/asttypes.odoc
  OCAMLDOC build/compilerlibref/attr_helper.odoc
  OCAMLDOC build/compilerlibref/builtin_attributes.odoc
  OCAMLDOC build/compilerlibref/camlinternalMenhirLib.odoc
  OCAMLDOC build/compilerlibref/depend.odoc
  OCAMLDOC build/compilerlibref/docstrings.odoc
  OCAMLDOC build/compilerlibref/lexer.odoc
  OCAMLDOC build/compilerlibref/location.odoc
  OCAMLDOC build/compilerlibref/longident.odoc
  OCAMLDOC build/compilerlibref/parse.odoc
  OCAMLDOC build/compilerlibref/parser.odoc
  OCAMLDOC build/compilerlibref/parsetree.odoc
  OCAMLDOC build/compilerlibref/pprintast.odoc
  OCAMLDOC build/compilerlibref/printast.odoc
  OCAMLDOC build/compilerlibref/syntaxerr.odoc
  OCAMLDOC build/compilerlibref/unit_info.odoc
  OCAMLDOC build/compilerlibref/arg_helper.odoc
  OCAMLDOC build/compilerlibref/binutils.odoc
  OCAMLDOC build/compilerlibref/build_path_prefix_map.odoc
  OCAMLDOC build/compilerlibref/ccomp.odoc
  OCAMLDOC build/compilerlibref/clflags.odoc
  OCAMLDOC build/compilerlibref/compression.odoc
  OCAMLDOC build/compilerlibref/config.odoc
  OCAMLDOC build/compilerlibref/consistbl.odoc
  OCAMLDOC build/compilerlibref/diffing.odoc
  OCAMLDOC build/compilerlibref/diffing_with_keys.odoc
  OCAMLDOC build/compilerlibref/domainstate.odoc
  OCAMLDOC build/compilerlibref/format_doc.odoc
  OCAMLDOC build/compilerlibref/identifiable.odoc
  OCAMLDOC build/compilerlibref/int_replace_polymorphic_compare.odoc
  OCAMLDOC build/compilerlibref/lazy_backtrack.odoc
  OCAMLDOC build/compilerlibref/linkdeps.odoc
  OCAMLDOC build/compilerlibref/load_path.odoc
  OCAMLDOC build/compilerlibref/local_store.odoc
  OCAMLDOC build/compilerlibref/misc.odoc
  OCAMLDOC build/compilerlibref/numbers.odoc
  OCAMLDOC build/compilerlibref/profile.odoc
  OCAMLDOC build/compilerlibref/strongly_connected_components.odoc
  OCAMLDOC build/compilerlibref/targetint.odoc
  OCAMLDOC build/compilerlibref/terminfo.odoc
  OCAMLDOC build/compilerlibref/warnings.odoc
  OCAMLDOC build/compilerlibref/pparse.odoc
  OCAMLDOC build/libref/Format_tutorial.odoc
  OCAMLDOC build/libref/Ocaml_operators.odoc
  OCAMLDOC build/compilerlibref/Compiler_libs.odoc
  OCAMLDOC build/man/Stdlib.3o
make[4]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/api_docgen/ocamldoc'
make[3]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/api_docgen'
make[2]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make[1]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
+ make install
mkdir -p 'C:/ocamlmgw-44619/bin' && \
/usr/bin/install -c -p runtime/ocamlrun.exe 'C:/ocamlmgw-44619/bin/i686-w64-mingw32-ocamlrun-b105.exe' && \
(cd "C:/ocamlmgw-44619/bin" && ln -sf 'i686-w64-mingw32-ocamlrun-b105.exe' 'ocamlrun.exe') && \
(cd "C:/ocamlmgw-44619/bin" && ln -sf 'i686-w64-mingw32-ocamlrun-b105.exe' 'ocamlrun-b105.exe')
/usr/bin/install -c -p runtime/ocamlrund.exe 'C:/ocamlmgw-44619/bin/i686-w64-mingw32-ocamlrund-b105.exe' && \
(cd "C:/ocamlmgw-44619/bin" && ln -sf 'i686-w64-mingw32-ocamlrund-b105.exe' 'ocamlrund.exe') && \
(cd "C:/ocamlmgw-44619/bin" && ln -sf 'i686-w64-mingw32-ocamlrund-b105.exe' 'ocamlrund-b105.exe')
/usr/bin/install -c -p runtime/ocamlruni.exe 'C:/ocamlmgw-44619/bin/i686-w64-mingw32-ocamlruni-b105.exe' && \
(cd "C:/ocamlmgw-44619/bin" && ln -sf 'i686-w64-mingw32-ocamlruni-b105.exe' 'ocamlruni.exe') && \
(cd "C:/ocamlmgw-44619/bin" && ln -sf 'i686-w64-mingw32-ocamlruni-b105.exe' 'ocamlruni-b105.exe')
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml' && \
/usr/bin/install -c -p -m 644 runtime/ld.conf runtime/libcamlrun.a runtime/libcamlrund.a runtime/libcamlruni.a 'C:/ocamlmgw-44619/bin/../lib/ocaml' 
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/caml' && \
/usr/bin/install -c -p -m 644 runtime/caml/domain_state.tbl runtime/caml/*.h 'C:/ocamlmgw-44619/bin/../lib/ocaml/caml' 
/usr/bin/install -c -p ocaml.exe 'C:/ocamlmgw-44619/bin' 
./boot/ocamlrun.exe ./tools/stripdebug.exe ocamlc.exe ocamlc.exe.stripped
/usr/bin/install -c -p ocamlc.exe.stripped 'C:/ocamlmgw-44619/bin/ocamlc.byte.exe' && \
(cd "C:/ocamlmgw-44619/bin" && ln -sf 'ocamlc.byte.exe' 'ocamlc.exe')
make -C stdlib install
make[1]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/stdlib'
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml' && \
/usr/bin/install -c -p -m 644 stdlib.cma std_exit.cmo *.cmi 'C:/ocamlmgw-44619/bin/../lib/ocaml' 
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/stdlib' && \
/usr/bin/install -c -p -m 644 META 'C:/ocamlmgw-44619/bin/../lib/ocaml/stdlib' 
/usr/bin/install -c -p -m 644 *.cmt *.cmti *.mli *.ml *.ml.in 'C:/ocamlmgw-44619/bin/../lib/ocaml' 
/usr/bin/install -c -p -m 644 runtime-launch-info 'C:/ocamlmgw-44619/bin/../lib/ocaml' 
make[1]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/stdlib'
/usr/bin/install -c -p lex/ocamllex.exe 'C:/ocamlmgw-44619/bin/ocamllex.byte.exe' && \
(cd "C:/ocamlmgw-44619/bin" && ln -sf 'ocamllex.byte.exe' 'ocamllex.exe')
/usr/bin/install -c -p tools/ocamldep.exe 'C:/ocamlmgw-44619/bin/ocamldep.byte.exe' && \
(cd "C:/ocamlmgw-44619/bin" && ln -sf 'ocamldep.byte.exe' 'ocamldep.exe')
/usr/bin/install -c -p tools/ocamlobjinfo.exe 'C:/ocamlmgw-44619/bin/ocamlobjinfo.byte.exe' && \
(cd "C:/ocamlmgw-44619/bin" && ln -sf 'ocamlobjinfo.byte.exe' 'ocamlobjinfo.exe')
/usr/bin/install -c -p tools/ocamlcmt.exe 'C:/ocamlmgw-44619/bin' 
/usr/bin/install -c -p tools/ocamlprof.exe 'C:/ocamlmgw-44619/bin' 
/usr/bin/install -c -p tools/ocamlcp.exe 'C:/ocamlmgw-44619/bin' 
/usr/bin/install -c -p tools/ocamlmklib.exe 'C:/ocamlmgw-44619/bin' 
/usr/bin/install -c -p tools/ocamlmktop.exe 'C:/ocamlmgw-44619/bin' 
/usr/bin/install -c -p yacc/ocamlyacc.exe 'C:/ocamlmgw-44619/bin' 
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/compiler-libs' && \
/usr/bin/install -c -p -m 644 utils/*.cmi parsing/*.cmi typing/*.cmi bytecomp/*.cmi file_formats/*.cmi lambda/*.cmi driver/*.cmi toplevel/*.cmi 'C:/ocamlmgw-44619/bin/../lib/ocaml/compiler-libs' 
/usr/bin/install -c -p -m 644 utils/*.cmt utils/*.cmti utils/*.mli parsing/*.cmt parsing/*.cmti parsing/*.mli typing/*.cmt typing/*.cmti typing/*.mli bytecomp/*.cmt bytecomp/*.cmti bytecomp/*.mli file_formats/*.cmt file_formats/*.cmti file_formats/*.mli lambda/*.cmt lambda/*.cmti lambda/*.mli driver/*.cmt driver/*.cmti driver/*.mli toplevel/*.cmt toplevel/*.cmti toplevel/*.mli 'C:/ocamlmgw-44619/bin/../lib/ocaml/compiler-libs' 
/usr/bin/install -c -p -m 644 toplevel/byte/*.cmt 'C:/ocamlmgw-44619/bin/../lib/ocaml/compiler-libs' 
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/profiling' && \
/usr/bin/install -c -p -m 644 tools/profiling.cmt tools/profiling.cmti 'C:/ocamlmgw-44619/bin/../lib/ocaml/profiling' 
/usr/bin/install -c -p -m 644 compilerlibs/*.cma compilerlibs/META 'C:/ocamlmgw-44619/bin/../lib/ocaml/compiler-libs' 
/usr/bin/install -c -p -m 644 driver/main.cmo toplevel/topstart.cmo 'C:/ocamlmgw-44619/bin/../lib/ocaml/compiler-libs' 
/usr/bin/install -c -p expunge.exe 'C:/ocamlmgw-44619/bin/../lib/ocaml' 
rm -f "C:/ocamlmgw-44619/bin/../lib/ocaml"/topdirs.cm* "C:/ocamlmgw-44619/bin/../lib/ocaml/topdirs.mli"
rm -f "C:/ocamlmgw-44619/bin/../lib/ocaml"/profiling.cm* "C:/ocamlmgw-44619/bin/../lib/ocaml/profiling.o"
/usr/bin/install -c -p -m 644 tools/profiling.cmi tools/profiling.cmo 'C:/ocamlmgw-44619/bin/../lib/ocaml/profiling' 
rm -f "C:/ocamlmgw-44619/bin/../lib/ocaml"/dynlink.cm* "C:/ocamlmgw-44619/bin/../lib/ocaml/dynlink.mli" "C:/ocamlmgw-44619/bin/../lib/ocaml/dynlink.a" "C:/ocamlmgw-44619/bin/../lib/ocaml/"dynlink_config.cmx "C:/ocamlmgw-44619/bin/../lib/ocaml/"dynlink_types.cmx "C:/ocamlmgw-44619/bin/../lib/ocaml/"dynlink_platform_intf.cmx "C:/ocamlmgw-44619/bin/../lib/ocaml/"dynlink_common.cmx "C:/ocamlmgw-44619/bin/../lib/ocaml/"dynlink.cmx
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/dynlink' && \
/usr/bin/install -c -p -m 644 otherlibs/dynlink/dynlink.cmi otherlibs/dynlink/dynlink.cma otherlibs/dynlink/META 'C:/ocamlmgw-44619/bin/../lib/ocaml/dynlink' 
/usr/bin/install -c -p -m 644 otherlibs/dynlink/dynlink.cmti otherlibs/dynlink/dynlink.mli 'C:/ocamlmgw-44619/bin/../lib/ocaml/dynlink' 
for i in runtime_events unix str systhreads; do \
  make -C otherlibs/$i install || exit $?; \
done
make[1]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/runtime_events'
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/stublibs' && \
/usr/bin/install -c -p dllcamlruntime_eventsbyt-i686-w64-mingw32-b105.dll 'C:/ocamlmgw-44619/bin/../lib/ocaml/stublibs' 
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml' && \
/usr/bin/install -c -p -m 644 libcamlruntime_eventsbyt.a 'C:/ocamlmgw-44619/bin/../lib/ocaml' 
rm -f "C:/ocamlmgw-44619/bin/../lib/ocaml"/runtime_events.cma "C:/ocamlmgw-44619/bin/../lib/ocaml"/runtime_events.cmi "C:/ocamlmgw-44619/bin/../lib/ocaml"/runtime_events.mli "C:/ocamlmgw-44619/bin/../lib/ocaml"/runtime_events.cmti "C:/ocamlmgw-44619/bin/../lib/ocaml"/runtime_events.cmx "C:/ocamlmgw-44619/bin/../lib/ocaml"/runtime_events.cmxa "C:/ocamlmgw-44619/bin/../lib/ocaml"/runtime_events.cmxs "C:/ocamlmgw-44619/bin/../lib/ocaml"/runtime_events.a
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/runtime_events' && \
/usr/bin/install -c -p -m 644 runtime_events.cma runtime_events.cmi META 'C:/ocamlmgw-44619/bin/../lib/ocaml/runtime_events' 
/usr/bin/install -c -p -m 644 runtime_events.mli runtime_events.cmti 'C:/ocamlmgw-44619/bin/../lib/ocaml/runtime_events' 
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/caml' && \
/usr/bin/install -c -p -m 644 caml/runtime_events_consumer.h 'C:/ocamlmgw-44619/bin/../lib/ocaml/caml' 
make[1]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/runtime_events'
make[1]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/unix'
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/stublibs' && \
/usr/bin/install -c -p dllunixbyt-i686-w64-mingw32-b105.dll 'C:/ocamlmgw-44619/bin/../lib/ocaml/stublibs' 
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml' && \
/usr/bin/install -c -p -m 644 libunixbyt.a 'C:/ocamlmgw-44619/bin/../lib/ocaml' 
rm -f "C:/ocamlmgw-44619/bin/../lib/ocaml"/unix.cma "C:/ocamlmgw-44619/bin/../lib/ocaml"/unix.cmi "C:/ocamlmgw-44619/bin/../lib/ocaml"/unixLabels.cmi "C:/ocamlmgw-44619/bin/../lib/ocaml"/unix.mli "C:/ocamlmgw-44619/bin/../lib/ocaml"/unixLabels.mli "C:/ocamlmgw-44619/bin/../lib/ocaml"/unix.cmti "C:/ocamlmgw-44619/bin/../lib/ocaml"/unixLabels.cmti "C:/ocamlmgw-44619/bin/../lib/ocaml"/unix.cmx "C:/ocamlmgw-44619/bin/../lib/ocaml"/unixLabels.cmx "C:/ocamlmgw-44619/bin/../lib/ocaml"/unix.cmxa "C:/ocamlmgw-44619/bin/../lib/ocaml"/unix.cmxs "C:/ocamlmgw-44619/bin/../lib/ocaml"/unix.a
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/unix' && \
/usr/bin/install -c -p -m 644 unix.cma unix.cmi unixLabels.cmi META 'C:/ocamlmgw-44619/bin/../lib/ocaml/unix' 
/usr/bin/install -c -p -m 644 unix.mli unixLabels.mli unix.cmti unixLabels.cmti 'C:/ocamlmgw-44619/bin/../lib/ocaml/unix' 
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/caml' && \
/usr/bin/install -c -p -m 644 caml/unixsupport.h caml/socketaddr.h 'C:/ocamlmgw-44619/bin/../lib/ocaml/caml' 
make[1]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/unix'
make[1]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/str'
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/stublibs' && \
/usr/bin/install -c -p dllcamlstrbyt-i686-w64-mingw32-b105.dll 'C:/ocamlmgw-44619/bin/../lib/ocaml/stublibs' 
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml' && \
/usr/bin/install -c -p -m 644 libcamlstrbyt.a 'C:/ocamlmgw-44619/bin/../lib/ocaml' 
rm -f "C:/ocamlmgw-44619/bin/../lib/ocaml"/str.cma "C:/ocamlmgw-44619/bin/../lib/ocaml"/str.cmi "C:/ocamlmgw-44619/bin/../lib/ocaml"/str.mli "C:/ocamlmgw-44619/bin/../lib/ocaml"/str.cmti "C:/ocamlmgw-44619/bin/../lib/ocaml"/str.cmx "C:/ocamlmgw-44619/bin/../lib/ocaml"/str.cmxa "C:/ocamlmgw-44619/bin/../lib/ocaml"/str.cmxs "C:/ocamlmgw-44619/bin/../lib/ocaml"/str.a
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/str' && \
/usr/bin/install -c -p -m 644 str.cma str.cmi META 'C:/ocamlmgw-44619/bin/../lib/ocaml/str' 
/usr/bin/install -c -p -m 644 str.mli str.cmti 'C:/ocamlmgw-44619/bin/../lib/ocaml/str' 
make[1]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/str'
make[1]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/systhreads'
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/stublibs' && \
/usr/bin/install -c -p dllthreads-i686-w64-mingw32-b105.dll 'C:/ocamlmgw-44619/bin/../lib/ocaml/stublibs' 
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml' && \
/usr/bin/install -c -p -m 644 libthreads.a 'C:/ocamlmgw-44619/bin/../lib/ocaml' 
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/threads' && \
/usr/bin/install -c -p -m 644 thread.cmi event.cmi threads.cma META 'C:/ocamlmgw-44619/bin/../lib/ocaml/threads' 
/usr/bin/install -c -p -m 644 thread.cmti event.cmti 'C:/ocamlmgw-44619/bin/../lib/ocaml/threads' 
/usr/bin/install -c -p -m 644 thread.mli event.mli 'C:/ocamlmgw-44619/bin/../lib/ocaml/threads' 
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/caml' && \
/usr/bin/install -c -p -m 644 caml/threads.h 'C:/ocamlmgw-44619/bin/../lib/ocaml/caml' 
make[1]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/systhreads'
/usr/bin/install -c -p ocamldoc/ocamldoc.exe 'C:/ocamlmgw-44619/bin' 
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/ocamldoc' && \
/usr/bin/install -c -p -m 644 ocamldoc/ocamldoc.hva ocamldoc/*.cmi ocamldoc/odoc_info.cma ocamldoc/META 'C:/ocamlmgw-44619/bin/../lib/ocaml/ocamldoc' 
/usr/bin/install -c -p -m 644 ocamldoc/odoc_dep.mli ocamldoc/odoc_dot.mli ocamldoc/odoc_extension.mli ocamldoc/odoc_html.mli ocamldoc/odoc_info.mli ocamldoc/odoc_latex.mli ocamldoc/odoc_latex_style.mli ocamldoc/odoc_man.mli ocamldoc/odoc_messages.mli ocamldoc/odoc_ocamlhtml.mli ocamldoc/odoc_parameter.mli ocamldoc/odoc_texi.mli ocamldoc/odoc_text_lexer.mli ocamldoc/odoc_to_text.mli ocamldoc/odoc_type.mli ocamldoc/odoc_value.mli ocamldoc/odoc_dep.cmt ocamldoc/odoc_dot.cmt ocamldoc/odoc_extension.cmt ocamldoc/odoc_html.cmt ocamldoc/odoc_info.cmt ocamldoc/odoc_latex.cmt ocamldoc/odoc_latex_style.cmt ocamldoc/odoc_man.cmt ocamldoc/odoc_messages.cmt ocamldoc/odoc_ocamlhtml.cmt ocamldoc/odoc_parameter.cmt ocamldoc/odoc_texi.cmt ocamldoc/odoc_text_lexer.cmt ocamldoc/odoc_to_text.cmt ocamldoc/odoc_type.cmt ocamldoc/odoc_value.cmt ocamldoc/odoc_dep.cmti ocamldoc/odoc_dot.cmti ocamldoc/odoc_extension.cmti ocamldoc/odoc_html.cmti ocamldoc/odoc_info.cmti ocamldoc/odoc_latex.cmti ocamldoc/odoc_latex_style.cmti ocamldoc/odoc_man.cmti ocamldoc/odoc_messages.cmti ocamldoc/odoc_ocamlhtml.cmti ocamldoc/odoc_parameter.cmti ocamldoc/odoc_texi.cmti ocamldoc/odoc_text_lexer.cmti ocamldoc/odoc_to_text.cmti ocamldoc/odoc_type.cmti ocamldoc/odoc_value.cmti 'C:/ocamlmgw-44619/bin/../lib/ocaml/ocamldoc' 
make -C api_docgen install
make[1]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/api_docgen'
make -C ocamldoc install
make[2]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/api_docgen/ocamldoc'
mkdir -p 'C:/ocamlmgw-44619/man/man3' && \
/usr/bin/install -c -p -m 644 build/man/*.3o 'C:/ocamlmgw-44619/man/man3' 
make[2]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/api_docgen/ocamldoc'
make[1]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/api_docgen'
/usr/bin/install -c -p debugger/ocamldebug.exe 'C:/ocamlmgw-44619/bin' 
/usr/bin/install -c -p flexlink.byte.exe 'C:/ocamlmgw-44619/bin' && \
(cd "C:/ocamlmgw-44619/bin" && ln -sf 'flexlink.byte.exe' 'flexlink.exe')
mkdir -p 'C:/ocamlmgw-44619/bin/../lib/ocaml/flexdll' && \
/usr/bin/install -c -p -m 644 flexdll_mingw.o flexdll_initer_mingw.o 'C:/ocamlmgw-44619/bin/../lib/ocaml/flexdll' 
/usr/bin/install -c -p -m 644 Makefile.config 'C:/ocamlmgw-44619/bin/../lib/ocaml' 
mkdir -p 'C:/ocamlmgw-44619/share/doc/ocaml' && \
/usr/bin/install -c -p -m 644 Changes README.adoc README.win32.adoc LICENSE 'C:/ocamlmgw-44619/share/doc/ocaml' 
+ make -f Makefile.test -C testsuite/in_prefix test-in-prefix
make: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/testsuite/in_prefix'
make -C ../.. testsuite/tools/test_in_prefix.exe
make[1]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make lex-all
make[2]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make[2]: Nothing to be done for 'lex-all'.
make[2]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make tools-all
make[2]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make[2]: Nothing to be done for 'tools-all'.
make[2]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make -C otherlibs all
make[2]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs'
for lib in runtime_events unix str systhreads; do (make -C $lib all) || exit $?; done
make[3]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/runtime_events'
make[3]: Nothing to be done for 'all'.
make[3]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/runtime_events'
make[3]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/unix'
make[3]: Nothing to be done for 'all'.
make[3]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/unix'
make[3]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/str'
make[3]: Nothing to be done for 'all'.
make[3]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/str'
make[3]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/systhreads'
make[3]: Nothing to be done for 'all'.
make[3]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs/systhreads'
make[2]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/otherlibs'
  OCAMLC testsuite/tools/toolchain.cmi
  OCAMLC testsuite/tools/toolchain.cmo
  OCAMLC testsuite/tools/harness.cmi
  OCAMLC testsuite/tools/harness.cmo
  OCAMLC testsuite/tools/environment.cmi
  OCAMLC testsuite/tools/environment.cmo
  OCAMLC testsuite/tools/cmdline.cmi
  OCAMLC testsuite/tools/cmdline.cmo
  OCAMLC testsuite/tools/testBytecodeBinaries.cmi
  OCAMLC testsuite/tools/testBytecodeBinaries.cmo
  OCAMLC testsuite/tools/testDynlink.cmi
  OCAMLC testsuite/tools/testDynlink.cmo
  OCAMLC testsuite/tools/testLinkModes.cmi
  OCAMLC testsuite/tools/testLinkModes.cmo
  OCAMLC testsuite/tools/testRelocation.cmi
  OCAMLC testsuite/tools/testRelocation.cmo
  OCAMLC testsuite/tools/testToplevel.cmi
  OCAMLC testsuite/tools/testToplevel.cmo
  OCAMLC testsuite/tools/test_ld_conf.cmi
  OCAMLC testsuite/tools/test_ld_conf.cmo
  OCAMLC testsuite/tools/test_in_prefix.cmi
  OCAMLC testsuite/tools/test_in_prefix.cmo
  LINKC testsuite/tools/test_in_prefix.exe
make[1]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make -C ../.. testsuite/tools/main_in_c.o
make[1]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
  CC testsuite/tools/main_in_c.o
make[1]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
make -C ../.. testsuite/tools/dummy.exe
make[1]: Entering directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
  CC testsuite/tools/dummy.o
  MKEXE testsuite/tools/dummy.exe
make[1]: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32'
Test Environment
    prefix = C:\ocamlmgw-44619
    bindir = [$prefix/]bin
    libdir = [$prefix/]lib\ocaml
  - C compiler is i686-w64-mingw32-gcc [mingw-9-0-gcc-10-2] for i686-w64-mingw32
  - OCaml is relocatable and reproducible; target binaries by default are relocatable
  - Executable header size is 5.50KiB (5634 bytes)
  - Testing bytecode only for shared and static linking

Checking installed files for
  Installation Prefix: /ocamlmgw-44619
  Relative Suffix: /../lib/ocaml
  Build Root: /builds/workspace/precheck/flambda/false/label/ocaml-mingw-32

Relocatable files:
  **/META, *.a, *.cma, *.cmi, *.cmo, *.cmt, *.cmti, *.dll, *.exe, *.h, *.hva,
    *.ml, *.ml.in, *.mli, *.o, *.tbl, $bindir/*, $libdir\ld.conf,
    $libdir\runtime-launch-info

Files containing the installation prefix:
  $libdir\Makefile.config

Files containing the relative suffix:
  $libdir\Makefile.config

Testing loading of libraries with bytecode dynlink
$prefix\$bindir\ocamlc.exe -set-runtime-default standard_library_default=/does-not-exist -I +dynlink dynlink.cma -linkall -o $PWD\test_script.exe test_install_script.ml
> Environment
>   PATH=$prefix\$bindir:$PATH
$PWD\test_script.exe runtime_events
> Loaded runtime_events.cma
$PWD\test_script.exe str
> Loaded str.cma
$PWD\test_script.exe unix threads
> Loaded unix.cma
> Loaded threads.cma
$PWD\test_script.exe unix
> Loaded unix.cma
Testing loading of libraries in $prefix\$bindir\ocaml.exe
$prefix\$bindir\ocaml.exe -noinit -no-version -noprompt test_install_script.ml
> Loaded dynlink.cma
$prefix\$bindir\ocaml.exe -noinit -no-version -noprompt test_install_script.ml
> Loaded runtime_events.cma
$prefix\$bindir\ocaml.exe -noinit -no-version -noprompt test_install_script.ml
> Loaded str.cma
$prefix\$bindir\ocaml.exe -noinit -no-version -noprompt test_install_script.ml
> Loaded unix.cma
> Loaded threads.cma
$prefix\$bindir\ocaml.exe -noinit -no-version -noprompt test_install_script.ml
> Loaded unix.cma

Testing processing of ld.conf
$prefix\$bindir\ocamlc.exe -I +compiler-libs ocamlcommon.cma ocamlbytecomp.cma -o $PWD\test_ld_conf.byte.exe test_install_script.ml
- Base ld.conf test
Backing up $prefix\$libdir\ld.conf to $prefix\$libdir\ld.conf.bak
$prefix\$bindir\ocamlrun.exe -config
$PWD\test_ld_conf.byte.exe
- Base ld.conf + CAML_LD_LIBRARY_PATH
CAML_LD_LIBRARY_PATH=;/;//;.;..;.\;..\;.\stublibs;..\stublibs;stublibs;.stublibs;..stublibs;C:\ocamlmgw-44619\lib\ocaml;/lib/ocaml $prefix\$bindir\ocamlrun.exe -config
CAML_LD_LIBRARY_PATH=;/;//;.;..;.\;..\;.\stublibs;..\stublibs;stublibs;.stublibs;..stublibs;C:\ocamlmgw-44619\lib\ocaml;/lib/ocaml $PWD\test_ld_conf.byte.exe
- Base ld.conf + quoted CAML_LD_LIBRARY_PATH
CAML_LD_LIBRARY_PATH="quoted";quote"in"entry;one";"entry;one";"two";three $prefix\$bindir\ocamlrun.exe -config
CAML_LD_LIBRARY_PATH="quoted";quote"in"entry;one";"entry;one";"two";three $PWD\test_ld_conf.byte.exe
- Base ld.conf with CRLF endings
$prefix\$bindir\ocamlrun.exe -config
$PWD\test_ld_conf.byte.exe
- Empty CAML_LD_LIBRARY_PATH
CAML_LD_LIBRARY_PATH= $prefix\$bindir\ocamlrun.exe -config
CAML_LD_LIBRARY_PATH= $PWD\test_ld_conf.byte.exe
- Embedded empty entry in CAML_LD_LIBRARY_PATH
CAML_LD_LIBRARY_PATH=; $prefix\$bindir\ocamlrun.exe -config
CAML_LD_LIBRARY_PATH=; $PWD\test_ld_conf.byte.exe
- Empty CAMLLIB
CAMLLIB= CAML_LD_LIBRARY_PATH=env $prefix\$bindir\ocamlrun.exe -config
CAMLLIB= CAML_LD_LIBRARY_PATH=env $PWD\test_ld_conf.byte.exe
- Empty OCAMLLIB
CAMLLIB=$PWD\camllib OCAMLLIB= CAML_LD_LIBRARY_PATH=env $prefix\$bindir\ocamlrun.exe -config
CAMLLIB=$PWD\camllib OCAMLLIB= CAML_LD_LIBRARY_PATH=env $PWD\test_ld_conf.byte.exe
- $OCAMLLIB/ld.conf
CAMLLIB=$PWD\camllib OCAMLLIB=$PWD\ocamllib CAML_LD_LIBRARY_PATH=env $prefix\$bindir\ocamlrun.exe -config
CAMLLIB=$PWD\camllib OCAMLLIB=$PWD\ocamllib CAML_LD_LIBRARY_PATH=env $PWD\test_ld_conf.byte.exe
- $CAMLLIB/ld.conf
CAMLLIB=$PWD\camllib CAML_LD_LIBRARY_PATH=env $prefix\$bindir\ocamlrun.exe -config
CAMLLIB=$PWD\camllib CAML_LD_LIBRARY_PATH=env $PWD\test_ld_conf.byte.exe
- EOF-at-EOF
$prefix\$bindir\ocamlrun.exe -config
$PWD\test_ld_conf.byte.exe
Restoring $prefix\$libdir\ld.conf.bak to $prefix\$libdir\ld.conf

Testing bytecode binaries in $prefix\$bindir
$prefix\$bindir\flexlink.byte.exe -vnum
  Runtime: ocamlrun-b105
  Output: 0.44
flexlink.byte (from $prefix\$bindir\flexlink.byte.exe) -M <exit 2>
$prefix\$bindir\flexlink.exe -vnum
  Runtime: ocamlrun-b105
  Output: 0.44
flexlink (from $prefix\$bindir\flexlink.exe) -M <exit 2>
$prefix\$bindir\ocaml.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocaml (from $prefix\$bindir\ocaml.exe) -M <exit 2>
$prefix\$bindir\ocamlc.byte.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlc.byte (from $prefix\$bindir\ocamlc.byte.exe) -M <exit 2>
$prefix\$bindir\ocamlc.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlc (from $prefix\$bindir\ocamlc.exe) -M <exit 2>
$prefix\$bindir\ocamlcmt.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlcmt (from $prefix\$bindir\ocamlcmt.exe) -M <exit 2>
$prefix\$bindir\ocamlcp.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlcp (from $prefix\$bindir\ocamlcp.exe) -M <exit 2>
$prefix\$bindir\ocamldebug.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamldebug (from $prefix\$bindir\ocamldebug.exe) -M <exit 2>
$prefix\$bindir\ocamldep.byte.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamldep.byte (from $prefix\$bindir\ocamldep.byte.exe) -M <exit 2>
$prefix\$bindir\ocamldep.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamldep (from $prefix\$bindir\ocamldep.exe) -M <exit 2>
$prefix\$bindir\ocamldoc.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamldoc (from $prefix\$bindir\ocamldoc.exe) -M <exit 2>
$prefix\$bindir\ocamllex.byte.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamllex.byte (from $prefix\$bindir\ocamllex.byte.exe) -M <exit 2>
$prefix\$bindir\ocamllex.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamllex (from $prefix\$bindir\ocamllex.exe) -M <exit 2>
$prefix\$bindir\ocamlmklib.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlmklib (from $prefix\$bindir\ocamlmklib.exe) -M <exit 4>
$prefix\$bindir\ocamlmktop.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlmktop (from $prefix\$bindir\ocamlmktop.exe) -M <exit 2>
$prefix\$bindir\ocamlobjinfo.byte.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlobjinfo.byte (from $prefix\$bindir\ocamlobjinfo.byte.exe) -M <exit 2>
$prefix\$bindir\ocamlobjinfo.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlobjinfo (from $prefix\$bindir\ocamlobjinfo.exe) -M <exit 2>
$prefix\$bindir\ocamlprof.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlprof (from $prefix\$bindir\ocamlprof.exe) -M <exit 2>

Testing compilation mechanisms for $prefix\$bindir
$prefix\$bindir\ocamlc.exe -where
ocamlc -where: $prefix\$libdir
ocamlopt -where: n/a
$prefix\$bindir\ocamlc.exe -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o $PWD\byt_complete_exe_shared.exe test_install_script.ml -runtime-variant _shared -output-complete-exe <exit 2>
> ** Fatal error: Cannot find file "-lcamlrun-i686-w64-mingw32-b105"
> File "test_install_script.ml", line 1:
> Error: Error while building custom runtime system
$prefix\$bindir\ocamlc.exe -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o $PWD\byt_complete_exe_static.exe test_install_script.ml -output-complete-exe
$prefix\$bindir\ocamlc.exe -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o test_install_ocaml.o test_install_script.ml -runtime-variant _shared -output-complete-obj
$CC -o $PWD\byt_complete_obj_shared.exe test_install_ocaml.o C:\builds\workspace\precheck\flambda\false\label\ocaml-mingw-32\testsuite\tools\main_in_c.o -lcamlrun_shared   -lws2_32 -lole32 -luuid -lversion -lshlwapi -lsynchronization   -l:libpthread.a -lgcc_eh
** Fatal error: Cannot find file "-lcamlrun_shared"
$prefix\$bindir\ocamlc.exe -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o test_install_ocaml.o test_install_script.ml -output-complete-obj
$CC -o $PWD\byt_complete_obj_static.exe test_install_ocaml.o C:\builds\workspace\precheck\flambda\false\label\ocaml-mingw-32\testsuite\tools\main_in_c.o -lcamlrun   -lws2_32 -lole32 -luuid -lversion -lshlwapi -lsynchronization   -l:libpthread.a -lgcc_eh
$prefix\$bindir\ocamlc.exe -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o test_install_ocaml.o test_install_script.ml -runtime-variant _shared -output-obj
$CC -o $PWD\byt_obj_shared.exe test_install_ocaml.o C:\builds\workspace\precheck\flambda\false\label\ocaml-mingw-32\testsuite\tools\main_in_c.o -lunixbyt -lcamlrun_shared   -lws2_32 -lole32 -luuid -lversion -lshlwapi -lsynchronization   -l:libpthread.a -lgcc_eh
** Fatal error: Cannot find file "-lcamlrun_shared"
$prefix\$bindir\ocamlc.exe -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o test_install_ocaml.o test_install_script.ml -output-obj
$CC -o $PWD\byt_obj_static.exe test_install_ocaml.o C:\builds\workspace\precheck\flambda\false\label\ocaml-mingw-32\testsuite\tools\main_in_c.o -lunixbyt -lcamlrun   -lws2_32 -lole32 -luuid -lversion -lshlwapi -lsynchronization   -l:libpthread.a -lgcc_eh
$prefix\$bindir\ocamlc.exe -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o $PWD\custom_shared.exe test_install_script.ml -runtime-variant _shared -custom <exit 2>
> ** Fatal error: Cannot find file "-lcamlrun-i686-w64-mingw32-b105"
> File "test_install_script.ml", line 1:
> Error: Error while building custom runtime system
$prefix\$bindir\ocamlc.exe -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o $PWD\custom_static.exe test_install_script.ml -custom
$prefix\$bindir\ocamlc.exe -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o $PWD\byt_default_exe_always.exe test_install_script.ml -runtime-search always
$prefix\$bindir\ocamlc.exe -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o $PWD\byt_default_exe_enable.exe test_install_script.ml
$prefix\$bindir\ocamlc.exe -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o $PWD\byt_default_exe_disable.exe test_install_script.ml -runtime-search disable
Running programs
$PWD\byt_default_exe_disable.exe skip $PWD\byt_default_exe_disable.exe $PWD\byt_default_exe_disable.exe true $prefix $libdir
test-prog (from $PWD\byt_default_exe_disable.exe) skip $PWD\byt_default_exe_disable.exe test-prog true $prefix $libdir
sh (from $PWD\byt_default_exe_disable.exe) skip $PWD\byt_default_exe_disable.exe sh true $prefix $libdir
.\byt_default_exe_disable (from $PWD\byt_default_exe_disable.exe) skip $PWD\byt_default_exe_disable.exe .\byt_default_exe_disable true $prefix $libdir
byt_default_exe_disable (from $PWD\byt_default_exe_disable.exe) skip $PWD\byt_default_exe_disable.exe byt_default_exe_disable true $prefix $libdir
byt_default_exe_disable (from $PWD\byt_default_exe_disable.exe) skip $PWD\byt_default_exe_disable.exe byt_default_exe_disable true $prefix $libdir

$PWD\byt_default_exe_enable.exe skip $PWD\byt_default_exe_enable.exe $PWD\byt_default_exe_enable.exe true $prefix $libdir
test-prog (from $PWD\byt_default_exe_enable.exe) skip $PWD\byt_default_exe_enable.exe test-prog true $prefix $libdir
sh (from $PWD\byt_default_exe_enable.exe) skip $PWD\byt_default_exe_enable.exe sh true $prefix $libdir
.\byt_default_exe_enable (from $PWD\byt_default_exe_enable.exe) skip $PWD\byt_default_exe_enable.exe .\byt_default_exe_enable true $prefix $libdir
byt_default_exe_enable (from $PWD\byt_default_exe_enable.exe) skip $PWD\byt_default_exe_enable.exe byt_default_exe_enable true $prefix $libdir
byt_default_exe_enable (from $PWD\byt_default_exe_enable.exe) skip $PWD\byt_default_exe_enable.exe byt_default_exe_enable true $prefix $libdir

$PWD\byt_default_exe_always.exe skip $PWD\byt_default_exe_always.exe $PWD\byt_default_exe_always.exe true $prefix $libdir
test-prog (from $PWD\byt_default_exe_always.exe) skip $PWD\byt_default_exe_always.exe test-prog true $prefix $libdir
sh (from $PWD\byt_default_exe_always.exe) skip $PWD\byt_default_exe_always.exe sh true $prefix $libdir
.\byt_default_exe_always (from $PWD\byt_default_exe_always.exe) skip $PWD\byt_default_exe_always.exe .\byt_default_exe_always true $prefix $libdir
byt_default_exe_always (from $PWD\byt_default_exe_always.exe) skip $PWD\byt_default_exe_always.exe byt_default_exe_always true $prefix $libdir
byt_default_exe_always (from $PWD\byt_default_exe_always.exe) skip $PWD\byt_default_exe_always.exe byt_default_exe_always true $prefix $libdir

$PWD\custom_static.exe skip $PWD\custom_static.exe $PWD\custom_static.exe true $prefix $libdir
test-prog (from $PWD\custom_static.exe) skip $PWD\custom_static.exe test-prog true $prefix $libdir
sh (from $PWD\custom_static.exe) skip $PWD\custom_static.exe sh true $prefix $libdir
.\custom_static (from $PWD\custom_static.exe) skip $PWD\custom_static.exe .\custom_static true $prefix $libdir
custom_static (from $PWD\custom_static.exe) skip $PWD\custom_static.exe custom_static true $prefix $libdir
custom_static (from $PWD\custom_static.exe) skip $PWD\custom_static.exe custom_static true $prefix $libdir

$PWD\byt_obj_static.exe skip $PWD\byt_obj_static.exe $PWD\byt_obj_static.exe true $prefix $libdir
test-prog (from $PWD\byt_obj_static.exe) skip $PWD\byt_obj_static.exe test-prog true $prefix $libdir
sh (from $PWD\byt_obj_static.exe) skip $PWD\byt_obj_static.exe sh true $prefix $libdir
.\byt_obj_static (from $PWD\byt_obj_static.exe) skip $PWD\byt_obj_static.exe .\byt_obj_static true $prefix $libdir
byt_obj_static (from $PWD\byt_obj_static.exe) skip $PWD\byt_obj_static.exe byt_obj_static true $prefix $libdir
byt_obj_static (from $PWD\byt_obj_static.exe) skip $PWD\byt_obj_static.exe byt_obj_static true $prefix $libdir

$PWD\byt_complete_obj_static.exe skip $PWD\byt_complete_obj_static.exe $PWD\byt_complete_obj_static.exe true $prefix $libdir
test-prog (from $PWD\byt_complete_obj_static.exe) skip $PWD\byt_complete_obj_static.exe test-prog true $prefix $libdir
sh (from $PWD\byt_complete_obj_static.exe) skip $PWD\byt_complete_obj_static.exe sh true $prefix $libdir
.\byt_complete_obj_static (from $PWD\byt_complete_obj_static.exe) skip $PWD\byt_complete_obj_static.exe .\byt_complete_obj_static true $prefix $libdir
byt_complete_obj_static (from $PWD\byt_complete_obj_static.exe) skip $PWD\byt_complete_obj_static.exe byt_complete_obj_static true $prefix $libdir
byt_complete_obj_static (from $PWD\byt_complete_obj_static.exe) skip $PWD\byt_complete_obj_static.exe byt_complete_obj_static true $prefix $libdir

$PWD\byt_complete_exe_static.exe skip $PWD\byt_complete_exe_static.exe $PWD\byt_complete_exe_static.exe true $prefix $libdir
test-prog (from $PWD\byt_complete_exe_static.exe) skip $PWD\byt_complete_exe_static.exe test-prog true $prefix $libdir
sh (from $PWD\byt_complete_exe_static.exe) skip $PWD\byt_complete_exe_static.exe sh true $prefix $libdir
.\byt_complete_exe_static (from $PWD\byt_complete_exe_static.exe) skip $PWD\byt_complete_exe_static.exe .\byt_complete_exe_static true $prefix $libdir
byt_complete_exe_static (from $PWD\byt_complete_exe_static.exe) skip $PWD\byt_complete_exe_static.exe byt_complete_exe_static true $prefix $libdir
byt_complete_exe_static (from $PWD\byt_complete_exe_static.exe) skip $PWD\byt_complete_exe_static.exe byt_complete_exe_static true $prefix $libdir

Renaming $prefix to $prefix.new

Re-running test programs
$prefix.new\$bindir\ocamlrun.exe $PWD\byt_default_exe_disable.exe skip $PWD\byt_default_exe_disable.exe $PWD\byt_default_exe_disable.exe false $prefix.new $libdir
> Environment
$prefix.new\$bindir\ocamlrun.exe $PWD\byt_default_exe_disable.exe skip $PWD\byt_default_exe_disable.exe $PWD\byt_default_exe_disable.exe false $prefix.new $libdir
$prefix.new\$bindir\ocamlrun.exe $PWD\byt_default_exe_disable.exe skip $PWD\byt_default_exe_disable.exe $PWD\byt_default_exe_disable.exe false $prefix.new $libdir
$prefix.new\$bindir\ocamlrun.exe $PWD\byt_default_exe_disable.exe skip $PWD\byt_default_exe_disable.exe $PWD\byt_default_exe_disable.exe false $prefix.new $libdir
$prefix.new\$bindir\ocamlrun.exe $PWD\byt_default_exe_disable.exe skip $PWD\byt_default_exe_disable.exe $PWD\byt_default_exe_disable.exe false $prefix.new $libdir
$prefix.new\$bindir\ocamlrun.exe $PWD\byt_default_exe_disable.exe skip $PWD\byt_default_exe_disable.exe $PWD\byt_default_exe_disable.exe false $prefix.new $libdir

CAML_LD_LIBRARY_PATH=$prefix.new\$libdir\stublibs $PWD\byt_default_exe_enable.exe skip $PWD\byt_default_exe_enable.exe $PWD\byt_default_exe_enable.exe false $prefix.new $libdir
CAML_LD_LIBRARY_PATH=$prefix.new\$libdir\stublibs test-prog (from $PWD\byt_default_exe_enable.exe) skip $PWD\byt_default_exe_enable.exe test-prog false $prefix.new $libdir
CAML_LD_LIBRARY_PATH=$prefix.new\$libdir\stublibs sh (from $PWD\byt_default_exe_enable.exe) skip $PWD\byt_default_exe_enable.exe sh false $prefix.new $libdir
CAML_LD_LIBRARY_PATH=$prefix.new\$libdir\stublibs .\byt_default_exe_enable (from $PWD\byt_default_exe_enable.exe) skip $PWD\byt_default_exe_enable.exe .\byt_default_exe_enable false $prefix.new $libdir
CAML_LD_LIBRARY_PATH=$prefix.new\$libdir\stublibs byt_default_exe_enable (from $PWD\byt_default_exe_enable.exe) skip $PWD\byt_default_exe_enable.exe byt_default_exe_enable false $prefix.new $libdir
CAML_LD_LIBRARY_PATH=$prefix.new\$libdir\stublibs byt_default_exe_enable (from $PWD\byt_default_exe_enable.exe) skip $PWD\byt_default_exe_enable.exe byt_default_exe_enable false $prefix.new $libdir

CAML_LD_LIBRARY_PATH=$prefix.new\$libdir\stublibs $PWD\byt_default_exe_always.exe skip $PWD\byt_default_exe_always.exe $PWD\byt_default_exe_always.exe false $prefix.new $libdir
CAML_LD_LIBRARY_PATH=$prefix.new\$libdir\stublibs test-prog (from $PWD\byt_default_exe_always.exe) skip $PWD\byt_default_exe_always.exe test-prog false $prefix.new $libdir
CAML_LD_LIBRARY_PATH=$prefix.new\$libdir\stublibs sh (from $PWD\byt_default_exe_always.exe) skip $PWD\byt_default_exe_always.exe sh false $prefix.new $libdir
CAML_LD_LIBRARY_PATH=$prefix.new\$libdir\stublibs .\byt_default_exe_always (from $PWD\byt_default_exe_always.exe) skip $PWD\byt_default_exe_always.exe .\byt_default_exe_always false $prefix.new $libdir
CAML_LD_LIBRARY_PATH=$prefix.new\$libdir\stublibs byt_default_exe_always (from $PWD\byt_default_exe_always.exe) skip $PWD\byt_default_exe_always.exe byt_default_exe_always false $prefix.new $libdir
CAML_LD_LIBRARY_PATH=$prefix.new\$libdir\stublibs byt_default_exe_always (from $PWD\byt_default_exe_always.exe) skip $PWD\byt_default_exe_always.exe byt_default_exe_always false $prefix.new $libdir

$PWD\custom_static.exe skip $PWD\custom_static.exe $PWD\custom_static.exe false $prefix.new $libdir
test-prog (from $PWD\custom_static.exe) skip $PWD\custom_static.exe test-prog false $prefix.new $libdir
sh (from $PWD\custom_static.exe) skip $PWD\custom_static.exe sh false $prefix.new $libdir
.\custom_static (from $PWD\custom_static.exe) skip $PWD\custom_static.exe .\custom_static false $prefix.new $libdir
custom_static (from $PWD\custom_static.exe) skip $PWD\custom_static.exe custom_static false $prefix.new $libdir
custom_static (from $PWD\custom_static.exe) skip $PWD\custom_static.exe custom_static false $prefix.new $libdir

$PWD\byt_obj_static.exe skip $PWD\byt_obj_static.exe $PWD\byt_obj_static.exe false $prefix.new $libdir
test-prog (from $PWD\byt_obj_static.exe) skip $PWD\byt_obj_static.exe test-prog false $prefix.new $libdir
sh (from $PWD\byt_obj_static.exe) skip $PWD\byt_obj_static.exe sh false $prefix.new $libdir
.\byt_obj_static (from $PWD\byt_obj_static.exe) skip $PWD\byt_obj_static.exe .\byt_obj_static false $prefix.new $libdir
byt_obj_static (from $PWD\byt_obj_static.exe) skip $PWD\byt_obj_static.exe byt_obj_static false $prefix.new $libdir
byt_obj_static (from $PWD\byt_obj_static.exe) skip $PWD\byt_obj_static.exe byt_obj_static false $prefix.new $libdir

$PWD\byt_complete_obj_static.exe skip $PWD\byt_complete_obj_static.exe $PWD\byt_complete_obj_static.exe false $prefix.new $libdir
test-prog (from $PWD\byt_complete_obj_static.exe) skip $PWD\byt_complete_obj_static.exe test-prog false $prefix.new $libdir
sh (from $PWD\byt_complete_obj_static.exe) skip $PWD\byt_complete_obj_static.exe sh false $prefix.new $libdir
.\byt_complete_obj_static (from $PWD\byt_complete_obj_static.exe) skip $PWD\byt_complete_obj_static.exe .\byt_complete_obj_static false $prefix.new $libdir
byt_complete_obj_static (from $PWD\byt_complete_obj_static.exe) skip $PWD\byt_complete_obj_static.exe byt_complete_obj_static false $prefix.new $libdir
byt_complete_obj_static (from $PWD\byt_complete_obj_static.exe) skip $PWD\byt_complete_obj_static.exe byt_complete_obj_static false $prefix.new $libdir

$PWD\byt_complete_exe_static.exe skip $PWD\byt_complete_exe_static.exe $PWD\byt_complete_exe_static.exe false $prefix.new $libdir
test-prog (from $PWD\byt_complete_exe_static.exe) skip $PWD\byt_complete_exe_static.exe test-prog false $prefix.new $libdir
sh (from $PWD\byt_complete_exe_static.exe) skip $PWD\byt_complete_exe_static.exe sh false $prefix.new $libdir
.\byt_complete_exe_static (from $PWD\byt_complete_exe_static.exe) skip $PWD\byt_complete_exe_static.exe .\byt_complete_exe_static false $prefix.new $libdir
byt_complete_exe_static (from $PWD\byt_complete_exe_static.exe) skip $PWD\byt_complete_exe_static.exe byt_complete_exe_static false $prefix.new $libdir
byt_complete_exe_static (from $PWD\byt_complete_exe_static.exe) skip $PWD\byt_complete_exe_static.exe byt_complete_exe_static false $prefix.new $libdir


Testing loading of libraries with bytecode dynlink
$prefix.new\$bindir\ocamlc.exe -set-runtime-default standard_library_default=/does-not-exist -I +dynlink dynlink.cma -linkall -o $PWD\test_script.exe test_install_script.ml
> Environment
>   PATH=$prefix.new\$bindir:$PATH
$PWD\test_script.exe runtime_events
> Loaded runtime_events.cma
$PWD\test_script.exe str
> Loaded str.cma
$PWD\test_script.exe unix threads
> Loaded unix.cma
> Loaded threads.cma
$PWD\test_script.exe unix
> Loaded unix.cma
Testing loading of libraries in $prefix.new\$bindir\ocaml.exe
$prefix.new\$bindir\ocaml.exe -noinit -no-version -noprompt test_install_script.ml
> Loaded dynlink.cma
$prefix.new\$bindir\ocaml.exe -noinit -no-version -noprompt test_install_script.ml
> Loaded runtime_events.cma
$prefix.new\$bindir\ocaml.exe -noinit -no-version -noprompt test_install_script.ml
> Loaded str.cma
$prefix.new\$bindir\ocaml.exe -noinit -no-version -noprompt test_install_script.ml
> Loaded unix.cma
> Loaded threads.cma
$prefix.new\$bindir\ocaml.exe -noinit -no-version -noprompt test_install_script.ml
> Loaded unix.cma

Testing processing of ld.conf
$prefix.new\$bindir\ocamlc.exe -I +compiler-libs ocamlcommon.cma ocamlbytecomp.cma -o $PWD\test_ld_conf.byte.exe test_install_script.ml
- Base ld.conf test
Backing up $prefix.new\$libdir\ld.conf to $prefix.new\$libdir\ld.conf.bak
$prefix.new\$bindir\ocamlrun.exe -config
$PWD\test_ld_conf.byte.exe
- Base ld.conf + CAML_LD_LIBRARY_PATH
CAML_LD_LIBRARY_PATH=;/;//;.;..;.\;..\;.\stublibs;..\stublibs;stublibs;.stublibs;..stublibs;C:\ocamlmgw-44619.new\lib\ocaml;/lib/ocaml $prefix.new\$bindir\ocamlrun.exe -config
CAML_LD_LIBRARY_PATH=;/;//;.;..;.\;..\;.\stublibs;..\stublibs;stublibs;.stublibs;..stublibs;C:\ocamlmgw-44619.new\lib\ocaml;/lib/ocaml $PWD\test_ld_conf.byte.exe
- Base ld.conf + quoted CAML_LD_LIBRARY_PATH
CAML_LD_LIBRARY_PATH="quoted";quote"in"entry;one";"entry;one";"two";three $prefix.new\$bindir\ocamlrun.exe -config
CAML_LD_LIBRARY_PATH="quoted";quote"in"entry;one";"entry;one";"two";three $PWD\test_ld_conf.byte.exe
- Base ld.conf with CRLF endings
$prefix.new\$bindir\ocamlrun.exe -config
$PWD\test_ld_conf.byte.exe
- Empty CAML_LD_LIBRARY_PATH
CAML_LD_LIBRARY_PATH= $prefix.new\$bindir\ocamlrun.exe -config
CAML_LD_LIBRARY_PATH= $PWD\test_ld_conf.byte.exe
- Embedded empty entry in CAML_LD_LIBRARY_PATH
CAML_LD_LIBRARY_PATH=; $prefix.new\$bindir\ocamlrun.exe -config
CAML_LD_LIBRARY_PATH=; $PWD\test_ld_conf.byte.exe
- Empty CAMLLIB
CAMLLIB= CAML_LD_LIBRARY_PATH=env $prefix.new\$bindir\ocamlrun.exe -config
CAMLLIB= CAML_LD_LIBRARY_PATH=env $PWD\test_ld_conf.byte.exe
- Empty OCAMLLIB
CAMLLIB=$PWD\camllib OCAMLLIB= CAML_LD_LIBRARY_PATH=env $prefix.new\$bindir\ocamlrun.exe -config
CAMLLIB=$PWD\camllib OCAMLLIB= CAML_LD_LIBRARY_PATH=env $PWD\test_ld_conf.byte.exe
- $OCAMLLIB/ld.conf
CAMLLIB=$PWD\camllib OCAMLLIB=$PWD\ocamllib CAML_LD_LIBRARY_PATH=env $prefix.new\$bindir\ocamlrun.exe -config
CAMLLIB=$PWD\camllib OCAMLLIB=$PWD\ocamllib CAML_LD_LIBRARY_PATH=env $PWD\test_ld_conf.byte.exe
- $CAMLLIB/ld.conf
CAMLLIB=$PWD\camllib CAML_LD_LIBRARY_PATH=env $prefix.new\$bindir\ocamlrun.exe -config
CAMLLIB=$PWD\camllib CAML_LD_LIBRARY_PATH=env $PWD\test_ld_conf.byte.exe
- EOF-at-EOF
$prefix.new\$bindir\ocamlrun.exe -config
$PWD\test_ld_conf.byte.exe
Restoring $prefix.new\$libdir\ld.conf.bak to $prefix.new\$libdir\ld.conf

Testing bytecode binaries in $prefix.new\$bindir
$prefix.new\$bindir\flexlink.byte.exe -vnum
  Runtime: ocamlrun-b105
  Output: 0.44
flexlink.byte (from $prefix.new\$bindir\flexlink.byte.exe) -M <exit 2>
$prefix.new\$bindir\flexlink.exe -vnum
  Runtime: ocamlrun-b105
  Output: 0.44
flexlink (from $prefix.new\$bindir\flexlink.exe) -M <exit 2>
$prefix.new\$bindir\ocaml.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocaml (from $prefix.new\$bindir\ocaml.exe) -M <exit 2>
$prefix.new\$bindir\ocamlc.byte.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlc.byte (from $prefix.new\$bindir\ocamlc.byte.exe) -M <exit 2>
$prefix.new\$bindir\ocamlc.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlc (from $prefix.new\$bindir\ocamlc.exe) -M <exit 2>
$prefix.new\$bindir\ocamlcmt.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlcmt (from $prefix.new\$bindir\ocamlcmt.exe) -M <exit 2>
$prefix.new\$bindir\ocamlcp.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlcp (from $prefix.new\$bindir\ocamlcp.exe) -M <exit 2>
$prefix.new\$bindir\ocamldebug.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamldebug (from $prefix.new\$bindir\ocamldebug.exe) -M <exit 2>
$prefix.new\$bindir\ocamldep.byte.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamldep.byte (from $prefix.new\$bindir\ocamldep.byte.exe) -M <exit 2>
$prefix.new\$bindir\ocamldep.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamldep (from $prefix.new\$bindir\ocamldep.exe) -M <exit 2>
$prefix.new\$bindir\ocamldoc.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamldoc (from $prefix.new\$bindir\ocamldoc.exe) -M <exit 2>
$prefix.new\$bindir\ocamllex.byte.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamllex.byte (from $prefix.new\$bindir\ocamllex.byte.exe) -M <exit 2>
$prefix.new\$bindir\ocamllex.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamllex (from $prefix.new\$bindir\ocamllex.exe) -M <exit 2>
$prefix.new\$bindir\ocamlmklib.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlmklib (from $prefix.new\$bindir\ocamlmklib.exe) -M <exit 4>
$prefix.new\$bindir\ocamlmktop.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlmktop (from $prefix.new\$bindir\ocamlmktop.exe) -M <exit 2>
$prefix.new\$bindir\ocamlobjinfo.byte.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlobjinfo.byte (from $prefix.new\$bindir\ocamlobjinfo.byte.exe) -M <exit 2>
$prefix.new\$bindir\ocamlobjinfo.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlobjinfo (from $prefix.new\$bindir\ocamlobjinfo.exe) -M <exit 2>
$prefix.new\$bindir\ocamlprof.exe -vnum
  Runtime: ocamlrun-b105
  Output: 5.5.0+dev0-2025-04-28
ocamlprof (from $prefix.new\$bindir\ocamlprof.exe) -M <exit 2>

Testing compilation mechanisms for $prefix.new\$bindir
$prefix.new\$bindir\ocamlc.exe -where
ocamlc -where: $prefix.new\$libdir
ocamlopt -where: n/a
$prefix.new\$bindir\ocamlc.exe -set-runtime-default R -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o $PWD\byt_complete_exe_shared.exe test_install_script.ml -runtime-variant _shared -output-complete-exe <exit 2>
> ** Fatal error: Cannot find file "-lcamlrun-i686-w64-mingw32-b105"
> File "test_install_script.ml", line 1:
> Error: Error while building custom runtime system
$prefix.new\$bindir\ocamlc.exe -set-runtime-default R -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o $PWD\byt_complete_exe_static.exe test_install_script.ml -output-complete-exe
$prefix.new\$bindir\ocamlc.exe -set-runtime-default R -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o test_install_ocaml.o test_install_script.ml -runtime-variant _shared -output-complete-obj
$CC -o $PWD\byt_complete_obj_shared.exe test_install_ocaml.o C:\builds\workspace\precheck\flambda\false\label\ocaml-mingw-32\testsuite\tools\main_in_c.o -lcamlrun_shared   -lws2_32 -lole32 -luuid -lversion -lshlwapi -lsynchronization   -l:libpthread.a -lgcc_eh
** Fatal error: Cannot find file "-lcamlrun_shared"
$prefix.new\$bindir\ocamlc.exe -set-runtime-default R -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o test_install_ocaml.o test_install_script.ml -output-complete-obj
$CC -o $PWD\byt_complete_obj_static.exe test_install_ocaml.o C:\builds\workspace\precheck\flambda\false\label\ocaml-mingw-32\testsuite\tools\main_in_c.o -lcamlrun   -lws2_32 -lole32 -luuid -lversion -lshlwapi -lsynchronization   -l:libpthread.a -lgcc_eh
$prefix.new\$bindir\ocamlc.exe -set-runtime-default R -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o test_install_ocaml.o test_install_script.ml -runtime-variant _shared -output-obj
$CC -o $PWD\byt_obj_shared.exe test_install_ocaml.o C:\builds\workspace\precheck\flambda\false\label\ocaml-mingw-32\testsuite\tools\main_in_c.o -lunixbyt -lcamlrun_shared   -lws2_32 -lole32 -luuid -lversion -lshlwapi -lsynchronization   -l:libpthread.a -lgcc_eh
** Fatal error: Cannot find file "-lcamlrun_shared"
$prefix.new\$bindir\ocamlc.exe -set-runtime-default R -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o test_install_ocaml.o test_install_script.ml -output-obj
$CC -o $PWD\byt_obj_static.exe test_install_ocaml.o C:\builds\workspace\precheck\flambda\false\label\ocaml-mingw-32\testsuite\tools\main_in_c.o -lunixbyt -lcamlrun   -lws2_32 -lole32 -luuid -lversion -lshlwapi -lsynchronization   -l:libpthread.a -lgcc_eh
$prefix.new\$bindir\ocamlc.exe -set-runtime-default R -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o $PWD\custom_shared.exe test_install_script.ml -runtime-variant _shared -custom <exit 2>
> ** Fatal error: Cannot find file "-lcamlrun-i686-w64-mingw32-b105"
> File "test_install_script.ml", line 1:
> Error: Error while building custom runtime system
$prefix.new\$bindir\ocamlc.exe -set-runtime-default R -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o $PWD\custom_static.exe test_install_script.ml -custom
$prefix.new\$bindir\ocamlc.exe -set-runtime-default R -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o $PWD\byt_default_exe_always.exe test_install_script.ml -runtime-search always
$prefix.new\$bindir\ocamlc.exe -set-runtime-default R -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o $PWD\byt_default_exe_enable.exe test_install_script.ml
$prefix.new\$bindir\ocamlc.exe -set-runtime-default R -I +compiler-libs ocamlcommon.cma -I +unix unix.cma -o $PWD\byt_default_exe_disable.exe test_install_script.ml -runtime-search disable
Running programs
$PWD\byt_default_exe_disable.exe skip $PWD\byt_default_exe_disable.exe $PWD\byt_default_exe_disable.exe true $prefix.new $libdir
test-prog (from $PWD\byt_default_exe_disable.exe) skip $PWD\byt_default_exe_disable.exe test-prog true $prefix.new $libdir
sh (from $PWD\byt_default_exe_disable.exe) skip $PWD\byt_default_exe_disable.exe sh true $prefix.new $libdir
.\byt_default_exe_disable (from $PWD\byt_default_exe_disable.exe) skip $PWD\byt_default_exe_disable.exe .\byt_default_exe_disable true $prefix.new $libdir
byt_default_exe_disable (from $PWD\byt_default_exe_disable.exe) skip $PWD\byt_default_exe_disable.exe byt_default_exe_disable true $prefix.new $libdir
byt_default_exe_disable (from $PWD\byt_default_exe_disable.exe) skip $PWD\byt_default_exe_disable.exe byt_default_exe_disable true $prefix.new $libdir

$PWD\byt_default_exe_enable.exe skip $PWD\byt_default_exe_enable.exe $PWD\byt_default_exe_enable.exe true $prefix.new $libdir
test-prog (from $PWD\byt_default_exe_enable.exe) skip $PWD\byt_default_exe_enable.exe test-prog true $prefix.new $libdir
sh (from $PWD\byt_default_exe_enable.exe) skip $PWD\byt_default_exe_enable.exe sh true $prefix.new $libdir
.\byt_default_exe_enable (from $PWD\byt_default_exe_enable.exe) skip $PWD\byt_default_exe_enable.exe .\byt_default_exe_enable true $prefix.new $libdir
byt_default_exe_enable (from $PWD\byt_default_exe_enable.exe) skip $PWD\byt_default_exe_enable.exe byt_default_exe_enable true $prefix.new $libdir
byt_default_exe_enable (from $PWD\byt_default_exe_enable.exe) skip $PWD\byt_default_exe_enable.exe byt_default_exe_enable true $prefix.new $libdir

$PWD\byt_default_exe_always.exe skip $PWD\byt_default_exe_always.exe $PWD\byt_default_exe_always.exe true $prefix.new $libdir
test-prog (from $PWD\byt_default_exe_always.exe) skip $PWD\byt_default_exe_always.exe test-prog true $prefix.new $libdir
sh (from $PWD\byt_default_exe_always.exe) skip $PWD\byt_default_exe_always.exe sh true $prefix.new $libdir
.\byt_default_exe_always (from $PWD\byt_default_exe_always.exe) skip $PWD\byt_default_exe_always.exe .\byt_default_exe_always true $prefix.new $libdir
byt_default_exe_always (from $PWD\byt_default_exe_always.exe) skip $PWD\byt_default_exe_always.exe byt_default_exe_always true $prefix.new $libdir
byt_default_exe_always (from $PWD\byt_default_exe_always.exe) skip $PWD\byt_default_exe_always.exe byt_default_exe_always true $prefix.new $libdir

$PWD\custom_static.exe skip $PWD\custom_static.exe $PWD\custom_static.exe true $prefix.new $libdir
test-prog (from $PWD\custom_static.exe) skip $PWD\custom_static.exe test-prog true $prefix.new $libdir
sh (from $PWD\custom_static.exe) skip $PWD\custom_static.exe sh true $prefix.new $libdir
.\custom_static (from $PWD\custom_static.exe) skip $PWD\custom_static.exe .\custom_static true $prefix.new $libdir
custom_static (from $PWD\custom_static.exe) skip $PWD\custom_static.exe custom_static true $prefix.new $libdir
custom_static (from $PWD\custom_static.exe) skip $PWD\custom_static.exe custom_static true $prefix.new $libdir

$PWD\byt_obj_static.exe skip $PWD\byt_obj_static.exe $PWD\byt_obj_static.exe true $prefix.new $libdir
test-prog (from $PWD\byt_obj_static.exe) skip $PWD\byt_obj_static.exe test-prog true $prefix.new $libdir
sh (from $PWD\byt_obj_static.exe) skip $PWD\byt_obj_static.exe sh true $prefix.new $libdir
.\byt_obj_static (from $PWD\byt_obj_static.exe) skip $PWD\byt_obj_static.exe .\byt_obj_static true $prefix.new $libdir
byt_obj_static (from $PWD\byt_obj_static.exe) skip $PWD\byt_obj_static.exe byt_obj_static true $prefix.new $libdir
byt_obj_static (from $PWD\byt_obj_static.exe) skip $PWD\byt_obj_static.exe byt_obj_static true $prefix.new $libdir

$PWD\byt_complete_obj_static.exe skip $PWD\byt_complete_obj_static.exe $PWD\byt_complete_obj_static.exe true $prefix.new $libdir
test-prog (from $PWD\byt_complete_obj_static.exe) skip $PWD\byt_complete_obj_static.exe test-prog true $prefix.new $libdir
sh (from $PWD\byt_complete_obj_static.exe) skip $PWD\byt_complete_obj_static.exe sh true $prefix.new $libdir
.\byt_complete_obj_static (from $PWD\byt_complete_obj_static.exe) skip $PWD\byt_complete_obj_static.exe .\byt_complete_obj_static true $prefix.new $libdir
byt_complete_obj_static (from $PWD\byt_complete_obj_static.exe) skip $PWD\byt_complete_obj_static.exe byt_complete_obj_static true $prefix.new $libdir
byt_complete_obj_static (from $PWD\byt_complete_obj_static.exe) skip $PWD\byt_complete_obj_static.exe byt_complete_obj_static true $prefix.new $libdir

$PWD\byt_complete_exe_static.exe skip $PWD\byt_complete_exe_static.exe $PWD\byt_complete_exe_static.exe true $prefix.new $libdir
test-prog (from $PWD\byt_complete_exe_static.exe) skip $PWD\byt_complete_exe_static.exe test-prog true $prefix.new $libdir
sh (from $PWD\byt_complete_exe_static.exe) skip $PWD\byt_complete_exe_static.exe sh true $prefix.new $libdir
.\byt_complete_exe_static (from $PWD\byt_complete_exe_static.exe) skip $PWD\byt_complete_exe_static.exe .\byt_complete_exe_static true $prefix.new $libdir
byt_complete_exe_static (from $PWD\byt_complete_exe_static.exe) skip $PWD\byt_complete_exe_static.exe byt_complete_exe_static true $prefix.new $libdir
byt_complete_exe_static (from $PWD\byt_complete_exe_static.exe) skip $PWD\byt_complete_exe_static.exe byt_complete_exe_static true $prefix.new $libdir

Restoring $prefix.new to $prefix
make: Leaving directory '/cygdrive/c/builds/workspace/precheck/flambda/false/label/ocaml-mingw-32/testsuite/in_prefix'
+ rm -rf C:/ocamlmgw-44619
+ false
Email was triggered for: Always
Sending email for trigger: Always
Sending email to: david@tarides.com
Finished: SUCCESS