1#! /bin/sh
2# Guess values for system-dependent variables and create Makefiles.
3# Generated by GNU Autoconf 2.71 for Haskell unix package 2.0.
4#
5# Report bugs to <libraries@haskell.org>.
6#
7#
8# Copyright (C) 1992-1996, 1998-2017, 2020-2021 Free Software Foundation,
9# Inc.
10#
11#
12# This configure script is free software; the Free Software Foundation
13# gives unlimited permission to copy, distribute and modify it.
14## -------------------- ##
15## M4sh Initialization. ##
16## -------------------- ##
17
18# Be more Bourne compatible
19DUALCASE=1; export DUALCASE # for MKS sh
20as_nop=:
21if test ${ZSH_VERSION+y} && (emulate sh) >/dev/null 2>&1
22then :
23  emulate sh
24  NULLCMD=:
25  # Pre-4.2 versions of Zsh do word splitting on ${1+"$@"}, which
26  # is contrary to our usage.  Disable this feature.
27  alias -g '${1+"$@"}'='"$@"'
28  setopt NO_GLOB_SUBST
29else $as_nop
30  case `(set -o) 2>/dev/null` in #(
31  *posix*) :
32    set -o posix ;; #(
33  *) :
34     ;;
35esac
36fi
37
38
39
40# Reset variables that may have inherited troublesome values from
41# the environment.
42
43# IFS needs to be set, to space, tab, and newline, in precisely that order.
44# (If _AS_PATH_WALK were called with IFS unset, it would have the
45# side effect of setting IFS to empty, thus disabling word splitting.)
46# Quoting is to prevent editors from complaining about space-tab.
47as_nl='
48'
49export as_nl
50IFS=" ""	$as_nl"
51
52PS1='$ '
53PS2='> '
54PS4='+ '
55
56# Ensure predictable behavior from utilities with locale-dependent output.
57LC_ALL=C
58export LC_ALL
59LANGUAGE=C
60export LANGUAGE
61
62# We cannot yet rely on "unset" to work, but we need these variables
63# to be unset--not just set to an empty or harmless value--now, to
64# avoid bugs in old shells (e.g. pre-3.0 UWIN ksh).  This construct
65# also avoids known problems related to "unset" and subshell syntax
66# in other old shells (e.g. bash 2.01 and pdksh 5.2.14).
67for as_var in BASH_ENV ENV MAIL MAILPATH CDPATH
68do eval test \${$as_var+y} \
69  && ( (unset $as_var) || exit 1) >/dev/null 2>&1 && unset $as_var || :
70done
71
72# Ensure that fds 0, 1, and 2 are open.
73if (exec 3>&0) 2>/dev/null; then :; else exec 0</dev/null; fi
74if (exec 3>&1) 2>/dev/null; then :; else exec 1>/dev/null; fi
75if (exec 3>&2)            ; then :; else exec 2>/dev/null; fi
76
77# The user is always right.
78if ${PATH_SEPARATOR+false} :; then
79  PATH_SEPARATOR=:
80  (PATH='/bin;/bin'; FPATH=$PATH; sh -c :) >/dev/null 2>&1 && {
81    (PATH='/bin:/bin'; FPATH=$PATH; sh -c :) >/dev/null 2>&1 ||
82      PATH_SEPARATOR=';'
83  }
84fi
85
86
87# Find who we are.  Look in the path if we contain no directory separator.
88as_myself=
89case $0 in #((
90  *[\\/]* ) as_myself=$0 ;;
91  *) as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
92for as_dir in $PATH
93do
94  IFS=$as_save_IFS
95  case $as_dir in #(((
96    '') as_dir=./ ;;
97    */) ;;
98    *) as_dir=$as_dir/ ;;
99  esac
100    test -r "$as_dir$0" && as_myself=$as_dir$0 && break
101  done
102IFS=$as_save_IFS
103
104     ;;
105esac
106# We did not find ourselves, most probably we were run as `sh COMMAND'
107# in which case we are not to be found in the path.
108if test "x$as_myself" = x; then
109  as_myself=$0
110fi
111if test ! -f "$as_myself"; then
112  printf "%s\n" "$as_myself: error: cannot find myself; rerun with an absolute file name" >&2
113  exit 1
114fi
115
116
117# Use a proper internal environment variable to ensure we don't fall
118  # into an infinite loop, continuously re-executing ourselves.
119  if test x"${_as_can_reexec}" != xno && test "x$CONFIG_SHELL" != x; then
120    _as_can_reexec=no; export _as_can_reexec;
121    # We cannot yet assume a decent shell, so we have to provide a
122# neutralization value for shells without unset; and this also
123# works around shells that cannot unset nonexistent variables.
124# Preserve -v and -x to the replacement shell.
125BASH_ENV=/dev/null
126ENV=/dev/null
127(unset BASH_ENV) >/dev/null 2>&1 && unset BASH_ENV ENV
128case $- in # ((((
129  *v*x* | *x*v* ) as_opts=-vx ;;
130  *v* ) as_opts=-v ;;
131  *x* ) as_opts=-x ;;
132  * ) as_opts= ;;
133esac
134exec $CONFIG_SHELL $as_opts "$as_myself" ${1+"$@"}
135# Admittedly, this is quite paranoid, since all the known shells bail
136# out after a failed `exec'.
137printf "%s\n" "$0: could not re-execute with $CONFIG_SHELL" >&2
138exit 255
139  fi
140  # We don't want this to propagate to other subprocesses.
141          { _as_can_reexec=; unset _as_can_reexec;}
142if test "x$CONFIG_SHELL" = x; then
143  as_bourne_compatible="as_nop=:
144if test \${ZSH_VERSION+y} && (emulate sh) >/dev/null 2>&1
145then :
146  emulate sh
147  NULLCMD=:
148  # Pre-4.2 versions of Zsh do word splitting on \${1+\"\$@\"}, which
149  # is contrary to our usage.  Disable this feature.
150  alias -g '\${1+\"\$@\"}'='\"\$@\"'
151  setopt NO_GLOB_SUBST
152else \$as_nop
153  case \`(set -o) 2>/dev/null\` in #(
154  *posix*) :
155    set -o posix ;; #(
156  *) :
157     ;;
158esac
159fi
160"
161  as_required="as_fn_return () { (exit \$1); }
162as_fn_success () { as_fn_return 0; }
163as_fn_failure () { as_fn_return 1; }
164as_fn_ret_success () { return 0; }
165as_fn_ret_failure () { return 1; }
166
167exitcode=0
168as_fn_success || { exitcode=1; echo as_fn_success failed.; }
169as_fn_failure && { exitcode=1; echo as_fn_failure succeeded.; }
170as_fn_ret_success || { exitcode=1; echo as_fn_ret_success failed.; }
171as_fn_ret_failure && { exitcode=1; echo as_fn_ret_failure succeeded.; }
172if ( set x; as_fn_ret_success y && test x = \"\$1\" )
173then :
174
175else \$as_nop
176  exitcode=1; echo positional parameters were not saved.
177fi
178test x\$exitcode = x0 || exit 1
179blah=\$(echo \$(echo blah))
180test x\"\$blah\" = xblah || exit 1
181test -x / || exit 1"
182  as_suggested="  as_lineno_1=";as_suggested=$as_suggested$LINENO;as_suggested=$as_suggested" as_lineno_1a=\$LINENO
183  as_lineno_2=";as_suggested=$as_suggested$LINENO;as_suggested=$as_suggested" as_lineno_2a=\$LINENO
184  eval 'test \"x\$as_lineno_1'\$as_run'\" != \"x\$as_lineno_2'\$as_run'\" &&
185  test \"x\`expr \$as_lineno_1'\$as_run' + 1\`\" = \"x\$as_lineno_2'\$as_run'\"' || exit 1
186test \$(( 1 + 1 )) = 2 || exit 1"
187  if (eval "$as_required") 2>/dev/null
188then :
189  as_have_required=yes
190else $as_nop
191  as_have_required=no
192fi
193  if test x$as_have_required = xyes && (eval "$as_suggested") 2>/dev/null
194then :
195
196else $as_nop
197  as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
198as_found=false
199for as_dir in /bin$PATH_SEPARATOR/usr/bin$PATH_SEPARATOR$PATH
200do
201  IFS=$as_save_IFS
202  case $as_dir in #(((
203    '') as_dir=./ ;;
204    */) ;;
205    *) as_dir=$as_dir/ ;;
206  esac
207  as_found=:
208  case $as_dir in #(
209	 /*)
210	   for as_base in sh bash ksh sh5; do
211	     # Try only shells that exist, to save several forks.
212	     as_shell=$as_dir$as_base
213	     if { test -f "$as_shell" || test -f "$as_shell.exe"; } &&
214		    as_run=a "$as_shell" -c "$as_bourne_compatible""$as_required" 2>/dev/null
215then :
216  CONFIG_SHELL=$as_shell as_have_required=yes
217		   if as_run=a "$as_shell" -c "$as_bourne_compatible""$as_suggested" 2>/dev/null
218then :
219  break 2
220fi
221fi
222	   done;;
223       esac
224  as_found=false
225done
226IFS=$as_save_IFS
227if $as_found
228then :
229
230else $as_nop
231  if { test -f "$SHELL" || test -f "$SHELL.exe"; } &&
232	      as_run=a "$SHELL" -c "$as_bourne_compatible""$as_required" 2>/dev/null
233then :
234  CONFIG_SHELL=$SHELL as_have_required=yes
235fi
236fi
237
238
239      if test "x$CONFIG_SHELL" != x
240then :
241  export CONFIG_SHELL
242             # We cannot yet assume a decent shell, so we have to provide a
243# neutralization value for shells without unset; and this also
244# works around shells that cannot unset nonexistent variables.
245# Preserve -v and -x to the replacement shell.
246BASH_ENV=/dev/null
247ENV=/dev/null
248(unset BASH_ENV) >/dev/null 2>&1 && unset BASH_ENV ENV
249case $- in # ((((
250  *v*x* | *x*v* ) as_opts=-vx ;;
251  *v* ) as_opts=-v ;;
252  *x* ) as_opts=-x ;;
253  * ) as_opts= ;;
254esac
255exec $CONFIG_SHELL $as_opts "$as_myself" ${1+"$@"}
256# Admittedly, this is quite paranoid, since all the known shells bail
257# out after a failed `exec'.
258printf "%s\n" "$0: could not re-execute with $CONFIG_SHELL" >&2
259exit 255
260fi
261
262    if test x$as_have_required = xno
263then :
264  printf "%s\n" "$0: This script requires a shell more modern than all"
265  printf "%s\n" "$0: the shells that I found on your system."
266  if test ${ZSH_VERSION+y} ; then
267    printf "%s\n" "$0: In particular, zsh $ZSH_VERSION has bugs and should"
268    printf "%s\n" "$0: be upgraded to zsh 4.3.4 or later."
269  else
270    printf "%s\n" "$0: Please tell bug-autoconf@gnu.org and
271$0: libraries@haskell.org about your system, including any
272$0: error possibly output before this message. Then install
273$0: a modern shell, or manually run the script under such a
274$0: shell if you do have one."
275  fi
276  exit 1
277fi
278fi
279fi
280SHELL=${CONFIG_SHELL-/bin/sh}
281export SHELL
282# Unset more variables known to interfere with behavior of common tools.
283CLICOLOR_FORCE= GREP_OPTIONS=
284unset CLICOLOR_FORCE GREP_OPTIONS
285
286## --------------------- ##
287## M4sh Shell Functions. ##
288## --------------------- ##
289# as_fn_unset VAR
290# ---------------
291# Portably unset VAR.
292as_fn_unset ()
293{
294  { eval $1=; unset $1;}
295}
296as_unset=as_fn_unset
297
298
299# as_fn_set_status STATUS
300# -----------------------
301# Set $? to STATUS, without forking.
302as_fn_set_status ()
303{
304  return $1
305} # as_fn_set_status
306
307# as_fn_exit STATUS
308# -----------------
309# Exit the shell with STATUS, even in a "trap 0" or "set -e" context.
310as_fn_exit ()
311{
312  set +e
313  as_fn_set_status $1
314  exit $1
315} # as_fn_exit
316# as_fn_nop
317# ---------
318# Do nothing but, unlike ":", preserve the value of $?.
319as_fn_nop ()
320{
321  return $?
322}
323as_nop=as_fn_nop
324
325# as_fn_mkdir_p
326# -------------
327# Create "$as_dir" as a directory, including parents if necessary.
328as_fn_mkdir_p ()
329{
330
331  case $as_dir in #(
332  -*) as_dir=./$as_dir;;
333  esac
334  test -d "$as_dir" || eval $as_mkdir_p || {
335    as_dirs=
336    while :; do
337      case $as_dir in #(
338      *\'*) as_qdir=`printf "%s\n" "$as_dir" | sed "s/'/'\\\\\\\\''/g"`;; #'(
339      *) as_qdir=$as_dir;;
340      esac
341      as_dirs="'$as_qdir' $as_dirs"
342      as_dir=`$as_dirname -- "$as_dir" ||
343$as_expr X"$as_dir" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
344	 X"$as_dir" : 'X\(//\)[^/]' \| \
345	 X"$as_dir" : 'X\(//\)$' \| \
346	 X"$as_dir" : 'X\(/\)' \| . 2>/dev/null ||
347printf "%s\n" X"$as_dir" |
348    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
349	    s//\1/
350	    q
351	  }
352	  /^X\(\/\/\)[^/].*/{
353	    s//\1/
354	    q
355	  }
356	  /^X\(\/\/\)$/{
357	    s//\1/
358	    q
359	  }
360	  /^X\(\/\).*/{
361	    s//\1/
362	    q
363	  }
364	  s/.*/./; q'`
365      test -d "$as_dir" && break
366    done
367    test -z "$as_dirs" || eval "mkdir $as_dirs"
368  } || test -d "$as_dir" || as_fn_error $? "cannot create directory $as_dir"
369
370
371} # as_fn_mkdir_p
372
373# as_fn_executable_p FILE
374# -----------------------
375# Test if FILE is an executable regular file.
376as_fn_executable_p ()
377{
378  test -f "$1" && test -x "$1"
379} # as_fn_executable_p
380# as_fn_append VAR VALUE
381# ----------------------
382# Append the text in VALUE to the end of the definition contained in VAR. Take
383# advantage of any shell optimizations that allow amortized linear growth over
384# repeated appends, instead of the typical quadratic growth present in naive
385# implementations.
386if (eval "as_var=1; as_var+=2; test x\$as_var = x12") 2>/dev/null
387then :
388  eval 'as_fn_append ()
389  {
390    eval $1+=\$2
391  }'
392else $as_nop
393  as_fn_append ()
394  {
395    eval $1=\$$1\$2
396  }
397fi # as_fn_append
398
399# as_fn_arith ARG...
400# ------------------
401# Perform arithmetic evaluation on the ARGs, and store the result in the
402# global $as_val. Take advantage of shells that can avoid forks. The arguments
403# must be portable across $(()) and expr.
404if (eval "test \$(( 1 + 1 )) = 2") 2>/dev/null
405then :
406  eval 'as_fn_arith ()
407  {
408    as_val=$(( $* ))
409  }'
410else $as_nop
411  as_fn_arith ()
412  {
413    as_val=`expr "$@" || test $? -eq 1`
414  }
415fi # as_fn_arith
416
417# as_fn_nop
418# ---------
419# Do nothing but, unlike ":", preserve the value of $?.
420as_fn_nop ()
421{
422  return $?
423}
424as_nop=as_fn_nop
425
426# as_fn_error STATUS ERROR [LINENO LOG_FD]
427# ----------------------------------------
428# Output "`basename $0`: error: ERROR" to stderr. If LINENO and LOG_FD are
429# provided, also output the error to LOG_FD, referencing LINENO. Then exit the
430# script with STATUS, using 1 if that was 0.
431as_fn_error ()
432{
433  as_status=$1; test $as_status -eq 0 && as_status=1
434  if test "$4"; then
435    as_lineno=${as_lineno-"$3"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
436    printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: $2" >&$4
437  fi
438  printf "%s\n" "$as_me: error: $2" >&2
439  as_fn_exit $as_status
440} # as_fn_error
441
442if expr a : '\(a\)' >/dev/null 2>&1 &&
443   test "X`expr 00001 : '.*\(...\)'`" = X001; then
444  as_expr=expr
445else
446  as_expr=false
447fi
448
449if (basename -- /) >/dev/null 2>&1 && test "X`basename -- / 2>&1`" = "X/"; then
450  as_basename=basename
451else
452  as_basename=false
453fi
454
455if (as_dir=`dirname -- /` && test "X$as_dir" = X/) >/dev/null 2>&1; then
456  as_dirname=dirname
457else
458  as_dirname=false
459fi
460
461as_me=`$as_basename -- "$0" ||
462$as_expr X/"$0" : '.*/\([^/][^/]*\)/*$' \| \
463	 X"$0" : 'X\(//\)$' \| \
464	 X"$0" : 'X\(/\)' \| . 2>/dev/null ||
465printf "%s\n" X/"$0" |
466    sed '/^.*\/\([^/][^/]*\)\/*$/{
467	    s//\1/
468	    q
469	  }
470	  /^X\/\(\/\/\)$/{
471	    s//\1/
472	    q
473	  }
474	  /^X\/\(\/\).*/{
475	    s//\1/
476	    q
477	  }
478	  s/.*/./; q'`
479
480# Avoid depending upon Character Ranges.
481as_cr_letters='abcdefghijklmnopqrstuvwxyz'
482as_cr_LETTERS='ABCDEFGHIJKLMNOPQRSTUVWXYZ'
483as_cr_Letters=$as_cr_letters$as_cr_LETTERS
484as_cr_digits='0123456789'
485as_cr_alnum=$as_cr_Letters$as_cr_digits
486
487
488  as_lineno_1=$LINENO as_lineno_1a=$LINENO
489  as_lineno_2=$LINENO as_lineno_2a=$LINENO
490  eval 'test "x$as_lineno_1'$as_run'" != "x$as_lineno_2'$as_run'" &&
491  test "x`expr $as_lineno_1'$as_run' + 1`" = "x$as_lineno_2'$as_run'"' || {
492  # Blame Lee E. McMahon (1931-1989) for sed's syntax.  :-)
493  sed -n '
494    p
495    /[$]LINENO/=
496  ' <$as_myself |
497    sed '
498      s/[$]LINENO.*/&-/
499      t lineno
500      b
501      :lineno
502      N
503      :loop
504      s/[$]LINENO\([^'$as_cr_alnum'_].*\n\)\(.*\)/\2\1\2/
505      t loop
506      s/-\n.*//
507    ' >$as_me.lineno &&
508  chmod +x "$as_me.lineno" ||
509    { printf "%s\n" "$as_me: error: cannot create $as_me.lineno; rerun with a POSIX shell" >&2; as_fn_exit 1; }
510
511  # If we had to re-execute with $CONFIG_SHELL, we're ensured to have
512  # already done that, so ensure we don't try to do so again and fall
513  # in an infinite loop.  This has already happened in practice.
514  _as_can_reexec=no; export _as_can_reexec
515  # Don't try to exec as it changes $[0], causing all sort of problems
516  # (the dirname of $[0] is not the place where we might find the
517  # original and so on.  Autoconf is especially sensitive to this).
518  . "./$as_me.lineno"
519  # Exit status is that of the last command.
520  exit
521}
522
523
524# Determine whether it's possible to make 'echo' print without a newline.
525# These variables are no longer used directly by Autoconf, but are AC_SUBSTed
526# for compatibility with existing Makefiles.
527ECHO_C= ECHO_N= ECHO_T=
528case `echo -n x` in #(((((
529-n*)
530  case `echo 'xy\c'` in
531  *c*) ECHO_T='	';;	# ECHO_T is single tab character.
532  xy)  ECHO_C='\c';;
533  *)   echo `echo ksh88 bug on AIX 6.1` > /dev/null
534       ECHO_T='	';;
535  esac;;
536*)
537  ECHO_N='-n';;
538esac
539
540# For backward compatibility with old third-party macros, we provide
541# the shell variables $as_echo and $as_echo_n.  New code should use
542# AS_ECHO(["message"]) and AS_ECHO_N(["message"]), respectively.
543as_echo='printf %s\n'
544as_echo_n='printf %s'
545
546
547rm -f conf$$ conf$$.exe conf$$.file
548if test -d conf$$.dir; then
549  rm -f conf$$.dir/conf$$.file
550else
551  rm -f conf$$.dir
552  mkdir conf$$.dir 2>/dev/null
553fi
554if (echo >conf$$.file) 2>/dev/null; then
555  if ln -s conf$$.file conf$$ 2>/dev/null; then
556    as_ln_s='ln -s'
557    # ... but there are two gotchas:
558    # 1) On MSYS, both `ln -s file dir' and `ln file dir' fail.
559    # 2) DJGPP < 2.04 has no symlinks; `ln -s' creates a wrapper executable.
560    # In both cases, we have to default to `cp -pR'.
561    ln -s conf$$.file conf$$.dir 2>/dev/null && test ! -f conf$$.exe ||
562      as_ln_s='cp -pR'
563  elif ln conf$$.file conf$$ 2>/dev/null; then
564    as_ln_s=ln
565  else
566    as_ln_s='cp -pR'
567  fi
568else
569  as_ln_s='cp -pR'
570fi
571rm -f conf$$ conf$$.exe conf$$.dir/conf$$.file conf$$.file
572rmdir conf$$.dir 2>/dev/null
573
574if mkdir -p . 2>/dev/null; then
575  as_mkdir_p='mkdir -p "$as_dir"'
576else
577  test -d ./-p && rmdir ./-p
578  as_mkdir_p=false
579fi
580
581as_test_x='test -x'
582as_executable_p=as_fn_executable_p
583
584# Sed expression to map a string onto a valid CPP name.
585as_tr_cpp="eval sed 'y%*$as_cr_letters%P$as_cr_LETTERS%;s%[^_$as_cr_alnum]%_%g'"
586
587# Sed expression to map a string onto a valid variable name.
588as_tr_sh="eval sed 'y%*+%pp%;s%[^_$as_cr_alnum]%_%g'"
589
590
591test -n "$DJDIR" || exec 7<&0 </dev/null
592exec 6>&1
593
594# Name of the host.
595# hostname on some systems (SVR3.2, old GNU/Linux) returns a bogus exit status,
596# so uname gets run too.
597ac_hostname=`(hostname || uname -n) 2>/dev/null | sed 1q`
598
599#
600# Initializations.
601#
602ac_default_prefix=/usr/local
603ac_clean_files=
604ac_config_libobj_dir=.
605LIBOBJS=
606cross_compiling=no
607subdirs=
608MFLAGS=
609MAKEFLAGS=
610
611# Identity of this package.
612PACKAGE_NAME='Haskell unix package'
613PACKAGE_TARNAME='unix'
614PACKAGE_VERSION='2.0'
615PACKAGE_STRING='Haskell unix package 2.0'
616PACKAGE_BUGREPORT='libraries@haskell.org'
617PACKAGE_URL=''
618
619ac_unique_file="include/HsUnix.h"
620# Factoring default headers for most tests.
621ac_includes_default="\
622#include <stddef.h>
623#ifdef HAVE_STDIO_H
624# include <stdio.h>
625#endif
626#ifdef HAVE_STDLIB_H
627# include <stdlib.h>
628#endif
629#ifdef HAVE_STRING_H
630# include <string.h>
631#endif
632#ifdef HAVE_INTTYPES_H
633# include <inttypes.h>
634#endif
635#ifdef HAVE_STDINT_H
636# include <stdint.h>
637#endif
638#ifdef HAVE_STRINGS_H
639# include <strings.h>
640#endif
641#ifdef HAVE_SYS_TYPES_H
642# include <sys/types.h>
643#endif
644#ifdef HAVE_SYS_STAT_H
645# include <sys/stat.h>
646#endif
647#ifdef HAVE_UNISTD_H
648# include <unistd.h>
649#endif"
650
651ac_header_c_list=
652ac_subst_vars='LTLIBOBJS
653LIBOBJS
654EXTRA_LIBS
655EGREP
656GREP
657CPP
658target_os
659target_vendor
660target_cpu
661target
662host_os
663host_vendor
664host_cpu
665host
666build_os
667build_vendor
668build_cpu
669build
670BUILD_PACKAGE_BOOL
671OBJEXT
672EXEEXT
673ac_ct_CC
674CPPFLAGS
675LDFLAGS
676CFLAGS
677CC
678target_alias
679host_alias
680build_alias
681LIBS
682ECHO_T
683ECHO_N
684ECHO_C
685DEFS
686mandir
687localedir
688libdir
689psdir
690pdfdir
691dvidir
692htmldir
693infodir
694docdir
695oldincludedir
696includedir
697runstatedir
698localstatedir
699sharedstatedir
700sysconfdir
701datadir
702datarootdir
703libexecdir
704sbindir
705bindir
706program_transform_name
707prefix
708exec_prefix
709PACKAGE_URL
710PACKAGE_BUGREPORT
711PACKAGE_STRING
712PACKAGE_VERSION
713PACKAGE_TARNAME
714PACKAGE_NAME
715PATH_SEPARATOR
716SHELL'
717ac_subst_files=''
718ac_user_opts='
719enable_option_checking
720enable_largefile
721'
722      ac_precious_vars='build_alias
723host_alias
724target_alias
725CC
726CFLAGS
727LDFLAGS
728LIBS
729CPPFLAGS
730CPP'
731
732
733# Initialize some variables set by options.
734ac_init_help=
735ac_init_version=false
736ac_unrecognized_opts=
737ac_unrecognized_sep=
738# The variables have the same names as the options, with
739# dashes changed to underlines.
740cache_file=/dev/null
741exec_prefix=NONE
742no_create=
743no_recursion=
744prefix=NONE
745program_prefix=NONE
746program_suffix=NONE
747program_transform_name=s,x,x,
748silent=
749site=
750srcdir=
751verbose=
752x_includes=NONE
753x_libraries=NONE
754
755# Installation directory options.
756# These are left unexpanded so users can "make install exec_prefix=/foo"
757# and all the variables that are supposed to be based on exec_prefix
758# by default will actually change.
759# Use braces instead of parens because sh, perl, etc. also accept them.
760# (The list follows the same order as the GNU Coding Standards.)
761bindir='${exec_prefix}/bin'
762sbindir='${exec_prefix}/sbin'
763libexecdir='${exec_prefix}/libexec'
764datarootdir='${prefix}/share'
765datadir='${datarootdir}'
766sysconfdir='${prefix}/etc'
767sharedstatedir='${prefix}/com'
768localstatedir='${prefix}/var'
769runstatedir='${localstatedir}/run'
770includedir='${prefix}/include'
771oldincludedir='/usr/include'
772docdir='${datarootdir}/doc/${PACKAGE_TARNAME}'
773infodir='${datarootdir}/info'
774htmldir='${docdir}'
775dvidir='${docdir}'
776pdfdir='${docdir}'
777psdir='${docdir}'
778libdir='${exec_prefix}/lib'
779localedir='${datarootdir}/locale'
780mandir='${datarootdir}/man'
781
782ac_prev=
783ac_dashdash=
784for ac_option
785do
786  # If the previous option needs an argument, assign it.
787  if test -n "$ac_prev"; then
788    eval $ac_prev=\$ac_option
789    ac_prev=
790    continue
791  fi
792
793  case $ac_option in
794  *=?*) ac_optarg=`expr "X$ac_option" : '[^=]*=\(.*\)'` ;;
795  *=)   ac_optarg= ;;
796  *)    ac_optarg=yes ;;
797  esac
798
799  case $ac_dashdash$ac_option in
800  --)
801    ac_dashdash=yes ;;
802
803  -bindir | --bindir | --bindi | --bind | --bin | --bi)
804    ac_prev=bindir ;;
805  -bindir=* | --bindir=* | --bindi=* | --bind=* | --bin=* | --bi=*)
806    bindir=$ac_optarg ;;
807
808  -build | --build | --buil | --bui | --bu)
809    ac_prev=build_alias ;;
810  -build=* | --build=* | --buil=* | --bui=* | --bu=*)
811    build_alias=$ac_optarg ;;
812
813  -cache-file | --cache-file | --cache-fil | --cache-fi \
814  | --cache-f | --cache- | --cache | --cach | --cac | --ca | --c)
815    ac_prev=cache_file ;;
816  -cache-file=* | --cache-file=* | --cache-fil=* | --cache-fi=* \
817  | --cache-f=* | --cache-=* | --cache=* | --cach=* | --cac=* | --ca=* | --c=*)
818    cache_file=$ac_optarg ;;
819
820  --config-cache | -C)
821    cache_file=config.cache ;;
822
823  -datadir | --datadir | --datadi | --datad)
824    ac_prev=datadir ;;
825  -datadir=* | --datadir=* | --datadi=* | --datad=*)
826    datadir=$ac_optarg ;;
827
828  -datarootdir | --datarootdir | --datarootdi | --datarootd | --dataroot \
829  | --dataroo | --dataro | --datar)
830    ac_prev=datarootdir ;;
831  -datarootdir=* | --datarootdir=* | --datarootdi=* | --datarootd=* \
832  | --dataroot=* | --dataroo=* | --dataro=* | --datar=*)
833    datarootdir=$ac_optarg ;;
834
835  -disable-* | --disable-*)
836    ac_useropt=`expr "x$ac_option" : 'x-*disable-\(.*\)'`
837    # Reject names that are not valid shell variable names.
838    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
839      as_fn_error $? "invalid feature name: \`$ac_useropt'"
840    ac_useropt_orig=$ac_useropt
841    ac_useropt=`printf "%s\n" "$ac_useropt" | sed 's/[-+.]/_/g'`
842    case $ac_user_opts in
843      *"
844"enable_$ac_useropt"
845"*) ;;
846      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--disable-$ac_useropt_orig"
847	 ac_unrecognized_sep=', ';;
848    esac
849    eval enable_$ac_useropt=no ;;
850
851  -docdir | --docdir | --docdi | --doc | --do)
852    ac_prev=docdir ;;
853  -docdir=* | --docdir=* | --docdi=* | --doc=* | --do=*)
854    docdir=$ac_optarg ;;
855
856  -dvidir | --dvidir | --dvidi | --dvid | --dvi | --dv)
857    ac_prev=dvidir ;;
858  -dvidir=* | --dvidir=* | --dvidi=* | --dvid=* | --dvi=* | --dv=*)
859    dvidir=$ac_optarg ;;
860
861  -enable-* | --enable-*)
862    ac_useropt=`expr "x$ac_option" : 'x-*enable-\([^=]*\)'`
863    # Reject names that are not valid shell variable names.
864    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
865      as_fn_error $? "invalid feature name: \`$ac_useropt'"
866    ac_useropt_orig=$ac_useropt
867    ac_useropt=`printf "%s\n" "$ac_useropt" | sed 's/[-+.]/_/g'`
868    case $ac_user_opts in
869      *"
870"enable_$ac_useropt"
871"*) ;;
872      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--enable-$ac_useropt_orig"
873	 ac_unrecognized_sep=', ';;
874    esac
875    eval enable_$ac_useropt=\$ac_optarg ;;
876
877  -exec-prefix | --exec_prefix | --exec-prefix | --exec-prefi \
878  | --exec-pref | --exec-pre | --exec-pr | --exec-p | --exec- \
879  | --exec | --exe | --ex)
880    ac_prev=exec_prefix ;;
881  -exec-prefix=* | --exec_prefix=* | --exec-prefix=* | --exec-prefi=* \
882  | --exec-pref=* | --exec-pre=* | --exec-pr=* | --exec-p=* | --exec-=* \
883  | --exec=* | --exe=* | --ex=*)
884    exec_prefix=$ac_optarg ;;
885
886  -gas | --gas | --ga | --g)
887    # Obsolete; use --with-gas.
888    with_gas=yes ;;
889
890  -help | --help | --hel | --he | -h)
891    ac_init_help=long ;;
892  -help=r* | --help=r* | --hel=r* | --he=r* | -hr*)
893    ac_init_help=recursive ;;
894  -help=s* | --help=s* | --hel=s* | --he=s* | -hs*)
895    ac_init_help=short ;;
896
897  -host | --host | --hos | --ho)
898    ac_prev=host_alias ;;
899  -host=* | --host=* | --hos=* | --ho=*)
900    host_alias=$ac_optarg ;;
901
902  -htmldir | --htmldir | --htmldi | --htmld | --html | --htm | --ht)
903    ac_prev=htmldir ;;
904  -htmldir=* | --htmldir=* | --htmldi=* | --htmld=* | --html=* | --htm=* \
905  | --ht=*)
906    htmldir=$ac_optarg ;;
907
908  -includedir | --includedir | --includedi | --included | --include \
909  | --includ | --inclu | --incl | --inc)
910    ac_prev=includedir ;;
911  -includedir=* | --includedir=* | --includedi=* | --included=* | --include=* \
912  | --includ=* | --inclu=* | --incl=* | --inc=*)
913    includedir=$ac_optarg ;;
914
915  -infodir | --infodir | --infodi | --infod | --info | --inf)
916    ac_prev=infodir ;;
917  -infodir=* | --infodir=* | --infodi=* | --infod=* | --info=* | --inf=*)
918    infodir=$ac_optarg ;;
919
920  -libdir | --libdir | --libdi | --libd)
921    ac_prev=libdir ;;
922  -libdir=* | --libdir=* | --libdi=* | --libd=*)
923    libdir=$ac_optarg ;;
924
925  -libexecdir | --libexecdir | --libexecdi | --libexecd | --libexec \
926  | --libexe | --libex | --libe)
927    ac_prev=libexecdir ;;
928  -libexecdir=* | --libexecdir=* | --libexecdi=* | --libexecd=* | --libexec=* \
929  | --libexe=* | --libex=* | --libe=*)
930    libexecdir=$ac_optarg ;;
931
932  -localedir | --localedir | --localedi | --localed | --locale)
933    ac_prev=localedir ;;
934  -localedir=* | --localedir=* | --localedi=* | --localed=* | --locale=*)
935    localedir=$ac_optarg ;;
936
937  -localstatedir | --localstatedir | --localstatedi | --localstated \
938  | --localstate | --localstat | --localsta | --localst | --locals)
939    ac_prev=localstatedir ;;
940  -localstatedir=* | --localstatedir=* | --localstatedi=* | --localstated=* \
941  | --localstate=* | --localstat=* | --localsta=* | --localst=* | --locals=*)
942    localstatedir=$ac_optarg ;;
943
944  -mandir | --mandir | --mandi | --mand | --man | --ma | --m)
945    ac_prev=mandir ;;
946  -mandir=* | --mandir=* | --mandi=* | --mand=* | --man=* | --ma=* | --m=*)
947    mandir=$ac_optarg ;;
948
949  -nfp | --nfp | --nf)
950    # Obsolete; use --without-fp.
951    with_fp=no ;;
952
953  -no-create | --no-create | --no-creat | --no-crea | --no-cre \
954  | --no-cr | --no-c | -n)
955    no_create=yes ;;
956
957  -no-recursion | --no-recursion | --no-recursio | --no-recursi \
958  | --no-recurs | --no-recur | --no-recu | --no-rec | --no-re | --no-r)
959    no_recursion=yes ;;
960
961  -oldincludedir | --oldincludedir | --oldincludedi | --oldincluded \
962  | --oldinclude | --oldinclud | --oldinclu | --oldincl | --oldinc \
963  | --oldin | --oldi | --old | --ol | --o)
964    ac_prev=oldincludedir ;;
965  -oldincludedir=* | --oldincludedir=* | --oldincludedi=* | --oldincluded=* \
966  | --oldinclude=* | --oldinclud=* | --oldinclu=* | --oldincl=* | --oldinc=* \
967  | --oldin=* | --oldi=* | --old=* | --ol=* | --o=*)
968    oldincludedir=$ac_optarg ;;
969
970  -prefix | --prefix | --prefi | --pref | --pre | --pr | --p)
971    ac_prev=prefix ;;
972  -prefix=* | --prefix=* | --prefi=* | --pref=* | --pre=* | --pr=* | --p=*)
973    prefix=$ac_optarg ;;
974
975  -program-prefix | --program-prefix | --program-prefi | --program-pref \
976  | --program-pre | --program-pr | --program-p)
977    ac_prev=program_prefix ;;
978  -program-prefix=* | --program-prefix=* | --program-prefi=* \
979  | --program-pref=* | --program-pre=* | --program-pr=* | --program-p=*)
980    program_prefix=$ac_optarg ;;
981
982  -program-suffix | --program-suffix | --program-suffi | --program-suff \
983  | --program-suf | --program-su | --program-s)
984    ac_prev=program_suffix ;;
985  -program-suffix=* | --program-suffix=* | --program-suffi=* \
986  | --program-suff=* | --program-suf=* | --program-su=* | --program-s=*)
987    program_suffix=$ac_optarg ;;
988
989  -program-transform-name | --program-transform-name \
990  | --program-transform-nam | --program-transform-na \
991  | --program-transform-n | --program-transform- \
992  | --program-transform | --program-transfor \
993  | --program-transfo | --program-transf \
994  | --program-trans | --program-tran \
995  | --progr-tra | --program-tr | --program-t)
996    ac_prev=program_transform_name ;;
997  -program-transform-name=* | --program-transform-name=* \
998  | --program-transform-nam=* | --program-transform-na=* \
999  | --program-transform-n=* | --program-transform-=* \
1000  | --program-transform=* | --program-transfor=* \
1001  | --program-transfo=* | --program-transf=* \
1002  | --program-trans=* | --program-tran=* \
1003  | --progr-tra=* | --program-tr=* | --program-t=*)
1004    program_transform_name=$ac_optarg ;;
1005
1006  -pdfdir | --pdfdir | --pdfdi | --pdfd | --pdf | --pd)
1007    ac_prev=pdfdir ;;
1008  -pdfdir=* | --pdfdir=* | --pdfdi=* | --pdfd=* | --pdf=* | --pd=*)
1009    pdfdir=$ac_optarg ;;
1010
1011  -psdir | --psdir | --psdi | --psd | --ps)
1012    ac_prev=psdir ;;
1013  -psdir=* | --psdir=* | --psdi=* | --psd=* | --ps=*)
1014    psdir=$ac_optarg ;;
1015
1016  -q | -quiet | --quiet | --quie | --qui | --qu | --q \
1017  | -silent | --silent | --silen | --sile | --sil)
1018    silent=yes ;;
1019
1020  -runstatedir | --runstatedir | --runstatedi | --runstated \
1021  | --runstate | --runstat | --runsta | --runst | --runs \
1022  | --run | --ru | --r)
1023    ac_prev=runstatedir ;;
1024  -runstatedir=* | --runstatedir=* | --runstatedi=* | --runstated=* \
1025  | --runstate=* | --runstat=* | --runsta=* | --runst=* | --runs=* \
1026  | --run=* | --ru=* | --r=*)
1027    runstatedir=$ac_optarg ;;
1028
1029  -sbindir | --sbindir | --sbindi | --sbind | --sbin | --sbi | --sb)
1030    ac_prev=sbindir ;;
1031  -sbindir=* | --sbindir=* | --sbindi=* | --sbind=* | --sbin=* \
1032  | --sbi=* | --sb=*)
1033    sbindir=$ac_optarg ;;
1034
1035  -sharedstatedir | --sharedstatedir | --sharedstatedi \
1036  | --sharedstated | --sharedstate | --sharedstat | --sharedsta \
1037  | --sharedst | --shareds | --shared | --share | --shar \
1038  | --sha | --sh)
1039    ac_prev=sharedstatedir ;;
1040  -sharedstatedir=* | --sharedstatedir=* | --sharedstatedi=* \
1041  | --sharedstated=* | --sharedstate=* | --sharedstat=* | --sharedsta=* \
1042  | --sharedst=* | --shareds=* | --shared=* | --share=* | --shar=* \
1043  | --sha=* | --sh=*)
1044    sharedstatedir=$ac_optarg ;;
1045
1046  -site | --site | --sit)
1047    ac_prev=site ;;
1048  -site=* | --site=* | --sit=*)
1049    site=$ac_optarg ;;
1050
1051  -srcdir | --srcdir | --srcdi | --srcd | --src | --sr)
1052    ac_prev=srcdir ;;
1053  -srcdir=* | --srcdir=* | --srcdi=* | --srcd=* | --src=* | --sr=*)
1054    srcdir=$ac_optarg ;;
1055
1056  -sysconfdir | --sysconfdir | --sysconfdi | --sysconfd | --sysconf \
1057  | --syscon | --sysco | --sysc | --sys | --sy)
1058    ac_prev=sysconfdir ;;
1059  -sysconfdir=* | --sysconfdir=* | --sysconfdi=* | --sysconfd=* | --sysconf=* \
1060  | --syscon=* | --sysco=* | --sysc=* | --sys=* | --sy=*)
1061    sysconfdir=$ac_optarg ;;
1062
1063  -target | --target | --targe | --targ | --tar | --ta | --t)
1064    ac_prev=target_alias ;;
1065  -target=* | --target=* | --targe=* | --targ=* | --tar=* | --ta=* | --t=*)
1066    target_alias=$ac_optarg ;;
1067
1068  -v | -verbose | --verbose | --verbos | --verbo | --verb)
1069    verbose=yes ;;
1070
1071  -version | --version | --versio | --versi | --vers | -V)
1072    ac_init_version=: ;;
1073
1074  -with-* | --with-*)
1075    ac_useropt=`expr "x$ac_option" : 'x-*with-\([^=]*\)'`
1076    # Reject names that are not valid shell variable names.
1077    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
1078      as_fn_error $? "invalid package name: \`$ac_useropt'"
1079    ac_useropt_orig=$ac_useropt
1080    ac_useropt=`printf "%s\n" "$ac_useropt" | sed 's/[-+.]/_/g'`
1081    case $ac_user_opts in
1082      *"
1083"with_$ac_useropt"
1084"*) ;;
1085      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--with-$ac_useropt_orig"
1086	 ac_unrecognized_sep=', ';;
1087    esac
1088    eval with_$ac_useropt=\$ac_optarg ;;
1089
1090  -without-* | --without-*)
1091    ac_useropt=`expr "x$ac_option" : 'x-*without-\(.*\)'`
1092    # Reject names that are not valid shell variable names.
1093    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
1094      as_fn_error $? "invalid package name: \`$ac_useropt'"
1095    ac_useropt_orig=$ac_useropt
1096    ac_useropt=`printf "%s\n" "$ac_useropt" | sed 's/[-+.]/_/g'`
1097    case $ac_user_opts in
1098      *"
1099"with_$ac_useropt"
1100"*) ;;
1101      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--without-$ac_useropt_orig"
1102	 ac_unrecognized_sep=', ';;
1103    esac
1104    eval with_$ac_useropt=no ;;
1105
1106  --x)
1107    # Obsolete; use --with-x.
1108    with_x=yes ;;
1109
1110  -x-includes | --x-includes | --x-include | --x-includ | --x-inclu \
1111  | --x-incl | --x-inc | --x-in | --x-i)
1112    ac_prev=x_includes ;;
1113  -x-includes=* | --x-includes=* | --x-include=* | --x-includ=* | --x-inclu=* \
1114  | --x-incl=* | --x-inc=* | --x-in=* | --x-i=*)
1115    x_includes=$ac_optarg ;;
1116
1117  -x-libraries | --x-libraries | --x-librarie | --x-librari \
1118  | --x-librar | --x-libra | --x-libr | --x-lib | --x-li | --x-l)
1119    ac_prev=x_libraries ;;
1120  -x-libraries=* | --x-libraries=* | --x-librarie=* | --x-librari=* \
1121  | --x-librar=* | --x-libra=* | --x-libr=* | --x-lib=* | --x-li=* | --x-l=*)
1122    x_libraries=$ac_optarg ;;
1123
1124  -*) as_fn_error $? "unrecognized option: \`$ac_option'
1125Try \`$0 --help' for more information"
1126    ;;
1127
1128  *=*)
1129    ac_envvar=`expr "x$ac_option" : 'x\([^=]*\)='`
1130    # Reject names that are not valid shell variable names.
1131    case $ac_envvar in #(
1132      '' | [0-9]* | *[!_$as_cr_alnum]* )
1133      as_fn_error $? "invalid variable name: \`$ac_envvar'" ;;
1134    esac
1135    eval $ac_envvar=\$ac_optarg
1136    export $ac_envvar ;;
1137
1138  *)
1139    # FIXME: should be removed in autoconf 3.0.
1140    printf "%s\n" "$as_me: WARNING: you should use --build, --host, --target" >&2
1141    expr "x$ac_option" : ".*[^-._$as_cr_alnum]" >/dev/null &&
1142      printf "%s\n" "$as_me: WARNING: invalid host type: $ac_option" >&2
1143    : "${build_alias=$ac_option} ${host_alias=$ac_option} ${target_alias=$ac_option}"
1144    ;;
1145
1146  esac
1147done
1148
1149if test -n "$ac_prev"; then
1150  ac_option=--`echo $ac_prev | sed 's/_/-/g'`
1151  as_fn_error $? "missing argument to $ac_option"
1152fi
1153
1154if test -n "$ac_unrecognized_opts"; then
1155  case $enable_option_checking in
1156    no) ;;
1157    fatal) as_fn_error $? "unrecognized options: $ac_unrecognized_opts" ;;
1158    *)     printf "%s\n" "$as_me: WARNING: unrecognized options: $ac_unrecognized_opts" >&2 ;;
1159  esac
1160fi
1161
1162# Check all directory arguments for consistency.
1163for ac_var in	exec_prefix prefix bindir sbindir libexecdir datarootdir \
1164		datadir sysconfdir sharedstatedir localstatedir includedir \
1165		oldincludedir docdir infodir htmldir dvidir pdfdir psdir \
1166		libdir localedir mandir runstatedir
1167do
1168  eval ac_val=\$$ac_var
1169  # Remove trailing slashes.
1170  case $ac_val in
1171    */ )
1172      ac_val=`expr "X$ac_val" : 'X\(.*[^/]\)' \| "X$ac_val" : 'X\(.*\)'`
1173      eval $ac_var=\$ac_val;;
1174  esac
1175  # Be sure to have absolute directory names.
1176  case $ac_val in
1177    [\\/$]* | ?:[\\/]* )  continue;;
1178    NONE | '' ) case $ac_var in *prefix ) continue;; esac;;
1179  esac
1180  as_fn_error $? "expected an absolute directory name for --$ac_var: $ac_val"
1181done
1182
1183# There might be people who depend on the old broken behavior: `$host'
1184# used to hold the argument of --host etc.
1185# FIXME: To remove some day.
1186build=$build_alias
1187host=$host_alias
1188target=$target_alias
1189
1190# FIXME: To remove some day.
1191if test "x$host_alias" != x; then
1192  if test "x$build_alias" = x; then
1193    cross_compiling=maybe
1194  elif test "x$build_alias" != "x$host_alias"; then
1195    cross_compiling=yes
1196  fi
1197fi
1198
1199ac_tool_prefix=
1200test -n "$host_alias" && ac_tool_prefix=$host_alias-
1201
1202test "$silent" = yes && exec 6>/dev/null
1203
1204
1205ac_pwd=`pwd` && test -n "$ac_pwd" &&
1206ac_ls_di=`ls -di .` &&
1207ac_pwd_ls_di=`cd "$ac_pwd" && ls -di .` ||
1208  as_fn_error $? "working directory cannot be determined"
1209test "X$ac_ls_di" = "X$ac_pwd_ls_di" ||
1210  as_fn_error $? "pwd does not report name of working directory"
1211
1212
1213# Find the source files, if location was not specified.
1214if test -z "$srcdir"; then
1215  ac_srcdir_defaulted=yes
1216  # Try the directory containing this script, then the parent directory.
1217  ac_confdir=`$as_dirname -- "$as_myself" ||
1218$as_expr X"$as_myself" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
1219	 X"$as_myself" : 'X\(//\)[^/]' \| \
1220	 X"$as_myself" : 'X\(//\)$' \| \
1221	 X"$as_myself" : 'X\(/\)' \| . 2>/dev/null ||
1222printf "%s\n" X"$as_myself" |
1223    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
1224	    s//\1/
1225	    q
1226	  }
1227	  /^X\(\/\/\)[^/].*/{
1228	    s//\1/
1229	    q
1230	  }
1231	  /^X\(\/\/\)$/{
1232	    s//\1/
1233	    q
1234	  }
1235	  /^X\(\/\).*/{
1236	    s//\1/
1237	    q
1238	  }
1239	  s/.*/./; q'`
1240  srcdir=$ac_confdir
1241  if test ! -r "$srcdir/$ac_unique_file"; then
1242    srcdir=..
1243  fi
1244else
1245  ac_srcdir_defaulted=no
1246fi
1247if test ! -r "$srcdir/$ac_unique_file"; then
1248  test "$ac_srcdir_defaulted" = yes && srcdir="$ac_confdir or .."
1249  as_fn_error $? "cannot find sources ($ac_unique_file) in $srcdir"
1250fi
1251ac_msg="sources are in $srcdir, but \`cd $srcdir' does not work"
1252ac_abs_confdir=`(
1253	cd "$srcdir" && test -r "./$ac_unique_file" || as_fn_error $? "$ac_msg"
1254	pwd)`
1255# When building in place, set srcdir=.
1256if test "$ac_abs_confdir" = "$ac_pwd"; then
1257  srcdir=.
1258fi
1259# Remove unnecessary trailing slashes from srcdir.
1260# Double slashes in file names in object file debugging info
1261# mess up M-x gdb in Emacs.
1262case $srcdir in
1263*/) srcdir=`expr "X$srcdir" : 'X\(.*[^/]\)' \| "X$srcdir" : 'X\(.*\)'`;;
1264esac
1265for ac_var in $ac_precious_vars; do
1266  eval ac_env_${ac_var}_set=\${${ac_var}+set}
1267  eval ac_env_${ac_var}_value=\$${ac_var}
1268  eval ac_cv_env_${ac_var}_set=\${${ac_var}+set}
1269  eval ac_cv_env_${ac_var}_value=\$${ac_var}
1270done
1271
1272#
1273# Report the --help message.
1274#
1275if test "$ac_init_help" = "long"; then
1276  # Omit some internal or obsolete options to make the list less imposing.
1277  # This message is too long to be a string in the A/UX 3.1 sh.
1278  cat <<_ACEOF
1279\`configure' configures Haskell unix package 2.0 to adapt to many kinds of systems.
1280
1281Usage: $0 [OPTION]... [VAR=VALUE]...
1282
1283To assign environment variables (e.g., CC, CFLAGS...), specify them as
1284VAR=VALUE.  See below for descriptions of some of the useful variables.
1285
1286Defaults for the options are specified in brackets.
1287
1288Configuration:
1289  -h, --help              display this help and exit
1290      --help=short        display options specific to this package
1291      --help=recursive    display the short help of all the included packages
1292  -V, --version           display version information and exit
1293  -q, --quiet, --silent   do not print \`checking ...' messages
1294      --cache-file=FILE   cache test results in FILE [disabled]
1295  -C, --config-cache      alias for \`--cache-file=config.cache'
1296  -n, --no-create         do not create output files
1297      --srcdir=DIR        find the sources in DIR [configure dir or \`..']
1298
1299Installation directories:
1300  --prefix=PREFIX         install architecture-independent files in PREFIX
1301                          [$ac_default_prefix]
1302  --exec-prefix=EPREFIX   install architecture-dependent files in EPREFIX
1303                          [PREFIX]
1304
1305By default, \`make install' will install all the files in
1306\`$ac_default_prefix/bin', \`$ac_default_prefix/lib' etc.  You can specify
1307an installation prefix other than \`$ac_default_prefix' using \`--prefix',
1308for instance \`--prefix=\$HOME'.
1309
1310For better control, use the options below.
1311
1312Fine tuning of the installation directories:
1313  --bindir=DIR            user executables [EPREFIX/bin]
1314  --sbindir=DIR           system admin executables [EPREFIX/sbin]
1315  --libexecdir=DIR        program executables [EPREFIX/libexec]
1316  --sysconfdir=DIR        read-only single-machine data [PREFIX/etc]
1317  --sharedstatedir=DIR    modifiable architecture-independent data [PREFIX/com]
1318  --localstatedir=DIR     modifiable single-machine data [PREFIX/var]
1319  --runstatedir=DIR       modifiable per-process data [LOCALSTATEDIR/run]
1320  --libdir=DIR            object code libraries [EPREFIX/lib]
1321  --includedir=DIR        C header files [PREFIX/include]
1322  --oldincludedir=DIR     C header files for non-gcc [/usr/include]
1323  --datarootdir=DIR       read-only arch.-independent data root [PREFIX/share]
1324  --datadir=DIR           read-only architecture-independent data [DATAROOTDIR]
1325  --infodir=DIR           info documentation [DATAROOTDIR/info]
1326  --localedir=DIR         locale-dependent data [DATAROOTDIR/locale]
1327  --mandir=DIR            man documentation [DATAROOTDIR/man]
1328  --docdir=DIR            documentation root [DATAROOTDIR/doc/unix]
1329  --htmldir=DIR           html documentation [DOCDIR]
1330  --dvidir=DIR            dvi documentation [DOCDIR]
1331  --pdfdir=DIR            pdf documentation [DOCDIR]
1332  --psdir=DIR             ps documentation [DOCDIR]
1333_ACEOF
1334
1335  cat <<\_ACEOF
1336
1337System types:
1338  --build=BUILD     configure for building on BUILD [guessed]
1339  --host=HOST       cross-compile to build programs to run on HOST [BUILD]
1340  --target=TARGET   configure for building compilers for TARGET [HOST]
1341_ACEOF
1342fi
1343
1344if test -n "$ac_init_help"; then
1345  case $ac_init_help in
1346     short | recursive ) echo "Configuration of Haskell unix package 2.0:";;
1347   esac
1348  cat <<\_ACEOF
1349
1350Optional Features:
1351  --disable-option-checking  ignore unrecognized --enable/--with options
1352  --disable-FEATURE       do not include FEATURE (same as --enable-FEATURE=no)
1353  --enable-FEATURE[=ARG]  include FEATURE [ARG=yes]
1354  --disable-largefile     omit support for large files
1355
1356Some influential environment variables:
1357  CC          C compiler command
1358  CFLAGS      C compiler flags
1359  LDFLAGS     linker flags, e.g. -L<lib dir> if you have libraries in a
1360              nonstandard directory <lib dir>
1361  LIBS        libraries to pass to the linker, e.g. -l<library>
1362  CPPFLAGS    (Objective) C/C++ preprocessor flags, e.g. -I<include dir> if
1363              you have headers in a nonstandard directory <include dir>
1364  CPP         C preprocessor
1365
1366Use these variables to override the choices made by `configure' or to help
1367it to find libraries and programs with nonstandard names/locations.
1368
1369Report bugs to <libraries@haskell.org>.
1370_ACEOF
1371ac_status=$?
1372fi
1373
1374if test "$ac_init_help" = "recursive"; then
1375  # If there are subdirs, report their specific --help.
1376  for ac_dir in : $ac_subdirs_all; do test "x$ac_dir" = x: && continue
1377    test -d "$ac_dir" ||
1378      { cd "$srcdir" && ac_pwd=`pwd` && srcdir=. && test -d "$ac_dir"; } ||
1379      continue
1380    ac_builddir=.
1381
1382case "$ac_dir" in
1383.) ac_dir_suffix= ac_top_builddir_sub=. ac_top_build_prefix= ;;
1384*)
1385  ac_dir_suffix=/`printf "%s\n" "$ac_dir" | sed 's|^\.[\\/]||'`
1386  # A ".." for each directory in $ac_dir_suffix.
1387  ac_top_builddir_sub=`printf "%s\n" "$ac_dir_suffix" | sed 's|/[^\\/]*|/..|g;s|/||'`
1388  case $ac_top_builddir_sub in
1389  "") ac_top_builddir_sub=. ac_top_build_prefix= ;;
1390  *)  ac_top_build_prefix=$ac_top_builddir_sub/ ;;
1391  esac ;;
1392esac
1393ac_abs_top_builddir=$ac_pwd
1394ac_abs_builddir=$ac_pwd$ac_dir_suffix
1395# for backward compatibility:
1396ac_top_builddir=$ac_top_build_prefix
1397
1398case $srcdir in
1399  .)  # We are building in place.
1400    ac_srcdir=.
1401    ac_top_srcdir=$ac_top_builddir_sub
1402    ac_abs_top_srcdir=$ac_pwd ;;
1403  [\\/]* | ?:[\\/]* )  # Absolute name.
1404    ac_srcdir=$srcdir$ac_dir_suffix;
1405    ac_top_srcdir=$srcdir
1406    ac_abs_top_srcdir=$srcdir ;;
1407  *) # Relative name.
1408    ac_srcdir=$ac_top_build_prefix$srcdir$ac_dir_suffix
1409    ac_top_srcdir=$ac_top_build_prefix$srcdir
1410    ac_abs_top_srcdir=$ac_pwd/$srcdir ;;
1411esac
1412ac_abs_srcdir=$ac_abs_top_srcdir$ac_dir_suffix
1413
1414    cd "$ac_dir" || { ac_status=$?; continue; }
1415    # Check for configure.gnu first; this name is used for a wrapper for
1416    # Metaconfig's "Configure" on case-insensitive file systems.
1417    if test -f "$ac_srcdir/configure.gnu"; then
1418      echo &&
1419      $SHELL "$ac_srcdir/configure.gnu" --help=recursive
1420    elif test -f "$ac_srcdir/configure"; then
1421      echo &&
1422      $SHELL "$ac_srcdir/configure" --help=recursive
1423    else
1424      printf "%s\n" "$as_me: WARNING: no configuration information is in $ac_dir" >&2
1425    fi || ac_status=$?
1426    cd "$ac_pwd" || { ac_status=$?; break; }
1427  done
1428fi
1429
1430test -n "$ac_init_help" && exit $ac_status
1431if $ac_init_version; then
1432  cat <<\_ACEOF
1433Haskell unix package configure 2.0
1434generated by GNU Autoconf 2.71
1435
1436Copyright (C) 2021 Free Software Foundation, Inc.
1437This configure script is free software; the Free Software Foundation
1438gives unlimited permission to copy, distribute and modify it.
1439_ACEOF
1440  exit
1441fi
1442
1443## ------------------------ ##
1444## Autoconf initialization. ##
1445## ------------------------ ##
1446
1447# ac_fn_c_try_compile LINENO
1448# --------------------------
1449# Try to compile conftest.$ac_ext, and return whether this succeeded.
1450ac_fn_c_try_compile ()
1451{
1452  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1453  rm -f conftest.$ac_objext conftest.beam
1454  if { { ac_try="$ac_compile"
1455case "(($ac_try" in
1456  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
1457  *) ac_try_echo=$ac_try;;
1458esac
1459eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
1460printf "%s\n" "$ac_try_echo"; } >&5
1461  (eval "$ac_compile") 2>conftest.err
1462  ac_status=$?
1463  if test -s conftest.err; then
1464    grep -v '^ *+' conftest.err >conftest.er1
1465    cat conftest.er1 >&5
1466    mv -f conftest.er1 conftest.err
1467  fi
1468  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
1469  test $ac_status = 0; } && {
1470	 test -z "$ac_c_werror_flag" ||
1471	 test ! -s conftest.err
1472       } && test -s conftest.$ac_objext
1473then :
1474  ac_retval=0
1475else $as_nop
1476  printf "%s\n" "$as_me: failed program was:" >&5
1477sed 's/^/| /' conftest.$ac_ext >&5
1478
1479	ac_retval=1
1480fi
1481  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1482  as_fn_set_status $ac_retval
1483
1484} # ac_fn_c_try_compile
1485
1486# ac_fn_c_check_header_compile LINENO HEADER VAR INCLUDES
1487# -------------------------------------------------------
1488# Tests whether HEADER exists and can be compiled using the include files in
1489# INCLUDES, setting the cache variable VAR accordingly.
1490ac_fn_c_check_header_compile ()
1491{
1492  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1493  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $2" >&5
1494printf %s "checking for $2... " >&6; }
1495if eval test \${$3+y}
1496then :
1497  printf %s "(cached) " >&6
1498else $as_nop
1499  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1500/* end confdefs.h.  */
1501$4
1502#include <$2>
1503_ACEOF
1504if ac_fn_c_try_compile "$LINENO"
1505then :
1506  eval "$3=yes"
1507else $as_nop
1508  eval "$3=no"
1509fi
1510rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
1511fi
1512eval ac_res=\$$3
1513	       { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_res" >&5
1514printf "%s\n" "$ac_res" >&6; }
1515  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1516
1517} # ac_fn_c_check_header_compile
1518
1519# ac_fn_c_try_link LINENO
1520# -----------------------
1521# Try to link conftest.$ac_ext, and return whether this succeeded.
1522ac_fn_c_try_link ()
1523{
1524  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1525  rm -f conftest.$ac_objext conftest.beam conftest$ac_exeext
1526  if { { ac_try="$ac_link"
1527case "(($ac_try" in
1528  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
1529  *) ac_try_echo=$ac_try;;
1530esac
1531eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
1532printf "%s\n" "$ac_try_echo"; } >&5
1533  (eval "$ac_link") 2>conftest.err
1534  ac_status=$?
1535  if test -s conftest.err; then
1536    grep -v '^ *+' conftest.err >conftest.er1
1537    cat conftest.er1 >&5
1538    mv -f conftest.er1 conftest.err
1539  fi
1540  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
1541  test $ac_status = 0; } && {
1542	 test -z "$ac_c_werror_flag" ||
1543	 test ! -s conftest.err
1544       } && test -s conftest$ac_exeext && {
1545	 test "$cross_compiling" = yes ||
1546	 test -x conftest$ac_exeext
1547       }
1548then :
1549  ac_retval=0
1550else $as_nop
1551  printf "%s\n" "$as_me: failed program was:" >&5
1552sed 's/^/| /' conftest.$ac_ext >&5
1553
1554	ac_retval=1
1555fi
1556  # Delete the IPA/IPO (Inter Procedural Analysis/Optimization) information
1557  # created by the PGI compiler (conftest_ipa8_conftest.oo), as it would
1558  # interfere with the next link command; also delete a directory that is
1559  # left behind by Apple's compiler.  We do this before executing the actions.
1560  rm -rf conftest.dSYM conftest_ipa8_conftest.oo
1561  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1562  as_fn_set_status $ac_retval
1563
1564} # ac_fn_c_try_link
1565
1566# ac_fn_c_check_func LINENO FUNC VAR
1567# ----------------------------------
1568# Tests whether FUNC exists, setting the cache variable VAR accordingly
1569ac_fn_c_check_func ()
1570{
1571  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1572  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $2" >&5
1573printf %s "checking for $2... " >&6; }
1574if eval test \${$3+y}
1575then :
1576  printf %s "(cached) " >&6
1577else $as_nop
1578  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1579/* end confdefs.h.  */
1580/* Define $2 to an innocuous variant, in case <limits.h> declares $2.
1581   For example, HP-UX 11i <limits.h> declares gettimeofday.  */
1582#define $2 innocuous_$2
1583
1584/* System header to define __stub macros and hopefully few prototypes,
1585   which can conflict with char $2 (); below.  */
1586
1587#include <limits.h>
1588#undef $2
1589
1590/* Override any GCC internal prototype to avoid an error.
1591   Use char because int might match the return type of a GCC
1592   builtin and then its argument prototype would still apply.  */
1593#ifdef __cplusplus
1594extern "C"
1595#endif
1596char $2 ();
1597/* The GNU C library defines this for functions which it implements
1598    to always fail with ENOSYS.  Some functions are actually named
1599    something starting with __ and the normal name is an alias.  */
1600#if defined __stub_$2 || defined __stub___$2
1601choke me
1602#endif
1603
1604int
1605main (void)
1606{
1607return $2 ();
1608  ;
1609  return 0;
1610}
1611_ACEOF
1612if ac_fn_c_try_link "$LINENO"
1613then :
1614  eval "$3=yes"
1615else $as_nop
1616  eval "$3=no"
1617fi
1618rm -f core conftest.err conftest.$ac_objext conftest.beam \
1619    conftest$ac_exeext conftest.$ac_ext
1620fi
1621eval ac_res=\$$3
1622	       { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_res" >&5
1623printf "%s\n" "$ac_res" >&6; }
1624  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1625
1626} # ac_fn_c_check_func
1627
1628# ac_fn_check_decl LINENO SYMBOL VAR INCLUDES EXTRA-OPTIONS FLAG-VAR
1629# ------------------------------------------------------------------
1630# Tests whether SYMBOL is declared in INCLUDES, setting cache variable VAR
1631# accordingly. Pass EXTRA-OPTIONS to the compiler, using FLAG-VAR.
1632ac_fn_check_decl ()
1633{
1634  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1635  as_decl_name=`echo $2|sed 's/ *(.*//'`
1636  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking whether $as_decl_name is declared" >&5
1637printf %s "checking whether $as_decl_name is declared... " >&6; }
1638if eval test \${$3+y}
1639then :
1640  printf %s "(cached) " >&6
1641else $as_nop
1642  as_decl_use=`echo $2|sed -e 's/(/((/' -e 's/)/) 0&/' -e 's/,/) 0& (/g'`
1643  eval ac_save_FLAGS=\$$6
1644  as_fn_append $6 " $5"
1645  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1646/* end confdefs.h.  */
1647$4
1648int
1649main (void)
1650{
1651#ifndef $as_decl_name
1652#ifdef __cplusplus
1653  (void) $as_decl_use;
1654#else
1655  (void) $as_decl_name;
1656#endif
1657#endif
1658
1659  ;
1660  return 0;
1661}
1662_ACEOF
1663if ac_fn_c_try_compile "$LINENO"
1664then :
1665  eval "$3=yes"
1666else $as_nop
1667  eval "$3=no"
1668fi
1669rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
1670  eval $6=\$ac_save_FLAGS
1671
1672fi
1673eval ac_res=\$$3
1674	       { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_res" >&5
1675printf "%s\n" "$ac_res" >&6; }
1676  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1677
1678} # ac_fn_check_decl
1679
1680# ac_fn_c_check_member LINENO AGGR MEMBER VAR INCLUDES
1681# ----------------------------------------------------
1682# Tries to find if the field MEMBER exists in type AGGR, after including
1683# INCLUDES, setting cache variable VAR accordingly.
1684ac_fn_c_check_member ()
1685{
1686  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1687  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $2.$3" >&5
1688printf %s "checking for $2.$3... " >&6; }
1689if eval test \${$4+y}
1690then :
1691  printf %s "(cached) " >&6
1692else $as_nop
1693  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1694/* end confdefs.h.  */
1695$5
1696int
1697main (void)
1698{
1699static $2 ac_aggr;
1700if (ac_aggr.$3)
1701return 0;
1702  ;
1703  return 0;
1704}
1705_ACEOF
1706if ac_fn_c_try_compile "$LINENO"
1707then :
1708  eval "$4=yes"
1709else $as_nop
1710  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1711/* end confdefs.h.  */
1712$5
1713int
1714main (void)
1715{
1716static $2 ac_aggr;
1717if (sizeof ac_aggr.$3)
1718return 0;
1719  ;
1720  return 0;
1721}
1722_ACEOF
1723if ac_fn_c_try_compile "$LINENO"
1724then :
1725  eval "$4=yes"
1726else $as_nop
1727  eval "$4=no"
1728fi
1729rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
1730fi
1731rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
1732fi
1733eval ac_res=\$$4
1734	       { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_res" >&5
1735printf "%s\n" "$ac_res" >&6; }
1736  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1737
1738} # ac_fn_c_check_member
1739
1740# ac_fn_c_try_run LINENO
1741# ----------------------
1742# Try to run conftest.$ac_ext, and return whether this succeeded. Assumes that
1743# executables *can* be run.
1744ac_fn_c_try_run ()
1745{
1746  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1747  if { { ac_try="$ac_link"
1748case "(($ac_try" in
1749  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
1750  *) ac_try_echo=$ac_try;;
1751esac
1752eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
1753printf "%s\n" "$ac_try_echo"; } >&5
1754  (eval "$ac_link") 2>&5
1755  ac_status=$?
1756  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
1757  test $ac_status = 0; } && { ac_try='./conftest$ac_exeext'
1758  { { case "(($ac_try" in
1759  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
1760  *) ac_try_echo=$ac_try;;
1761esac
1762eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
1763printf "%s\n" "$ac_try_echo"; } >&5
1764  (eval "$ac_try") 2>&5
1765  ac_status=$?
1766  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
1767  test $ac_status = 0; }; }
1768then :
1769  ac_retval=0
1770else $as_nop
1771  printf "%s\n" "$as_me: program exited with status $ac_status" >&5
1772       printf "%s\n" "$as_me: failed program was:" >&5
1773sed 's/^/| /' conftest.$ac_ext >&5
1774
1775       ac_retval=$ac_status
1776fi
1777  rm -rf conftest.dSYM conftest_ipa8_conftest.oo
1778  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1779  as_fn_set_status $ac_retval
1780
1781} # ac_fn_c_try_run
1782
1783# ac_fn_c_compute_int LINENO EXPR VAR INCLUDES
1784# --------------------------------------------
1785# Tries to find the compile-time value of EXPR in a program that includes
1786# INCLUDES, setting VAR accordingly. Returns whether the value could be
1787# computed
1788ac_fn_c_compute_int ()
1789{
1790  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1791  if test "$cross_compiling" = yes; then
1792    # Depending upon the size, compute the lo and hi bounds.
1793cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1794/* end confdefs.h.  */
1795$4
1796int
1797main (void)
1798{
1799static int test_array [1 - 2 * !(($2) >= 0)];
1800test_array [0] = 0;
1801return test_array [0];
1802
1803  ;
1804  return 0;
1805}
1806_ACEOF
1807if ac_fn_c_try_compile "$LINENO"
1808then :
1809  ac_lo=0 ac_mid=0
1810  while :; do
1811    cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1812/* end confdefs.h.  */
1813$4
1814int
1815main (void)
1816{
1817static int test_array [1 - 2 * !(($2) <= $ac_mid)];
1818test_array [0] = 0;
1819return test_array [0];
1820
1821  ;
1822  return 0;
1823}
1824_ACEOF
1825if ac_fn_c_try_compile "$LINENO"
1826then :
1827  ac_hi=$ac_mid; break
1828else $as_nop
1829  as_fn_arith $ac_mid + 1 && ac_lo=$as_val
1830			if test $ac_lo -le $ac_mid; then
1831			  ac_lo= ac_hi=
1832			  break
1833			fi
1834			as_fn_arith 2 '*' $ac_mid + 1 && ac_mid=$as_val
1835fi
1836rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
1837  done
1838else $as_nop
1839  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1840/* end confdefs.h.  */
1841$4
1842int
1843main (void)
1844{
1845static int test_array [1 - 2 * !(($2) < 0)];
1846test_array [0] = 0;
1847return test_array [0];
1848
1849  ;
1850  return 0;
1851}
1852_ACEOF
1853if ac_fn_c_try_compile "$LINENO"
1854then :
1855  ac_hi=-1 ac_mid=-1
1856  while :; do
1857    cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1858/* end confdefs.h.  */
1859$4
1860int
1861main (void)
1862{
1863static int test_array [1 - 2 * !(($2) >= $ac_mid)];
1864test_array [0] = 0;
1865return test_array [0];
1866
1867  ;
1868  return 0;
1869}
1870_ACEOF
1871if ac_fn_c_try_compile "$LINENO"
1872then :
1873  ac_lo=$ac_mid; break
1874else $as_nop
1875  as_fn_arith '(' $ac_mid ')' - 1 && ac_hi=$as_val
1876			if test $ac_mid -le $ac_hi; then
1877			  ac_lo= ac_hi=
1878			  break
1879			fi
1880			as_fn_arith 2 '*' $ac_mid && ac_mid=$as_val
1881fi
1882rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
1883  done
1884else $as_nop
1885  ac_lo= ac_hi=
1886fi
1887rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
1888fi
1889rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
1890# Binary search between lo and hi bounds.
1891while test "x$ac_lo" != "x$ac_hi"; do
1892  as_fn_arith '(' $ac_hi - $ac_lo ')' / 2 + $ac_lo && ac_mid=$as_val
1893  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1894/* end confdefs.h.  */
1895$4
1896int
1897main (void)
1898{
1899static int test_array [1 - 2 * !(($2) <= $ac_mid)];
1900test_array [0] = 0;
1901return test_array [0];
1902
1903  ;
1904  return 0;
1905}
1906_ACEOF
1907if ac_fn_c_try_compile "$LINENO"
1908then :
1909  ac_hi=$ac_mid
1910else $as_nop
1911  as_fn_arith '(' $ac_mid ')' + 1 && ac_lo=$as_val
1912fi
1913rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
1914done
1915case $ac_lo in #((
1916?*) eval "$3=\$ac_lo"; ac_retval=0 ;;
1917'') ac_retval=1 ;;
1918esac
1919  else
1920    cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1921/* end confdefs.h.  */
1922$4
1923static long int longval (void) { return $2; }
1924static unsigned long int ulongval (void) { return $2; }
1925#include <stdio.h>
1926#include <stdlib.h>
1927int
1928main (void)
1929{
1930
1931  FILE *f = fopen ("conftest.val", "w");
1932  if (! f)
1933    return 1;
1934  if (($2) < 0)
1935    {
1936      long int i = longval ();
1937      if (i != ($2))
1938	return 1;
1939      fprintf (f, "%ld", i);
1940    }
1941  else
1942    {
1943      unsigned long int i = ulongval ();
1944      if (i != ($2))
1945	return 1;
1946      fprintf (f, "%lu", i);
1947    }
1948  /* Do not output a trailing newline, as this causes \r\n confusion
1949     on some platforms.  */
1950  return ferror (f) || fclose (f) != 0;
1951
1952  ;
1953  return 0;
1954}
1955_ACEOF
1956if ac_fn_c_try_run "$LINENO"
1957then :
1958  echo >>conftest.val; read $3 <conftest.val; ac_retval=0
1959else $as_nop
1960  ac_retval=1
1961fi
1962rm -f core *.core core.conftest.* gmon.out bb.out conftest$ac_exeext \
1963  conftest.$ac_objext conftest.beam conftest.$ac_ext
1964rm -f conftest.val
1965
1966  fi
1967  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1968  as_fn_set_status $ac_retval
1969
1970} # ac_fn_c_compute_int
1971
1972# ac_fn_c_try_cpp LINENO
1973# ----------------------
1974# Try to preprocess conftest.$ac_ext, and return whether this succeeded.
1975ac_fn_c_try_cpp ()
1976{
1977  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1978  if { { ac_try="$ac_cpp conftest.$ac_ext"
1979case "(($ac_try" in
1980  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
1981  *) ac_try_echo=$ac_try;;
1982esac
1983eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
1984printf "%s\n" "$ac_try_echo"; } >&5
1985  (eval "$ac_cpp conftest.$ac_ext") 2>conftest.err
1986  ac_status=$?
1987  if test -s conftest.err; then
1988    grep -v '^ *+' conftest.err >conftest.er1
1989    cat conftest.er1 >&5
1990    mv -f conftest.er1 conftest.err
1991  fi
1992  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
1993  test $ac_status = 0; } > conftest.i && {
1994	 test -z "$ac_c_preproc_warn_flag$ac_c_werror_flag" ||
1995	 test ! -s conftest.err
1996       }
1997then :
1998  ac_retval=0
1999else $as_nop
2000  printf "%s\n" "$as_me: failed program was:" >&5
2001sed 's/^/| /' conftest.$ac_ext >&5
2002
2003    ac_retval=1
2004fi
2005  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
2006  as_fn_set_status $ac_retval
2007
2008} # ac_fn_c_try_cpp
2009ac_configure_args_raw=
2010for ac_arg
2011do
2012  case $ac_arg in
2013  *\'*)
2014    ac_arg=`printf "%s\n" "$ac_arg" | sed "s/'/'\\\\\\\\''/g"` ;;
2015  esac
2016  as_fn_append ac_configure_args_raw " '$ac_arg'"
2017done
2018
2019case $ac_configure_args_raw in
2020  *$as_nl*)
2021    ac_safe_unquote= ;;
2022  *)
2023    ac_unsafe_z='|&;<>()$`\\"*?[ ''	' # This string ends in space, tab.
2024    ac_unsafe_a="$ac_unsafe_z#~"
2025    ac_safe_unquote="s/ '\\([^$ac_unsafe_a][^$ac_unsafe_z]*\\)'/ \\1/g"
2026    ac_configure_args_raw=`      printf "%s\n" "$ac_configure_args_raw" | sed "$ac_safe_unquote"`;;
2027esac
2028
2029cat >config.log <<_ACEOF
2030This file contains any messages produced by compilers while
2031running configure, to aid debugging if configure makes a mistake.
2032
2033It was created by Haskell unix package $as_me 2.0, which was
2034generated by GNU Autoconf 2.71.  Invocation command line was
2035
2036  $ $0$ac_configure_args_raw
2037
2038_ACEOF
2039exec 5>>config.log
2040{
2041cat <<_ASUNAME
2042## --------- ##
2043## Platform. ##
2044## --------- ##
2045
2046hostname = `(hostname || uname -n) 2>/dev/null | sed 1q`
2047uname -m = `(uname -m) 2>/dev/null || echo unknown`
2048uname -r = `(uname -r) 2>/dev/null || echo unknown`
2049uname -s = `(uname -s) 2>/dev/null || echo unknown`
2050uname -v = `(uname -v) 2>/dev/null || echo unknown`
2051
2052/usr/bin/uname -p = `(/usr/bin/uname -p) 2>/dev/null || echo unknown`
2053/bin/uname -X     = `(/bin/uname -X) 2>/dev/null     || echo unknown`
2054
2055/bin/arch              = `(/bin/arch) 2>/dev/null              || echo unknown`
2056/usr/bin/arch -k       = `(/usr/bin/arch -k) 2>/dev/null       || echo unknown`
2057/usr/convex/getsysinfo = `(/usr/convex/getsysinfo) 2>/dev/null || echo unknown`
2058/usr/bin/hostinfo      = `(/usr/bin/hostinfo) 2>/dev/null      || echo unknown`
2059/bin/machine           = `(/bin/machine) 2>/dev/null           || echo unknown`
2060/usr/bin/oslevel       = `(/usr/bin/oslevel) 2>/dev/null       || echo unknown`
2061/bin/universe          = `(/bin/universe) 2>/dev/null          || echo unknown`
2062
2063_ASUNAME
2064
2065as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2066for as_dir in $PATH
2067do
2068  IFS=$as_save_IFS
2069  case $as_dir in #(((
2070    '') as_dir=./ ;;
2071    */) ;;
2072    *) as_dir=$as_dir/ ;;
2073  esac
2074    printf "%s\n" "PATH: $as_dir"
2075  done
2076IFS=$as_save_IFS
2077
2078} >&5
2079
2080cat >&5 <<_ACEOF
2081
2082
2083## ----------- ##
2084## Core tests. ##
2085## ----------- ##
2086
2087_ACEOF
2088
2089
2090# Keep a trace of the command line.
2091# Strip out --no-create and --no-recursion so they do not pile up.
2092# Strip out --silent because we don't want to record it for future runs.
2093# Also quote any args containing shell meta-characters.
2094# Make two passes to allow for proper duplicate-argument suppression.
2095ac_configure_args=
2096ac_configure_args0=
2097ac_configure_args1=
2098ac_must_keep_next=false
2099for ac_pass in 1 2
2100do
2101  for ac_arg
2102  do
2103    case $ac_arg in
2104    -no-create | --no-c* | -n | -no-recursion | --no-r*) continue ;;
2105    -q | -quiet | --quiet | --quie | --qui | --qu | --q \
2106    | -silent | --silent | --silen | --sile | --sil)
2107      continue ;;
2108    *\'*)
2109      ac_arg=`printf "%s\n" "$ac_arg" | sed "s/'/'\\\\\\\\''/g"` ;;
2110    esac
2111    case $ac_pass in
2112    1) as_fn_append ac_configure_args0 " '$ac_arg'" ;;
2113    2)
2114      as_fn_append ac_configure_args1 " '$ac_arg'"
2115      if test $ac_must_keep_next = true; then
2116	ac_must_keep_next=false # Got value, back to normal.
2117      else
2118	case $ac_arg in
2119	  *=* | --config-cache | -C | -disable-* | --disable-* \
2120	  | -enable-* | --enable-* | -gas | --g* | -nfp | --nf* \
2121	  | -q | -quiet | --q* | -silent | --sil* | -v | -verb* \
2122	  | -with-* | --with-* | -without-* | --without-* | --x)
2123	    case "$ac_configure_args0 " in
2124	      "$ac_configure_args1"*" '$ac_arg' "* ) continue ;;
2125	    esac
2126	    ;;
2127	  -* ) ac_must_keep_next=true ;;
2128	esac
2129      fi
2130      as_fn_append ac_configure_args " '$ac_arg'"
2131      ;;
2132    esac
2133  done
2134done
2135{ ac_configure_args0=; unset ac_configure_args0;}
2136{ ac_configure_args1=; unset ac_configure_args1;}
2137
2138# When interrupted or exit'd, cleanup temporary files, and complete
2139# config.log.  We remove comments because anyway the quotes in there
2140# would cause problems or look ugly.
2141# WARNING: Use '\'' to represent an apostrophe within the trap.
2142# WARNING: Do not start the trap code with a newline, due to a FreeBSD 4.0 bug.
2143trap 'exit_status=$?
2144  # Sanitize IFS.
2145  IFS=" ""	$as_nl"
2146  # Save into config.log some information that might help in debugging.
2147  {
2148    echo
2149
2150    printf "%s\n" "## ---------------- ##
2151## Cache variables. ##
2152## ---------------- ##"
2153    echo
2154    # The following way of writing the cache mishandles newlines in values,
2155(
2156  for ac_var in `(set) 2>&1 | sed -n '\''s/^\([a-zA-Z_][a-zA-Z0-9_]*\)=.*/\1/p'\''`; do
2157    eval ac_val=\$$ac_var
2158    case $ac_val in #(
2159    *${as_nl}*)
2160      case $ac_var in #(
2161      *_cv_*) { printf "%s\n" "$as_me:${as_lineno-$LINENO}: WARNING: cache variable $ac_var contains a newline" >&5
2162printf "%s\n" "$as_me: WARNING: cache variable $ac_var contains a newline" >&2;} ;;
2163      esac
2164      case $ac_var in #(
2165      _ | IFS | as_nl) ;; #(
2166      BASH_ARGV | BASH_SOURCE) eval $ac_var= ;; #(
2167      *) { eval $ac_var=; unset $ac_var;} ;;
2168      esac ;;
2169    esac
2170  done
2171  (set) 2>&1 |
2172    case $as_nl`(ac_space='\'' '\''; set) 2>&1` in #(
2173    *${as_nl}ac_space=\ *)
2174      sed -n \
2175	"s/'\''/'\''\\\\'\'''\''/g;
2176	  s/^\\([_$as_cr_alnum]*_cv_[_$as_cr_alnum]*\\)=\\(.*\\)/\\1='\''\\2'\''/p"
2177      ;; #(
2178    *)
2179      sed -n "/^[_$as_cr_alnum]*_cv_[_$as_cr_alnum]*=/p"
2180      ;;
2181    esac |
2182    sort
2183)
2184    echo
2185
2186    printf "%s\n" "## ----------------- ##
2187## Output variables. ##
2188## ----------------- ##"
2189    echo
2190    for ac_var in $ac_subst_vars
2191    do
2192      eval ac_val=\$$ac_var
2193      case $ac_val in
2194      *\'\''*) ac_val=`printf "%s\n" "$ac_val" | sed "s/'\''/'\''\\\\\\\\'\'''\''/g"`;;
2195      esac
2196      printf "%s\n" "$ac_var='\''$ac_val'\''"
2197    done | sort
2198    echo
2199
2200    if test -n "$ac_subst_files"; then
2201      printf "%s\n" "## ------------------- ##
2202## File substitutions. ##
2203## ------------------- ##"
2204      echo
2205      for ac_var in $ac_subst_files
2206      do
2207	eval ac_val=\$$ac_var
2208	case $ac_val in
2209	*\'\''*) ac_val=`printf "%s\n" "$ac_val" | sed "s/'\''/'\''\\\\\\\\'\'''\''/g"`;;
2210	esac
2211	printf "%s\n" "$ac_var='\''$ac_val'\''"
2212      done | sort
2213      echo
2214    fi
2215
2216    if test -s confdefs.h; then
2217      printf "%s\n" "## ----------- ##
2218## confdefs.h. ##
2219## ----------- ##"
2220      echo
2221      cat confdefs.h
2222      echo
2223    fi
2224    test "$ac_signal" != 0 &&
2225      printf "%s\n" "$as_me: caught signal $ac_signal"
2226    printf "%s\n" "$as_me: exit $exit_status"
2227  } >&5
2228  rm -f core *.core core.conftest.* &&
2229    rm -f -r conftest* confdefs* conf$$* $ac_clean_files &&
2230    exit $exit_status
2231' 0
2232for ac_signal in 1 2 13 15; do
2233  trap 'ac_signal='$ac_signal'; as_fn_exit 1' $ac_signal
2234done
2235ac_signal=0
2236
2237# confdefs.h avoids OS command line length limits that DEFS can exceed.
2238rm -f -r conftest* confdefs.h
2239
2240printf "%s\n" "/* confdefs.h */" > confdefs.h
2241
2242# Predefined preprocessor variables.
2243
2244printf "%s\n" "#define PACKAGE_NAME \"$PACKAGE_NAME\"" >>confdefs.h
2245
2246printf "%s\n" "#define PACKAGE_TARNAME \"$PACKAGE_TARNAME\"" >>confdefs.h
2247
2248printf "%s\n" "#define PACKAGE_VERSION \"$PACKAGE_VERSION\"" >>confdefs.h
2249
2250printf "%s\n" "#define PACKAGE_STRING \"$PACKAGE_STRING\"" >>confdefs.h
2251
2252printf "%s\n" "#define PACKAGE_BUGREPORT \"$PACKAGE_BUGREPORT\"" >>confdefs.h
2253
2254printf "%s\n" "#define PACKAGE_URL \"$PACKAGE_URL\"" >>confdefs.h
2255
2256
2257# Let the site file select an alternate cache file if it wants to.
2258# Prefer an explicitly selected file to automatically selected ones.
2259if test -n "$CONFIG_SITE"; then
2260  ac_site_files="$CONFIG_SITE"
2261elif test "x$prefix" != xNONE; then
2262  ac_site_files="$prefix/share/config.site $prefix/etc/config.site"
2263else
2264  ac_site_files="$ac_default_prefix/share/config.site $ac_default_prefix/etc/config.site"
2265fi
2266
2267for ac_site_file in $ac_site_files
2268do
2269  case $ac_site_file in #(
2270  */*) :
2271     ;; #(
2272  *) :
2273    ac_site_file=./$ac_site_file ;;
2274esac
2275  if test -f "$ac_site_file" && test -r "$ac_site_file"; then
2276    { printf "%s\n" "$as_me:${as_lineno-$LINENO}: loading site script $ac_site_file" >&5
2277printf "%s\n" "$as_me: loading site script $ac_site_file" >&6;}
2278    sed 's/^/| /' "$ac_site_file" >&5
2279    . "$ac_site_file" \
2280      || { { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
2281printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
2282as_fn_error $? "failed to load site script $ac_site_file
2283See \`config.log' for more details" "$LINENO" 5; }
2284  fi
2285done
2286
2287if test -r "$cache_file"; then
2288  # Some versions of bash will fail to source /dev/null (special files
2289  # actually), so we avoid doing that.  DJGPP emulates it as a regular file.
2290  if test /dev/null != "$cache_file" && test -f "$cache_file"; then
2291    { printf "%s\n" "$as_me:${as_lineno-$LINENO}: loading cache $cache_file" >&5
2292printf "%s\n" "$as_me: loading cache $cache_file" >&6;}
2293    case $cache_file in
2294      [\\/]* | ?:[\\/]* ) . "$cache_file";;
2295      *)                      . "./$cache_file";;
2296    esac
2297  fi
2298else
2299  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: creating cache $cache_file" >&5
2300printf "%s\n" "$as_me: creating cache $cache_file" >&6;}
2301  >$cache_file
2302fi
2303
2304# Test code for whether the C compiler supports C89 (global declarations)
2305ac_c_conftest_c89_globals='
2306/* Does the compiler advertise C89 conformance?
2307   Do not test the value of __STDC__, because some compilers set it to 0
2308   while being otherwise adequately conformant. */
2309#if !defined __STDC__
2310# error "Compiler does not advertise C89 conformance"
2311#endif
2312
2313#include <stddef.h>
2314#include <stdarg.h>
2315struct stat;
2316/* Most of the following tests are stolen from RCS 5.7 src/conf.sh.  */
2317struct buf { int x; };
2318struct buf * (*rcsopen) (struct buf *, struct stat *, int);
2319static char *e (p, i)
2320     char **p;
2321     int i;
2322{
2323  return p[i];
2324}
2325static char *f (char * (*g) (char **, int), char **p, ...)
2326{
2327  char *s;
2328  va_list v;
2329  va_start (v,p);
2330  s = g (p, va_arg (v,int));
2331  va_end (v);
2332  return s;
2333}
2334
2335/* OSF 4.0 Compaq cc is some sort of almost-ANSI by default.  It has
2336   function prototypes and stuff, but not \xHH hex character constants.
2337   These do not provoke an error unfortunately, instead are silently treated
2338   as an "x".  The following induces an error, until -std is added to get
2339   proper ANSI mode.  Curiously \x00 != x always comes out true, for an
2340   array size at least.  It is necessary to write \x00 == 0 to get something
2341   that is true only with -std.  */
2342int osf4_cc_array ['\''\x00'\'' == 0 ? 1 : -1];
2343
2344/* IBM C 6 for AIX is almost-ANSI by default, but it replaces macro parameters
2345   inside strings and character constants.  */
2346#define FOO(x) '\''x'\''
2347int xlc6_cc_array[FOO(a) == '\''x'\'' ? 1 : -1];
2348
2349int test (int i, double x);
2350struct s1 {int (*f) (int a);};
2351struct s2 {int (*f) (double a);};
2352int pairnames (int, char **, int *(*)(struct buf *, struct stat *, int),
2353               int, int);'
2354
2355# Test code for whether the C compiler supports C89 (body of main).
2356ac_c_conftest_c89_main='
2357ok |= (argc == 0 || f (e, argv, 0) != argv[0] || f (e, argv, 1) != argv[1]);
2358'
2359
2360# Test code for whether the C compiler supports C99 (global declarations)
2361ac_c_conftest_c99_globals='
2362// Does the compiler advertise C99 conformance?
2363#if !defined __STDC_VERSION__ || __STDC_VERSION__ < 199901L
2364# error "Compiler does not advertise C99 conformance"
2365#endif
2366
2367#include <stdbool.h>
2368extern int puts (const char *);
2369extern int printf (const char *, ...);
2370extern int dprintf (int, const char *, ...);
2371extern void *malloc (size_t);
2372
2373// Check varargs macros.  These examples are taken from C99 6.10.3.5.
2374// dprintf is used instead of fprintf to avoid needing to declare
2375// FILE and stderr.
2376#define debug(...) dprintf (2, __VA_ARGS__)
2377#define showlist(...) puts (#__VA_ARGS__)
2378#define report(test,...) ((test) ? puts (#test) : printf (__VA_ARGS__))
2379static void
2380test_varargs_macros (void)
2381{
2382  int x = 1234;
2383  int y = 5678;
2384  debug ("Flag");
2385  debug ("X = %d\n", x);
2386  showlist (The first, second, and third items.);
2387  report (x>y, "x is %d but y is %d", x, y);
2388}
2389
2390// Check long long types.
2391#define BIG64 18446744073709551615ull
2392#define BIG32 4294967295ul
2393#define BIG_OK (BIG64 / BIG32 == 4294967297ull && BIG64 % BIG32 == 0)
2394#if !BIG_OK
2395  #error "your preprocessor is broken"
2396#endif
2397#if BIG_OK
2398#else
2399  #error "your preprocessor is broken"
2400#endif
2401static long long int bignum = -9223372036854775807LL;
2402static unsigned long long int ubignum = BIG64;
2403
2404struct incomplete_array
2405{
2406  int datasize;
2407  double data[];
2408};
2409
2410struct named_init {
2411  int number;
2412  const wchar_t *name;
2413  double average;
2414};
2415
2416typedef const char *ccp;
2417
2418static inline int
2419test_restrict (ccp restrict text)
2420{
2421  // See if C++-style comments work.
2422  // Iterate through items via the restricted pointer.
2423  // Also check for declarations in for loops.
2424  for (unsigned int i = 0; *(text+i) != '\''\0'\''; ++i)
2425    continue;
2426  return 0;
2427}
2428
2429// Check varargs and va_copy.
2430static bool
2431test_varargs (const char *format, ...)
2432{
2433  va_list args;
2434  va_start (args, format);
2435  va_list args_copy;
2436  va_copy (args_copy, args);
2437
2438  const char *str = "";
2439  int number = 0;
2440  float fnumber = 0;
2441
2442  while (*format)
2443    {
2444      switch (*format++)
2445	{
2446	case '\''s'\'': // string
2447	  str = va_arg (args_copy, const char *);
2448	  break;
2449	case '\''d'\'': // int
2450	  number = va_arg (args_copy, int);
2451	  break;
2452	case '\''f'\'': // float
2453	  fnumber = va_arg (args_copy, double);
2454	  break;
2455	default:
2456	  break;
2457	}
2458    }
2459  va_end (args_copy);
2460  va_end (args);
2461
2462  return *str && number && fnumber;
2463}
2464'
2465
2466# Test code for whether the C compiler supports C99 (body of main).
2467ac_c_conftest_c99_main='
2468  // Check bool.
2469  _Bool success = false;
2470  success |= (argc != 0);
2471
2472  // Check restrict.
2473  if (test_restrict ("String literal") == 0)
2474    success = true;
2475  char *restrict newvar = "Another string";
2476
2477  // Check varargs.
2478  success &= test_varargs ("s, d'\'' f .", "string", 65, 34.234);
2479  test_varargs_macros ();
2480
2481  // Check flexible array members.
2482  struct incomplete_array *ia =
2483    malloc (sizeof (struct incomplete_array) + (sizeof (double) * 10));
2484  ia->datasize = 10;
2485  for (int i = 0; i < ia->datasize; ++i)
2486    ia->data[i] = i * 1.234;
2487
2488  // Check named initializers.
2489  struct named_init ni = {
2490    .number = 34,
2491    .name = L"Test wide string",
2492    .average = 543.34343,
2493  };
2494
2495  ni.number = 58;
2496
2497  int dynamic_array[ni.number];
2498  dynamic_array[0] = argv[0][0];
2499  dynamic_array[ni.number - 1] = 543;
2500
2501  // work around unused variable warnings
2502  ok |= (!success || bignum == 0LL || ubignum == 0uLL || newvar[0] == '\''x'\''
2503	 || dynamic_array[ni.number - 1] != 543);
2504'
2505
2506# Test code for whether the C compiler supports C11 (global declarations)
2507ac_c_conftest_c11_globals='
2508// Does the compiler advertise C11 conformance?
2509#if !defined __STDC_VERSION__ || __STDC_VERSION__ < 201112L
2510# error "Compiler does not advertise C11 conformance"
2511#endif
2512
2513// Check _Alignas.
2514char _Alignas (double) aligned_as_double;
2515char _Alignas (0) no_special_alignment;
2516extern char aligned_as_int;
2517char _Alignas (0) _Alignas (int) aligned_as_int;
2518
2519// Check _Alignof.
2520enum
2521{
2522  int_alignment = _Alignof (int),
2523  int_array_alignment = _Alignof (int[100]),
2524  char_alignment = _Alignof (char)
2525};
2526_Static_assert (0 < -_Alignof (int), "_Alignof is signed");
2527
2528// Check _Noreturn.
2529int _Noreturn does_not_return (void) { for (;;) continue; }
2530
2531// Check _Static_assert.
2532struct test_static_assert
2533{
2534  int x;
2535  _Static_assert (sizeof (int) <= sizeof (long int),
2536                  "_Static_assert does not work in struct");
2537  long int y;
2538};
2539
2540// Check UTF-8 literals.
2541#define u8 syntax error!
2542char const utf8_literal[] = u8"happens to be ASCII" "another string";
2543
2544// Check duplicate typedefs.
2545typedef long *long_ptr;
2546typedef long int *long_ptr;
2547typedef long_ptr long_ptr;
2548
2549// Anonymous structures and unions -- taken from C11 6.7.2.1 Example 1.
2550struct anonymous
2551{
2552  union {
2553    struct { int i; int j; };
2554    struct { int k; long int l; } w;
2555  };
2556  int m;
2557} v1;
2558'
2559
2560# Test code for whether the C compiler supports C11 (body of main).
2561ac_c_conftest_c11_main='
2562  _Static_assert ((offsetof (struct anonymous, i)
2563		   == offsetof (struct anonymous, w.k)),
2564		  "Anonymous union alignment botch");
2565  v1.i = 2;
2566  v1.w.k = 5;
2567  ok |= v1.i != 5;
2568'
2569
2570# Test code for whether the C compiler supports C11 (complete).
2571ac_c_conftest_c11_program="${ac_c_conftest_c89_globals}
2572${ac_c_conftest_c99_globals}
2573${ac_c_conftest_c11_globals}
2574
2575int
2576main (int argc, char **argv)
2577{
2578  int ok = 0;
2579  ${ac_c_conftest_c89_main}
2580  ${ac_c_conftest_c99_main}
2581  ${ac_c_conftest_c11_main}
2582  return ok;
2583}
2584"
2585
2586# Test code for whether the C compiler supports C99 (complete).
2587ac_c_conftest_c99_program="${ac_c_conftest_c89_globals}
2588${ac_c_conftest_c99_globals}
2589
2590int
2591main (int argc, char **argv)
2592{
2593  int ok = 0;
2594  ${ac_c_conftest_c89_main}
2595  ${ac_c_conftest_c99_main}
2596  return ok;
2597}
2598"
2599
2600# Test code for whether the C compiler supports C89 (complete).
2601ac_c_conftest_c89_program="${ac_c_conftest_c89_globals}
2602
2603int
2604main (int argc, char **argv)
2605{
2606  int ok = 0;
2607  ${ac_c_conftest_c89_main}
2608  return ok;
2609}
2610"
2611
2612as_fn_append ac_header_c_list " stdio.h stdio_h HAVE_STDIO_H"
2613as_fn_append ac_header_c_list " stdlib.h stdlib_h HAVE_STDLIB_H"
2614as_fn_append ac_header_c_list " string.h string_h HAVE_STRING_H"
2615as_fn_append ac_header_c_list " inttypes.h inttypes_h HAVE_INTTYPES_H"
2616as_fn_append ac_header_c_list " stdint.h stdint_h HAVE_STDINT_H"
2617as_fn_append ac_header_c_list " strings.h strings_h HAVE_STRINGS_H"
2618as_fn_append ac_header_c_list " sys/stat.h sys_stat_h HAVE_SYS_STAT_H"
2619as_fn_append ac_header_c_list " sys/types.h sys_types_h HAVE_SYS_TYPES_H"
2620as_fn_append ac_header_c_list " unistd.h unistd_h HAVE_UNISTD_H"
2621as_fn_append ac_header_c_list " wchar.h wchar_h HAVE_WCHAR_H"
2622as_fn_append ac_header_c_list " minix/config.h minix_config_h HAVE_MINIX_CONFIG_H"
2623
2624# Auxiliary files required by this configure script.
2625ac_aux_files="config.guess config.sub"
2626
2627# Locations in which to look for auxiliary files.
2628ac_aux_dir_candidates="${srcdir}${PATH_SEPARATOR}${srcdir}/..${PATH_SEPARATOR}${srcdir}/../.."
2629
2630# Search for a directory containing all of the required auxiliary files,
2631# $ac_aux_files, from the $PATH-style list $ac_aux_dir_candidates.
2632# If we don't find one directory that contains all the files we need,
2633# we report the set of missing files from the *first* directory in
2634# $ac_aux_dir_candidates and give up.
2635ac_missing_aux_files=""
2636ac_first_candidate=:
2637printf "%s\n" "$as_me:${as_lineno-$LINENO}: looking for aux files: $ac_aux_files" >&5
2638as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2639as_found=false
2640for as_dir in $ac_aux_dir_candidates
2641do
2642  IFS=$as_save_IFS
2643  case $as_dir in #(((
2644    '') as_dir=./ ;;
2645    */) ;;
2646    *) as_dir=$as_dir/ ;;
2647  esac
2648  as_found=:
2649
2650  printf "%s\n" "$as_me:${as_lineno-$LINENO}:  trying $as_dir" >&5
2651  ac_aux_dir_found=yes
2652  ac_install_sh=
2653  for ac_aux in $ac_aux_files
2654  do
2655    # As a special case, if "install-sh" is required, that requirement
2656    # can be satisfied by any of "install-sh", "install.sh", or "shtool",
2657    # and $ac_install_sh is set appropriately for whichever one is found.
2658    if test x"$ac_aux" = x"install-sh"
2659    then
2660      if test -f "${as_dir}install-sh"; then
2661        printf "%s\n" "$as_me:${as_lineno-$LINENO}:   ${as_dir}install-sh found" >&5
2662        ac_install_sh="${as_dir}install-sh -c"
2663      elif test -f "${as_dir}install.sh"; then
2664        printf "%s\n" "$as_me:${as_lineno-$LINENO}:   ${as_dir}install.sh found" >&5
2665        ac_install_sh="${as_dir}install.sh -c"
2666      elif test -f "${as_dir}shtool"; then
2667        printf "%s\n" "$as_me:${as_lineno-$LINENO}:   ${as_dir}shtool found" >&5
2668        ac_install_sh="${as_dir}shtool install -c"
2669      else
2670        ac_aux_dir_found=no
2671        if $ac_first_candidate; then
2672          ac_missing_aux_files="${ac_missing_aux_files} install-sh"
2673        else
2674          break
2675        fi
2676      fi
2677    else
2678      if test -f "${as_dir}${ac_aux}"; then
2679        printf "%s\n" "$as_me:${as_lineno-$LINENO}:   ${as_dir}${ac_aux} found" >&5
2680      else
2681        ac_aux_dir_found=no
2682        if $ac_first_candidate; then
2683          ac_missing_aux_files="${ac_missing_aux_files} ${ac_aux}"
2684        else
2685          break
2686        fi
2687      fi
2688    fi
2689  done
2690  if test "$ac_aux_dir_found" = yes; then
2691    ac_aux_dir="$as_dir"
2692    break
2693  fi
2694  ac_first_candidate=false
2695
2696  as_found=false
2697done
2698IFS=$as_save_IFS
2699if $as_found
2700then :
2701
2702else $as_nop
2703  as_fn_error $? "cannot find required auxiliary files:$ac_missing_aux_files" "$LINENO" 5
2704fi
2705
2706
2707# These three variables are undocumented and unsupported,
2708# and are intended to be withdrawn in a future Autoconf release.
2709# They can cause serious problems if a builder's source tree is in a directory
2710# whose full name contains unusual characters.
2711if test -f "${ac_aux_dir}config.guess"; then
2712  ac_config_guess="$SHELL ${ac_aux_dir}config.guess"
2713fi
2714if test -f "${ac_aux_dir}config.sub"; then
2715  ac_config_sub="$SHELL ${ac_aux_dir}config.sub"
2716fi
2717if test -f "$ac_aux_dir/configure"; then
2718  ac_configure="$SHELL ${ac_aux_dir}configure"
2719fi
2720
2721# Check that the precious variables saved in the cache have kept the same
2722# value.
2723ac_cache_corrupted=false
2724for ac_var in $ac_precious_vars; do
2725  eval ac_old_set=\$ac_cv_env_${ac_var}_set
2726  eval ac_new_set=\$ac_env_${ac_var}_set
2727  eval ac_old_val=\$ac_cv_env_${ac_var}_value
2728  eval ac_new_val=\$ac_env_${ac_var}_value
2729  case $ac_old_set,$ac_new_set in
2730    set,)
2731      { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: \`$ac_var' was set to \`$ac_old_val' in the previous run" >&5
2732printf "%s\n" "$as_me: error: \`$ac_var' was set to \`$ac_old_val' in the previous run" >&2;}
2733      ac_cache_corrupted=: ;;
2734    ,set)
2735      { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: \`$ac_var' was not set in the previous run" >&5
2736printf "%s\n" "$as_me: error: \`$ac_var' was not set in the previous run" >&2;}
2737      ac_cache_corrupted=: ;;
2738    ,);;
2739    *)
2740      if test "x$ac_old_val" != "x$ac_new_val"; then
2741	# differences in whitespace do not lead to failure.
2742	ac_old_val_w=`echo x $ac_old_val`
2743	ac_new_val_w=`echo x $ac_new_val`
2744	if test "$ac_old_val_w" != "$ac_new_val_w"; then
2745	  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: \`$ac_var' has changed since the previous run:" >&5
2746printf "%s\n" "$as_me: error: \`$ac_var' has changed since the previous run:" >&2;}
2747	  ac_cache_corrupted=:
2748	else
2749	  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: warning: ignoring whitespace changes in \`$ac_var' since the previous run:" >&5
2750printf "%s\n" "$as_me: warning: ignoring whitespace changes in \`$ac_var' since the previous run:" >&2;}
2751	  eval $ac_var=\$ac_old_val
2752	fi
2753	{ printf "%s\n" "$as_me:${as_lineno-$LINENO}:   former value:  \`$ac_old_val'" >&5
2754printf "%s\n" "$as_me:   former value:  \`$ac_old_val'" >&2;}
2755	{ printf "%s\n" "$as_me:${as_lineno-$LINENO}:   current value: \`$ac_new_val'" >&5
2756printf "%s\n" "$as_me:   current value: \`$ac_new_val'" >&2;}
2757      fi;;
2758  esac
2759  # Pass precious variables to config.status.
2760  if test "$ac_new_set" = set; then
2761    case $ac_new_val in
2762    *\'*) ac_arg=$ac_var=`printf "%s\n" "$ac_new_val" | sed "s/'/'\\\\\\\\''/g"` ;;
2763    *) ac_arg=$ac_var=$ac_new_val ;;
2764    esac
2765    case " $ac_configure_args " in
2766      *" '$ac_arg' "*) ;; # Avoid dups.  Use of quotes ensures accuracy.
2767      *) as_fn_append ac_configure_args " '$ac_arg'" ;;
2768    esac
2769  fi
2770done
2771if $ac_cache_corrupted; then
2772  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
2773printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
2774  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: changes in the environment can compromise the build" >&5
2775printf "%s\n" "$as_me: error: changes in the environment can compromise the build" >&2;}
2776  as_fn_error $? "run \`${MAKE-make} distclean' and/or \`rm $cache_file'
2777	    and start over" "$LINENO" 5
2778fi
2779## -------------------- ##
2780## Main body of script. ##
2781## -------------------- ##
2782
2783ac_ext=c
2784ac_cpp='$CPP $CPPFLAGS'
2785ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
2786ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
2787ac_compiler_gnu=$ac_cv_c_compiler_gnu
2788
2789
2790
2791# Safety check: Ensure that we are in the correct source directory.
2792
2793
2794
2795
2796
2797
2798
2799
2800
2801
2802
2803ac_ext=c
2804ac_cpp='$CPP $CPPFLAGS'
2805ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
2806ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
2807ac_compiler_gnu=$ac_cv_c_compiler_gnu
2808if test -n "$ac_tool_prefix"; then
2809  # Extract the first word of "${ac_tool_prefix}gcc", so it can be a program name with args.
2810set dummy ${ac_tool_prefix}gcc; ac_word=$2
2811{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2812printf %s "checking for $ac_word... " >&6; }
2813if test ${ac_cv_prog_CC+y}
2814then :
2815  printf %s "(cached) " >&6
2816else $as_nop
2817  if test -n "$CC"; then
2818  ac_cv_prog_CC="$CC" # Let the user override the test.
2819else
2820as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2821for as_dir in $PATH
2822do
2823  IFS=$as_save_IFS
2824  case $as_dir in #(((
2825    '') as_dir=./ ;;
2826    */) ;;
2827    *) as_dir=$as_dir/ ;;
2828  esac
2829    for ac_exec_ext in '' $ac_executable_extensions; do
2830  if as_fn_executable_p "$as_dir$ac_word$ac_exec_ext"; then
2831    ac_cv_prog_CC="${ac_tool_prefix}gcc"
2832    printf "%s\n" "$as_me:${as_lineno-$LINENO}: found $as_dir$ac_word$ac_exec_ext" >&5
2833    break 2
2834  fi
2835done
2836  done
2837IFS=$as_save_IFS
2838
2839fi
2840fi
2841CC=$ac_cv_prog_CC
2842if test -n "$CC"; then
2843  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
2844printf "%s\n" "$CC" >&6; }
2845else
2846  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
2847printf "%s\n" "no" >&6; }
2848fi
2849
2850
2851fi
2852if test -z "$ac_cv_prog_CC"; then
2853  ac_ct_CC=$CC
2854  # Extract the first word of "gcc", so it can be a program name with args.
2855set dummy gcc; ac_word=$2
2856{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2857printf %s "checking for $ac_word... " >&6; }
2858if test ${ac_cv_prog_ac_ct_CC+y}
2859then :
2860  printf %s "(cached) " >&6
2861else $as_nop
2862  if test -n "$ac_ct_CC"; then
2863  ac_cv_prog_ac_ct_CC="$ac_ct_CC" # Let the user override the test.
2864else
2865as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2866for as_dir in $PATH
2867do
2868  IFS=$as_save_IFS
2869  case $as_dir in #(((
2870    '') as_dir=./ ;;
2871    */) ;;
2872    *) as_dir=$as_dir/ ;;
2873  esac
2874    for ac_exec_ext in '' $ac_executable_extensions; do
2875  if as_fn_executable_p "$as_dir$ac_word$ac_exec_ext"; then
2876    ac_cv_prog_ac_ct_CC="gcc"
2877    printf "%s\n" "$as_me:${as_lineno-$LINENO}: found $as_dir$ac_word$ac_exec_ext" >&5
2878    break 2
2879  fi
2880done
2881  done
2882IFS=$as_save_IFS
2883
2884fi
2885fi
2886ac_ct_CC=$ac_cv_prog_ac_ct_CC
2887if test -n "$ac_ct_CC"; then
2888  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_ct_CC" >&5
2889printf "%s\n" "$ac_ct_CC" >&6; }
2890else
2891  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
2892printf "%s\n" "no" >&6; }
2893fi
2894
2895  if test "x$ac_ct_CC" = x; then
2896    CC=""
2897  else
2898    case $cross_compiling:$ac_tool_warned in
2899yes:)
2900{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: WARNING: using cross tools not prefixed with host triplet" >&5
2901printf "%s\n" "$as_me: WARNING: using cross tools not prefixed with host triplet" >&2;}
2902ac_tool_warned=yes ;;
2903esac
2904    CC=$ac_ct_CC
2905  fi
2906else
2907  CC="$ac_cv_prog_CC"
2908fi
2909
2910if test -z "$CC"; then
2911          if test -n "$ac_tool_prefix"; then
2912    # Extract the first word of "${ac_tool_prefix}cc", so it can be a program name with args.
2913set dummy ${ac_tool_prefix}cc; ac_word=$2
2914{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2915printf %s "checking for $ac_word... " >&6; }
2916if test ${ac_cv_prog_CC+y}
2917then :
2918  printf %s "(cached) " >&6
2919else $as_nop
2920  if test -n "$CC"; then
2921  ac_cv_prog_CC="$CC" # Let the user override the test.
2922else
2923as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2924for as_dir in $PATH
2925do
2926  IFS=$as_save_IFS
2927  case $as_dir in #(((
2928    '') as_dir=./ ;;
2929    */) ;;
2930    *) as_dir=$as_dir/ ;;
2931  esac
2932    for ac_exec_ext in '' $ac_executable_extensions; do
2933  if as_fn_executable_p "$as_dir$ac_word$ac_exec_ext"; then
2934    ac_cv_prog_CC="${ac_tool_prefix}cc"
2935    printf "%s\n" "$as_me:${as_lineno-$LINENO}: found $as_dir$ac_word$ac_exec_ext" >&5
2936    break 2
2937  fi
2938done
2939  done
2940IFS=$as_save_IFS
2941
2942fi
2943fi
2944CC=$ac_cv_prog_CC
2945if test -n "$CC"; then
2946  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
2947printf "%s\n" "$CC" >&6; }
2948else
2949  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
2950printf "%s\n" "no" >&6; }
2951fi
2952
2953
2954  fi
2955fi
2956if test -z "$CC"; then
2957  # Extract the first word of "cc", so it can be a program name with args.
2958set dummy cc; ac_word=$2
2959{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2960printf %s "checking for $ac_word... " >&6; }
2961if test ${ac_cv_prog_CC+y}
2962then :
2963  printf %s "(cached) " >&6
2964else $as_nop
2965  if test -n "$CC"; then
2966  ac_cv_prog_CC="$CC" # Let the user override the test.
2967else
2968  ac_prog_rejected=no
2969as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2970for as_dir in $PATH
2971do
2972  IFS=$as_save_IFS
2973  case $as_dir in #(((
2974    '') as_dir=./ ;;
2975    */) ;;
2976    *) as_dir=$as_dir/ ;;
2977  esac
2978    for ac_exec_ext in '' $ac_executable_extensions; do
2979  if as_fn_executable_p "$as_dir$ac_word$ac_exec_ext"; then
2980    if test "$as_dir$ac_word$ac_exec_ext" = "/usr/ucb/cc"; then
2981       ac_prog_rejected=yes
2982       continue
2983     fi
2984    ac_cv_prog_CC="cc"
2985    printf "%s\n" "$as_me:${as_lineno-$LINENO}: found $as_dir$ac_word$ac_exec_ext" >&5
2986    break 2
2987  fi
2988done
2989  done
2990IFS=$as_save_IFS
2991
2992if test $ac_prog_rejected = yes; then
2993  # We found a bogon in the path, so make sure we never use it.
2994  set dummy $ac_cv_prog_CC
2995  shift
2996  if test $# != 0; then
2997    # We chose a different compiler from the bogus one.
2998    # However, it has the same basename, so the bogon will be chosen
2999    # first if we set CC to just the basename; use the full file name.
3000    shift
3001    ac_cv_prog_CC="$as_dir$ac_word${1+' '}$@"
3002  fi
3003fi
3004fi
3005fi
3006CC=$ac_cv_prog_CC
3007if test -n "$CC"; then
3008  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
3009printf "%s\n" "$CC" >&6; }
3010else
3011  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
3012printf "%s\n" "no" >&6; }
3013fi
3014
3015
3016fi
3017if test -z "$CC"; then
3018  if test -n "$ac_tool_prefix"; then
3019  for ac_prog in cl.exe
3020  do
3021    # Extract the first word of "$ac_tool_prefix$ac_prog", so it can be a program name with args.
3022set dummy $ac_tool_prefix$ac_prog; ac_word=$2
3023{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
3024printf %s "checking for $ac_word... " >&6; }
3025if test ${ac_cv_prog_CC+y}
3026then :
3027  printf %s "(cached) " >&6
3028else $as_nop
3029  if test -n "$CC"; then
3030  ac_cv_prog_CC="$CC" # Let the user override the test.
3031else
3032as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
3033for as_dir in $PATH
3034do
3035  IFS=$as_save_IFS
3036  case $as_dir in #(((
3037    '') as_dir=./ ;;
3038    */) ;;
3039    *) as_dir=$as_dir/ ;;
3040  esac
3041    for ac_exec_ext in '' $ac_executable_extensions; do
3042  if as_fn_executable_p "$as_dir$ac_word$ac_exec_ext"; then
3043    ac_cv_prog_CC="$ac_tool_prefix$ac_prog"
3044    printf "%s\n" "$as_me:${as_lineno-$LINENO}: found $as_dir$ac_word$ac_exec_ext" >&5
3045    break 2
3046  fi
3047done
3048  done
3049IFS=$as_save_IFS
3050
3051fi
3052fi
3053CC=$ac_cv_prog_CC
3054if test -n "$CC"; then
3055  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
3056printf "%s\n" "$CC" >&6; }
3057else
3058  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
3059printf "%s\n" "no" >&6; }
3060fi
3061
3062
3063    test -n "$CC" && break
3064  done
3065fi
3066if test -z "$CC"; then
3067  ac_ct_CC=$CC
3068  for ac_prog in cl.exe
3069do
3070  # Extract the first word of "$ac_prog", so it can be a program name with args.
3071set dummy $ac_prog; ac_word=$2
3072{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
3073printf %s "checking for $ac_word... " >&6; }
3074if test ${ac_cv_prog_ac_ct_CC+y}
3075then :
3076  printf %s "(cached) " >&6
3077else $as_nop
3078  if test -n "$ac_ct_CC"; then
3079  ac_cv_prog_ac_ct_CC="$ac_ct_CC" # Let the user override the test.
3080else
3081as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
3082for as_dir in $PATH
3083do
3084  IFS=$as_save_IFS
3085  case $as_dir in #(((
3086    '') as_dir=./ ;;
3087    */) ;;
3088    *) as_dir=$as_dir/ ;;
3089  esac
3090    for ac_exec_ext in '' $ac_executable_extensions; do
3091  if as_fn_executable_p "$as_dir$ac_word$ac_exec_ext"; then
3092    ac_cv_prog_ac_ct_CC="$ac_prog"
3093    printf "%s\n" "$as_me:${as_lineno-$LINENO}: found $as_dir$ac_word$ac_exec_ext" >&5
3094    break 2
3095  fi
3096done
3097  done
3098IFS=$as_save_IFS
3099
3100fi
3101fi
3102ac_ct_CC=$ac_cv_prog_ac_ct_CC
3103if test -n "$ac_ct_CC"; then
3104  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_ct_CC" >&5
3105printf "%s\n" "$ac_ct_CC" >&6; }
3106else
3107  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
3108printf "%s\n" "no" >&6; }
3109fi
3110
3111
3112  test -n "$ac_ct_CC" && break
3113done
3114
3115  if test "x$ac_ct_CC" = x; then
3116    CC=""
3117  else
3118    case $cross_compiling:$ac_tool_warned in
3119yes:)
3120{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: WARNING: using cross tools not prefixed with host triplet" >&5
3121printf "%s\n" "$as_me: WARNING: using cross tools not prefixed with host triplet" >&2;}
3122ac_tool_warned=yes ;;
3123esac
3124    CC=$ac_ct_CC
3125  fi
3126fi
3127
3128fi
3129if test -z "$CC"; then
3130  if test -n "$ac_tool_prefix"; then
3131  # Extract the first word of "${ac_tool_prefix}clang", so it can be a program name with args.
3132set dummy ${ac_tool_prefix}clang; ac_word=$2
3133{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
3134printf %s "checking for $ac_word... " >&6; }
3135if test ${ac_cv_prog_CC+y}
3136then :
3137  printf %s "(cached) " >&6
3138else $as_nop
3139  if test -n "$CC"; then
3140  ac_cv_prog_CC="$CC" # Let the user override the test.
3141else
3142as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
3143for as_dir in $PATH
3144do
3145  IFS=$as_save_IFS
3146  case $as_dir in #(((
3147    '') as_dir=./ ;;
3148    */) ;;
3149    *) as_dir=$as_dir/ ;;
3150  esac
3151    for ac_exec_ext in '' $ac_executable_extensions; do
3152  if as_fn_executable_p "$as_dir$ac_word$ac_exec_ext"; then
3153    ac_cv_prog_CC="${ac_tool_prefix}clang"
3154    printf "%s\n" "$as_me:${as_lineno-$LINENO}: found $as_dir$ac_word$ac_exec_ext" >&5
3155    break 2
3156  fi
3157done
3158  done
3159IFS=$as_save_IFS
3160
3161fi
3162fi
3163CC=$ac_cv_prog_CC
3164if test -n "$CC"; then
3165  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
3166printf "%s\n" "$CC" >&6; }
3167else
3168  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
3169printf "%s\n" "no" >&6; }
3170fi
3171
3172
3173fi
3174if test -z "$ac_cv_prog_CC"; then
3175  ac_ct_CC=$CC
3176  # Extract the first word of "clang", so it can be a program name with args.
3177set dummy clang; ac_word=$2
3178{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
3179printf %s "checking for $ac_word... " >&6; }
3180if test ${ac_cv_prog_ac_ct_CC+y}
3181then :
3182  printf %s "(cached) " >&6
3183else $as_nop
3184  if test -n "$ac_ct_CC"; then
3185  ac_cv_prog_ac_ct_CC="$ac_ct_CC" # Let the user override the test.
3186else
3187as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
3188for as_dir in $PATH
3189do
3190  IFS=$as_save_IFS
3191  case $as_dir in #(((
3192    '') as_dir=./ ;;
3193    */) ;;
3194    *) as_dir=$as_dir/ ;;
3195  esac
3196    for ac_exec_ext in '' $ac_executable_extensions; do
3197  if as_fn_executable_p "$as_dir$ac_word$ac_exec_ext"; then
3198    ac_cv_prog_ac_ct_CC="clang"
3199    printf "%s\n" "$as_me:${as_lineno-$LINENO}: found $as_dir$ac_word$ac_exec_ext" >&5
3200    break 2
3201  fi
3202done
3203  done
3204IFS=$as_save_IFS
3205
3206fi
3207fi
3208ac_ct_CC=$ac_cv_prog_ac_ct_CC
3209if test -n "$ac_ct_CC"; then
3210  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_ct_CC" >&5
3211printf "%s\n" "$ac_ct_CC" >&6; }
3212else
3213  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
3214printf "%s\n" "no" >&6; }
3215fi
3216
3217  if test "x$ac_ct_CC" = x; then
3218    CC=""
3219  else
3220    case $cross_compiling:$ac_tool_warned in
3221yes:)
3222{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: WARNING: using cross tools not prefixed with host triplet" >&5
3223printf "%s\n" "$as_me: WARNING: using cross tools not prefixed with host triplet" >&2;}
3224ac_tool_warned=yes ;;
3225esac
3226    CC=$ac_ct_CC
3227  fi
3228else
3229  CC="$ac_cv_prog_CC"
3230fi
3231
3232fi
3233
3234
3235test -z "$CC" && { { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
3236printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
3237as_fn_error $? "no acceptable C compiler found in \$PATH
3238See \`config.log' for more details" "$LINENO" 5; }
3239
3240# Provide some information about the compiler.
3241printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for C compiler version" >&5
3242set X $ac_compile
3243ac_compiler=$2
3244for ac_option in --version -v -V -qversion -version; do
3245  { { ac_try="$ac_compiler $ac_option >&5"
3246case "(($ac_try" in
3247  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
3248  *) ac_try_echo=$ac_try;;
3249esac
3250eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
3251printf "%s\n" "$ac_try_echo"; } >&5
3252  (eval "$ac_compiler $ac_option >&5") 2>conftest.err
3253  ac_status=$?
3254  if test -s conftest.err; then
3255    sed '10a\
3256... rest of stderr output deleted ...
3257         10q' conftest.err >conftest.er1
3258    cat conftest.er1 >&5
3259  fi
3260  rm -f conftest.er1 conftest.err
3261  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
3262  test $ac_status = 0; }
3263done
3264
3265cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3266/* end confdefs.h.  */
3267
3268int
3269main (void)
3270{
3271
3272  ;
3273  return 0;
3274}
3275_ACEOF
3276ac_clean_files_save=$ac_clean_files
3277ac_clean_files="$ac_clean_files a.out a.out.dSYM a.exe b.out"
3278# Try to create an executable without -o first, disregard a.out.
3279# It will help us diagnose broken compilers, and finding out an intuition
3280# of exeext.
3281{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking whether the C compiler works" >&5
3282printf %s "checking whether the C compiler works... " >&6; }
3283ac_link_default=`printf "%s\n" "$ac_link" | sed 's/ -o *conftest[^ ]*//'`
3284
3285# The possible output files:
3286ac_files="a.out conftest.exe conftest a.exe a_out.exe b.out conftest.*"
3287
3288ac_rmfiles=
3289for ac_file in $ac_files
3290do
3291  case $ac_file in
3292    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.map | *.inf | *.dSYM | *.o | *.obj ) ;;
3293    * ) ac_rmfiles="$ac_rmfiles $ac_file";;
3294  esac
3295done
3296rm -f $ac_rmfiles
3297
3298if { { ac_try="$ac_link_default"
3299case "(($ac_try" in
3300  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
3301  *) ac_try_echo=$ac_try;;
3302esac
3303eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
3304printf "%s\n" "$ac_try_echo"; } >&5
3305  (eval "$ac_link_default") 2>&5
3306  ac_status=$?
3307  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
3308  test $ac_status = 0; }
3309then :
3310  # Autoconf-2.13 could set the ac_cv_exeext variable to `no'.
3311# So ignore a value of `no', otherwise this would lead to `EXEEXT = no'
3312# in a Makefile.  We should not override ac_cv_exeext if it was cached,
3313# so that the user can short-circuit this test for compilers unknown to
3314# Autoconf.
3315for ac_file in $ac_files ''
3316do
3317  test -f "$ac_file" || continue
3318  case $ac_file in
3319    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.map | *.inf | *.dSYM | *.o | *.obj )
3320	;;
3321    [ab].out )
3322	# We found the default executable, but exeext='' is most
3323	# certainly right.
3324	break;;
3325    *.* )
3326	if test ${ac_cv_exeext+y} && test "$ac_cv_exeext" != no;
3327	then :; else
3328	   ac_cv_exeext=`expr "$ac_file" : '[^.]*\(\..*\)'`
3329	fi
3330	# We set ac_cv_exeext here because the later test for it is not
3331	# safe: cross compilers may not add the suffix if given an `-o'
3332	# argument, so we may need to know it at that point already.
3333	# Even if this section looks crufty: it has the advantage of
3334	# actually working.
3335	break;;
3336    * )
3337	break;;
3338  esac
3339done
3340test "$ac_cv_exeext" = no && ac_cv_exeext=
3341
3342else $as_nop
3343  ac_file=''
3344fi
3345if test -z "$ac_file"
3346then :
3347  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
3348printf "%s\n" "no" >&6; }
3349printf "%s\n" "$as_me: failed program was:" >&5
3350sed 's/^/| /' conftest.$ac_ext >&5
3351
3352{ { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
3353printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
3354as_fn_error 77 "C compiler cannot create executables
3355See \`config.log' for more details" "$LINENO" 5; }
3356else $as_nop
3357  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: yes" >&5
3358printf "%s\n" "yes" >&6; }
3359fi
3360{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for C compiler default output file name" >&5
3361printf %s "checking for C compiler default output file name... " >&6; }
3362{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_file" >&5
3363printf "%s\n" "$ac_file" >&6; }
3364ac_exeext=$ac_cv_exeext
3365
3366rm -f -r a.out a.out.dSYM a.exe conftest$ac_cv_exeext b.out
3367ac_clean_files=$ac_clean_files_save
3368{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for suffix of executables" >&5
3369printf %s "checking for suffix of executables... " >&6; }
3370if { { ac_try="$ac_link"
3371case "(($ac_try" in
3372  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
3373  *) ac_try_echo=$ac_try;;
3374esac
3375eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
3376printf "%s\n" "$ac_try_echo"; } >&5
3377  (eval "$ac_link") 2>&5
3378  ac_status=$?
3379  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
3380  test $ac_status = 0; }
3381then :
3382  # If both `conftest.exe' and `conftest' are `present' (well, observable)
3383# catch `conftest.exe'.  For instance with Cygwin, `ls conftest' will
3384# work properly (i.e., refer to `conftest.exe'), while it won't with
3385# `rm'.
3386for ac_file in conftest.exe conftest conftest.*; do
3387  test -f "$ac_file" || continue
3388  case $ac_file in
3389    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.map | *.inf | *.dSYM | *.o | *.obj ) ;;
3390    *.* ) ac_cv_exeext=`expr "$ac_file" : '[^.]*\(\..*\)'`
3391	  break;;
3392    * ) break;;
3393  esac
3394done
3395else $as_nop
3396  { { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
3397printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
3398as_fn_error $? "cannot compute suffix of executables: cannot compile and link
3399See \`config.log' for more details" "$LINENO" 5; }
3400fi
3401rm -f conftest conftest$ac_cv_exeext
3402{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_exeext" >&5
3403printf "%s\n" "$ac_cv_exeext" >&6; }
3404
3405rm -f conftest.$ac_ext
3406EXEEXT=$ac_cv_exeext
3407ac_exeext=$EXEEXT
3408cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3409/* end confdefs.h.  */
3410#include <stdio.h>
3411int
3412main (void)
3413{
3414FILE *f = fopen ("conftest.out", "w");
3415 return ferror (f) || fclose (f) != 0;
3416
3417  ;
3418  return 0;
3419}
3420_ACEOF
3421ac_clean_files="$ac_clean_files conftest.out"
3422# Check that the compiler produces executables we can run.  If not, either
3423# the compiler is broken, or we cross compile.
3424{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking whether we are cross compiling" >&5
3425printf %s "checking whether we are cross compiling... " >&6; }
3426if test "$cross_compiling" != yes; then
3427  { { ac_try="$ac_link"
3428case "(($ac_try" in
3429  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
3430  *) ac_try_echo=$ac_try;;
3431esac
3432eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
3433printf "%s\n" "$ac_try_echo"; } >&5
3434  (eval "$ac_link") 2>&5
3435  ac_status=$?
3436  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
3437  test $ac_status = 0; }
3438  if { ac_try='./conftest$ac_cv_exeext'
3439  { { case "(($ac_try" in
3440  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
3441  *) ac_try_echo=$ac_try;;
3442esac
3443eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
3444printf "%s\n" "$ac_try_echo"; } >&5
3445  (eval "$ac_try") 2>&5
3446  ac_status=$?
3447  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
3448  test $ac_status = 0; }; }; then
3449    cross_compiling=no
3450  else
3451    if test "$cross_compiling" = maybe; then
3452	cross_compiling=yes
3453    else
3454	{ { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
3455printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
3456as_fn_error 77 "cannot run C compiled programs.
3457If you meant to cross compile, use \`--host'.
3458See \`config.log' for more details" "$LINENO" 5; }
3459    fi
3460  fi
3461fi
3462{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $cross_compiling" >&5
3463printf "%s\n" "$cross_compiling" >&6; }
3464
3465rm -f conftest.$ac_ext conftest$ac_cv_exeext conftest.out
3466ac_clean_files=$ac_clean_files_save
3467{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for suffix of object files" >&5
3468printf %s "checking for suffix of object files... " >&6; }
3469if test ${ac_cv_objext+y}
3470then :
3471  printf %s "(cached) " >&6
3472else $as_nop
3473  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3474/* end confdefs.h.  */
3475
3476int
3477main (void)
3478{
3479
3480  ;
3481  return 0;
3482}
3483_ACEOF
3484rm -f conftest.o conftest.obj
3485if { { ac_try="$ac_compile"
3486case "(($ac_try" in
3487  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
3488  *) ac_try_echo=$ac_try;;
3489esac
3490eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
3491printf "%s\n" "$ac_try_echo"; } >&5
3492  (eval "$ac_compile") 2>&5
3493  ac_status=$?
3494  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
3495  test $ac_status = 0; }
3496then :
3497  for ac_file in conftest.o conftest.obj conftest.*; do
3498  test -f "$ac_file" || continue;
3499  case $ac_file in
3500    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.map | *.inf | *.dSYM ) ;;
3501    *) ac_cv_objext=`expr "$ac_file" : '.*\.\(.*\)'`
3502       break;;
3503  esac
3504done
3505else $as_nop
3506  printf "%s\n" "$as_me: failed program was:" >&5
3507sed 's/^/| /' conftest.$ac_ext >&5
3508
3509{ { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
3510printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
3511as_fn_error $? "cannot compute suffix of object files: cannot compile
3512See \`config.log' for more details" "$LINENO" 5; }
3513fi
3514rm -f conftest.$ac_cv_objext conftest.$ac_ext
3515fi
3516{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_objext" >&5
3517printf "%s\n" "$ac_cv_objext" >&6; }
3518OBJEXT=$ac_cv_objext
3519ac_objext=$OBJEXT
3520{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking whether the compiler supports GNU C" >&5
3521printf %s "checking whether the compiler supports GNU C... " >&6; }
3522if test ${ac_cv_c_compiler_gnu+y}
3523then :
3524  printf %s "(cached) " >&6
3525else $as_nop
3526  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3527/* end confdefs.h.  */
3528
3529int
3530main (void)
3531{
3532#ifndef __GNUC__
3533       choke me
3534#endif
3535
3536  ;
3537  return 0;
3538}
3539_ACEOF
3540if ac_fn_c_try_compile "$LINENO"
3541then :
3542  ac_compiler_gnu=yes
3543else $as_nop
3544  ac_compiler_gnu=no
3545fi
3546rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3547ac_cv_c_compiler_gnu=$ac_compiler_gnu
3548
3549fi
3550{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_c_compiler_gnu" >&5
3551printf "%s\n" "$ac_cv_c_compiler_gnu" >&6; }
3552ac_compiler_gnu=$ac_cv_c_compiler_gnu
3553
3554if test $ac_compiler_gnu = yes; then
3555  GCC=yes
3556else
3557  GCC=
3558fi
3559ac_test_CFLAGS=${CFLAGS+y}
3560ac_save_CFLAGS=$CFLAGS
3561{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking whether $CC accepts -g" >&5
3562printf %s "checking whether $CC accepts -g... " >&6; }
3563if test ${ac_cv_prog_cc_g+y}
3564then :
3565  printf %s "(cached) " >&6
3566else $as_nop
3567  ac_save_c_werror_flag=$ac_c_werror_flag
3568   ac_c_werror_flag=yes
3569   ac_cv_prog_cc_g=no
3570   CFLAGS="-g"
3571   cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3572/* end confdefs.h.  */
3573
3574int
3575main (void)
3576{
3577
3578  ;
3579  return 0;
3580}
3581_ACEOF
3582if ac_fn_c_try_compile "$LINENO"
3583then :
3584  ac_cv_prog_cc_g=yes
3585else $as_nop
3586  CFLAGS=""
3587      cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3588/* end confdefs.h.  */
3589
3590int
3591main (void)
3592{
3593
3594  ;
3595  return 0;
3596}
3597_ACEOF
3598if ac_fn_c_try_compile "$LINENO"
3599then :
3600
3601else $as_nop
3602  ac_c_werror_flag=$ac_save_c_werror_flag
3603	 CFLAGS="-g"
3604	 cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3605/* end confdefs.h.  */
3606
3607int
3608main (void)
3609{
3610
3611  ;
3612  return 0;
3613}
3614_ACEOF
3615if ac_fn_c_try_compile "$LINENO"
3616then :
3617  ac_cv_prog_cc_g=yes
3618fi
3619rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3620fi
3621rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3622fi
3623rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3624   ac_c_werror_flag=$ac_save_c_werror_flag
3625fi
3626{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_prog_cc_g" >&5
3627printf "%s\n" "$ac_cv_prog_cc_g" >&6; }
3628if test $ac_test_CFLAGS; then
3629  CFLAGS=$ac_save_CFLAGS
3630elif test $ac_cv_prog_cc_g = yes; then
3631  if test "$GCC" = yes; then
3632    CFLAGS="-g -O2"
3633  else
3634    CFLAGS="-g"
3635  fi
3636else
3637  if test "$GCC" = yes; then
3638    CFLAGS="-O2"
3639  else
3640    CFLAGS=
3641  fi
3642fi
3643ac_prog_cc_stdc=no
3644if test x$ac_prog_cc_stdc = xno
3645then :
3646  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $CC option to enable C11 features" >&5
3647printf %s "checking for $CC option to enable C11 features... " >&6; }
3648if test ${ac_cv_prog_cc_c11+y}
3649then :
3650  printf %s "(cached) " >&6
3651else $as_nop
3652  ac_cv_prog_cc_c11=no
3653ac_save_CC=$CC
3654cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3655/* end confdefs.h.  */
3656$ac_c_conftest_c11_program
3657_ACEOF
3658for ac_arg in '' -std=gnu11
3659do
3660  CC="$ac_save_CC $ac_arg"
3661  if ac_fn_c_try_compile "$LINENO"
3662then :
3663  ac_cv_prog_cc_c11=$ac_arg
3664fi
3665rm -f core conftest.err conftest.$ac_objext conftest.beam
3666  test "x$ac_cv_prog_cc_c11" != "xno" && break
3667done
3668rm -f conftest.$ac_ext
3669CC=$ac_save_CC
3670fi
3671
3672if test "x$ac_cv_prog_cc_c11" = xno
3673then :
3674  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: unsupported" >&5
3675printf "%s\n" "unsupported" >&6; }
3676else $as_nop
3677  if test "x$ac_cv_prog_cc_c11" = x
3678then :
3679  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: none needed" >&5
3680printf "%s\n" "none needed" >&6; }
3681else $as_nop
3682  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_prog_cc_c11" >&5
3683printf "%s\n" "$ac_cv_prog_cc_c11" >&6; }
3684     CC="$CC $ac_cv_prog_cc_c11"
3685fi
3686  ac_cv_prog_cc_stdc=$ac_cv_prog_cc_c11
3687  ac_prog_cc_stdc=c11
3688fi
3689fi
3690if test x$ac_prog_cc_stdc = xno
3691then :
3692  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $CC option to enable C99 features" >&5
3693printf %s "checking for $CC option to enable C99 features... " >&6; }
3694if test ${ac_cv_prog_cc_c99+y}
3695then :
3696  printf %s "(cached) " >&6
3697else $as_nop
3698  ac_cv_prog_cc_c99=no
3699ac_save_CC=$CC
3700cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3701/* end confdefs.h.  */
3702$ac_c_conftest_c99_program
3703_ACEOF
3704for ac_arg in '' -std=gnu99 -std=c99 -c99 -qlanglvl=extc1x -qlanglvl=extc99 -AC99 -D_STDC_C99=
3705do
3706  CC="$ac_save_CC $ac_arg"
3707  if ac_fn_c_try_compile "$LINENO"
3708then :
3709  ac_cv_prog_cc_c99=$ac_arg
3710fi
3711rm -f core conftest.err conftest.$ac_objext conftest.beam
3712  test "x$ac_cv_prog_cc_c99" != "xno" && break
3713done
3714rm -f conftest.$ac_ext
3715CC=$ac_save_CC
3716fi
3717
3718if test "x$ac_cv_prog_cc_c99" = xno
3719then :
3720  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: unsupported" >&5
3721printf "%s\n" "unsupported" >&6; }
3722else $as_nop
3723  if test "x$ac_cv_prog_cc_c99" = x
3724then :
3725  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: none needed" >&5
3726printf "%s\n" "none needed" >&6; }
3727else $as_nop
3728  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_prog_cc_c99" >&5
3729printf "%s\n" "$ac_cv_prog_cc_c99" >&6; }
3730     CC="$CC $ac_cv_prog_cc_c99"
3731fi
3732  ac_cv_prog_cc_stdc=$ac_cv_prog_cc_c99
3733  ac_prog_cc_stdc=c99
3734fi
3735fi
3736if test x$ac_prog_cc_stdc = xno
3737then :
3738  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $CC option to enable C89 features" >&5
3739printf %s "checking for $CC option to enable C89 features... " >&6; }
3740if test ${ac_cv_prog_cc_c89+y}
3741then :
3742  printf %s "(cached) " >&6
3743else $as_nop
3744  ac_cv_prog_cc_c89=no
3745ac_save_CC=$CC
3746cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3747/* end confdefs.h.  */
3748$ac_c_conftest_c89_program
3749_ACEOF
3750for ac_arg in '' -qlanglvl=extc89 -qlanglvl=ansi -std -Ae "-Aa -D_HPUX_SOURCE" "-Xc -D__EXTENSIONS__"
3751do
3752  CC="$ac_save_CC $ac_arg"
3753  if ac_fn_c_try_compile "$LINENO"
3754then :
3755  ac_cv_prog_cc_c89=$ac_arg
3756fi
3757rm -f core conftest.err conftest.$ac_objext conftest.beam
3758  test "x$ac_cv_prog_cc_c89" != "xno" && break
3759done
3760rm -f conftest.$ac_ext
3761CC=$ac_save_CC
3762fi
3763
3764if test "x$ac_cv_prog_cc_c89" = xno
3765then :
3766  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: unsupported" >&5
3767printf "%s\n" "unsupported" >&6; }
3768else $as_nop
3769  if test "x$ac_cv_prog_cc_c89" = x
3770then :
3771  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: none needed" >&5
3772printf "%s\n" "none needed" >&6; }
3773else $as_nop
3774  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_prog_cc_c89" >&5
3775printf "%s\n" "$ac_cv_prog_cc_c89" >&6; }
3776     CC="$CC $ac_cv_prog_cc_c89"
3777fi
3778  ac_cv_prog_cc_stdc=$ac_cv_prog_cc_c89
3779  ac_prog_cc_stdc=c89
3780fi
3781fi
3782
3783ac_ext=c
3784ac_cpp='$CPP $CPPFLAGS'
3785ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
3786ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
3787ac_compiler_gnu=$ac_cv_c_compiler_gnu
3788
3789
3790
3791ac_header= ac_cache=
3792for ac_item in $ac_header_c_list
3793do
3794  if test $ac_cache; then
3795    ac_fn_c_check_header_compile "$LINENO" $ac_header ac_cv_header_$ac_cache "$ac_includes_default"
3796    if eval test \"x\$ac_cv_header_$ac_cache\" = xyes; then
3797      printf "%s\n" "#define $ac_item 1" >> confdefs.h
3798    fi
3799    ac_header= ac_cache=
3800  elif test $ac_header; then
3801    ac_cache=$ac_item
3802  else
3803    ac_header=$ac_item
3804  fi
3805done
3806
3807
3808
3809
3810
3811
3812
3813
3814if test $ac_cv_header_stdlib_h = yes && test $ac_cv_header_string_h = yes
3815then :
3816
3817printf "%s\n" "#define STDC_HEADERS 1" >>confdefs.h
3818
3819fi
3820
3821
3822
3823
3824
3825
3826  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking whether it is safe to define __EXTENSIONS__" >&5
3827printf %s "checking whether it is safe to define __EXTENSIONS__... " >&6; }
3828if test ${ac_cv_safe_to_define___extensions__+y}
3829then :
3830  printf %s "(cached) " >&6
3831else $as_nop
3832  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3833/* end confdefs.h.  */
3834
3835#         define __EXTENSIONS__ 1
3836          $ac_includes_default
3837int
3838main (void)
3839{
3840
3841  ;
3842  return 0;
3843}
3844_ACEOF
3845if ac_fn_c_try_compile "$LINENO"
3846then :
3847  ac_cv_safe_to_define___extensions__=yes
3848else $as_nop
3849  ac_cv_safe_to_define___extensions__=no
3850fi
3851rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3852fi
3853{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_safe_to_define___extensions__" >&5
3854printf "%s\n" "$ac_cv_safe_to_define___extensions__" >&6; }
3855
3856  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking whether _XOPEN_SOURCE should be defined" >&5
3857printf %s "checking whether _XOPEN_SOURCE should be defined... " >&6; }
3858if test ${ac_cv_should_define__xopen_source+y}
3859then :
3860  printf %s "(cached) " >&6
3861else $as_nop
3862  ac_cv_should_define__xopen_source=no
3863    if test $ac_cv_header_wchar_h = yes
3864then :
3865  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3866/* end confdefs.h.  */
3867
3868          #include <wchar.h>
3869          mbstate_t x;
3870int
3871main (void)
3872{
3873
3874  ;
3875  return 0;
3876}
3877_ACEOF
3878if ac_fn_c_try_compile "$LINENO"
3879then :
3880
3881else $as_nop
3882  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3883/* end confdefs.h.  */
3884
3885            #define _XOPEN_SOURCE 500
3886            #include <wchar.h>
3887            mbstate_t x;
3888int
3889main (void)
3890{
3891
3892  ;
3893  return 0;
3894}
3895_ACEOF
3896if ac_fn_c_try_compile "$LINENO"
3897then :
3898  ac_cv_should_define__xopen_source=yes
3899fi
3900rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3901fi
3902rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3903fi
3904fi
3905{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_should_define__xopen_source" >&5
3906printf "%s\n" "$ac_cv_should_define__xopen_source" >&6; }
3907
3908  printf "%s\n" "#define _ALL_SOURCE 1" >>confdefs.h
3909
3910  printf "%s\n" "#define _DARWIN_C_SOURCE 1" >>confdefs.h
3911
3912  printf "%s\n" "#define _GNU_SOURCE 1" >>confdefs.h
3913
3914  printf "%s\n" "#define _HPUX_ALT_XOPEN_SOCKET_API 1" >>confdefs.h
3915
3916  printf "%s\n" "#define _NETBSD_SOURCE 1" >>confdefs.h
3917
3918  printf "%s\n" "#define _OPENBSD_SOURCE 1" >>confdefs.h
3919
3920  printf "%s\n" "#define _POSIX_PTHREAD_SEMANTICS 1" >>confdefs.h
3921
3922  printf "%s\n" "#define __STDC_WANT_IEC_60559_ATTRIBS_EXT__ 1" >>confdefs.h
3923
3924  printf "%s\n" "#define __STDC_WANT_IEC_60559_BFP_EXT__ 1" >>confdefs.h
3925
3926  printf "%s\n" "#define __STDC_WANT_IEC_60559_DFP_EXT__ 1" >>confdefs.h
3927
3928  printf "%s\n" "#define __STDC_WANT_IEC_60559_FUNCS_EXT__ 1" >>confdefs.h
3929
3930  printf "%s\n" "#define __STDC_WANT_IEC_60559_TYPES_EXT__ 1" >>confdefs.h
3931
3932  printf "%s\n" "#define __STDC_WANT_LIB_EXT2__ 1" >>confdefs.h
3933
3934  printf "%s\n" "#define __STDC_WANT_MATH_SPEC_FUNCS__ 1" >>confdefs.h
3935
3936  printf "%s\n" "#define _TANDEM_SOURCE 1" >>confdefs.h
3937
3938  if test $ac_cv_header_minix_config_h = yes
3939then :
3940  MINIX=yes
3941    printf "%s\n" "#define _MINIX 1" >>confdefs.h
3942
3943    printf "%s\n" "#define _POSIX_SOURCE 1" >>confdefs.h
3944
3945    printf "%s\n" "#define _POSIX_1_SOURCE 2" >>confdefs.h
3946
3947else $as_nop
3948  MINIX=
3949fi
3950  if test $ac_cv_safe_to_define___extensions__ = yes
3951then :
3952  printf "%s\n" "#define __EXTENSIONS__ 1" >>confdefs.h
3953
3954fi
3955  if test $ac_cv_should_define__xopen_source = yes
3956then :
3957  printf "%s\n" "#define _XOPEN_SOURCE 500" >>confdefs.h
3958
3959fi
3960
3961
3962ac_config_headers="$ac_config_headers include/HsUnixConfig.h"
3963
3964
3965# Is this a Unix system?
3966ac_fn_c_check_header_compile "$LINENO" "dlfcn.h" "ac_cv_header_dlfcn_h" "$ac_includes_default"
3967if test "x$ac_cv_header_dlfcn_h" = xyes
3968then :
3969  BUILD_PACKAGE_BOOL=True
3970else $as_nop
3971  BUILD_PACKAGE_BOOL=False
3972fi
3973
3974
3975
3976{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for an ANSI C-conforming const" >&5
3977printf %s "checking for an ANSI C-conforming const... " >&6; }
3978if test ${ac_cv_c_const+y}
3979then :
3980  printf %s "(cached) " >&6
3981else $as_nop
3982  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3983/* end confdefs.h.  */
3984
3985int
3986main (void)
3987{
3988
3989#ifndef __cplusplus
3990  /* Ultrix mips cc rejects this sort of thing.  */
3991  typedef int charset[2];
3992  const charset cs = { 0, 0 };
3993  /* SunOS 4.1.1 cc rejects this.  */
3994  char const *const *pcpcc;
3995  char **ppc;
3996  /* NEC SVR4.0.2 mips cc rejects this.  */
3997  struct point {int x, y;};
3998  static struct point const zero = {0,0};
3999  /* IBM XL C 1.02.0.0 rejects this.
4000     It does not let you subtract one const X* pointer from another in
4001     an arm of an if-expression whose if-part is not a constant
4002     expression */
4003  const char *g = "string";
4004  pcpcc = &g + (g ? g-g : 0);
4005  /* HPUX 7.0 cc rejects these. */
4006  ++pcpcc;
4007  ppc = (char**) pcpcc;
4008  pcpcc = (char const *const *) ppc;
4009  { /* SCO 3.2v4 cc rejects this sort of thing.  */
4010    char tx;
4011    char *t = &tx;
4012    char const *s = 0 ? (char *) 0 : (char const *) 0;
4013
4014    *t++ = 0;
4015    if (s) return 0;
4016  }
4017  { /* Someone thinks the Sun supposedly-ANSI compiler will reject this.  */
4018    int x[] = {25, 17};
4019    const int *foo = &x[0];
4020    ++foo;
4021  }
4022  { /* Sun SC1.0 ANSI compiler rejects this -- but not the above. */
4023    typedef const int *iptr;
4024    iptr p = 0;
4025    ++p;
4026  }
4027  { /* IBM XL C 1.02.0.0 rejects this sort of thing, saying
4028       "k.c", line 2.27: 1506-025 (S) Operand must be a modifiable lvalue. */
4029    struct s { int j; const int *ap[3]; } bx;
4030    struct s *b = &bx; b->j = 5;
4031  }
4032  { /* ULTRIX-32 V3.1 (Rev 9) vcc rejects this */
4033    const int foo = 10;
4034    if (!foo) return 0;
4035  }
4036  return !cs[0] && !zero.x;
4037#endif
4038
4039  ;
4040  return 0;
4041}
4042_ACEOF
4043if ac_fn_c_try_compile "$LINENO"
4044then :
4045  ac_cv_c_const=yes
4046else $as_nop
4047  ac_cv_c_const=no
4048fi
4049rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
4050fi
4051{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_c_const" >&5
4052printf "%s\n" "$ac_cv_c_const" >&6; }
4053if test $ac_cv_c_const = no; then
4054
4055printf "%s\n" "#define const /**/" >>confdefs.h
4056
4057fi
4058
4059
4060# Check whether --enable-largefile was given.
4061if test ${enable_largefile+y}
4062then :
4063  enableval=$enable_largefile;
4064fi
4065
4066if test "$enable_largefile" != no; then
4067
4068  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for special C compiler options needed for large files" >&5
4069printf %s "checking for special C compiler options needed for large files... " >&6; }
4070if test ${ac_cv_sys_largefile_CC+y}
4071then :
4072  printf %s "(cached) " >&6
4073else $as_nop
4074  ac_cv_sys_largefile_CC=no
4075     if test "$GCC" != yes; then
4076       ac_save_CC=$CC
4077       while :; do
4078	 # IRIX 6.2 and later do not support large files by default,
4079	 # so use the C compiler's -n32 option if that helps.
4080	 cat confdefs.h - <<_ACEOF >conftest.$ac_ext
4081/* end confdefs.h.  */
4082#include <sys/types.h>
4083 /* Check that off_t can represent 2**63 - 1 correctly.
4084    We can't simply define LARGE_OFF_T to be 9223372036854775807,
4085    since some C++ compilers masquerading as C compilers
4086    incorrectly reject 9223372036854775807.  */
4087#define LARGE_OFF_T (((off_t) 1 << 31 << 31) - 1 + ((off_t) 1 << 31 << 31))
4088  int off_t_is_large[(LARGE_OFF_T % 2147483629 == 721
4089		       && LARGE_OFF_T % 2147483647 == 1)
4090		      ? 1 : -1];
4091int
4092main (void)
4093{
4094
4095  ;
4096  return 0;
4097}
4098_ACEOF
4099	 if ac_fn_c_try_compile "$LINENO"
4100then :
4101  break
4102fi
4103rm -f core conftest.err conftest.$ac_objext conftest.beam
4104	 CC="$CC -n32"
4105	 if ac_fn_c_try_compile "$LINENO"
4106then :
4107  ac_cv_sys_largefile_CC=' -n32'; break
4108fi
4109rm -f core conftest.err conftest.$ac_objext conftest.beam
4110	 break
4111       done
4112       CC=$ac_save_CC
4113       rm -f conftest.$ac_ext
4114    fi
4115fi
4116{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_sys_largefile_CC" >&5
4117printf "%s\n" "$ac_cv_sys_largefile_CC" >&6; }
4118  if test "$ac_cv_sys_largefile_CC" != no; then
4119    CC=$CC$ac_cv_sys_largefile_CC
4120  fi
4121
4122  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for _FILE_OFFSET_BITS value needed for large files" >&5
4123printf %s "checking for _FILE_OFFSET_BITS value needed for large files... " >&6; }
4124if test ${ac_cv_sys_file_offset_bits+y}
4125then :
4126  printf %s "(cached) " >&6
4127else $as_nop
4128  while :; do
4129  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
4130/* end confdefs.h.  */
4131#include <sys/types.h>
4132 /* Check that off_t can represent 2**63 - 1 correctly.
4133    We can't simply define LARGE_OFF_T to be 9223372036854775807,
4134    since some C++ compilers masquerading as C compilers
4135    incorrectly reject 9223372036854775807.  */
4136#define LARGE_OFF_T (((off_t) 1 << 31 << 31) - 1 + ((off_t) 1 << 31 << 31))
4137  int off_t_is_large[(LARGE_OFF_T % 2147483629 == 721
4138		       && LARGE_OFF_T % 2147483647 == 1)
4139		      ? 1 : -1];
4140int
4141main (void)
4142{
4143
4144  ;
4145  return 0;
4146}
4147_ACEOF
4148if ac_fn_c_try_compile "$LINENO"
4149then :
4150  ac_cv_sys_file_offset_bits=no; break
4151fi
4152rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
4153  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
4154/* end confdefs.h.  */
4155#define _FILE_OFFSET_BITS 64
4156#include <sys/types.h>
4157 /* Check that off_t can represent 2**63 - 1 correctly.
4158    We can't simply define LARGE_OFF_T to be 9223372036854775807,
4159    since some C++ compilers masquerading as C compilers
4160    incorrectly reject 9223372036854775807.  */
4161#define LARGE_OFF_T (((off_t) 1 << 31 << 31) - 1 + ((off_t) 1 << 31 << 31))
4162  int off_t_is_large[(LARGE_OFF_T % 2147483629 == 721
4163		       && LARGE_OFF_T % 2147483647 == 1)
4164		      ? 1 : -1];
4165int
4166main (void)
4167{
4168
4169  ;
4170  return 0;
4171}
4172_ACEOF
4173if ac_fn_c_try_compile "$LINENO"
4174then :
4175  ac_cv_sys_file_offset_bits=64; break
4176fi
4177rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
4178  ac_cv_sys_file_offset_bits=unknown
4179  break
4180done
4181fi
4182{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_sys_file_offset_bits" >&5
4183printf "%s\n" "$ac_cv_sys_file_offset_bits" >&6; }
4184case $ac_cv_sys_file_offset_bits in #(
4185  no | unknown) ;;
4186  *)
4187printf "%s\n" "#define _FILE_OFFSET_BITS $ac_cv_sys_file_offset_bits" >>confdefs.h
4188;;
4189esac
4190rm -rf conftest*
4191  if test $ac_cv_sys_file_offset_bits = unknown; then
4192    { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for _LARGE_FILES value needed for large files" >&5
4193printf %s "checking for _LARGE_FILES value needed for large files... " >&6; }
4194if test ${ac_cv_sys_large_files+y}
4195then :
4196  printf %s "(cached) " >&6
4197else $as_nop
4198  while :; do
4199  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
4200/* end confdefs.h.  */
4201#include <sys/types.h>
4202 /* Check that off_t can represent 2**63 - 1 correctly.
4203    We can't simply define LARGE_OFF_T to be 9223372036854775807,
4204    since some C++ compilers masquerading as C compilers
4205    incorrectly reject 9223372036854775807.  */
4206#define LARGE_OFF_T (((off_t) 1 << 31 << 31) - 1 + ((off_t) 1 << 31 << 31))
4207  int off_t_is_large[(LARGE_OFF_T % 2147483629 == 721
4208		       && LARGE_OFF_T % 2147483647 == 1)
4209		      ? 1 : -1];
4210int
4211main (void)
4212{
4213
4214  ;
4215  return 0;
4216}
4217_ACEOF
4218if ac_fn_c_try_compile "$LINENO"
4219then :
4220  ac_cv_sys_large_files=no; break
4221fi
4222rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
4223  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
4224/* end confdefs.h.  */
4225#define _LARGE_FILES 1
4226#include <sys/types.h>
4227 /* Check that off_t can represent 2**63 - 1 correctly.
4228    We can't simply define LARGE_OFF_T to be 9223372036854775807,
4229    since some C++ compilers masquerading as C compilers
4230    incorrectly reject 9223372036854775807.  */
4231#define LARGE_OFF_T (((off_t) 1 << 31 << 31) - 1 + ((off_t) 1 << 31 << 31))
4232  int off_t_is_large[(LARGE_OFF_T % 2147483629 == 721
4233		       && LARGE_OFF_T % 2147483647 == 1)
4234		      ? 1 : -1];
4235int
4236main (void)
4237{
4238
4239  ;
4240  return 0;
4241}
4242_ACEOF
4243if ac_fn_c_try_compile "$LINENO"
4244then :
4245  ac_cv_sys_large_files=1; break
4246fi
4247rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
4248  ac_cv_sys_large_files=unknown
4249  break
4250done
4251fi
4252{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_sys_large_files" >&5
4253printf "%s\n" "$ac_cv_sys_large_files" >&6; }
4254case $ac_cv_sys_large_files in #(
4255  no | unknown) ;;
4256  *)
4257printf "%s\n" "#define _LARGE_FILES $ac_cv_sys_large_files" >>confdefs.h
4258;;
4259esac
4260rm -rf conftest*
4261  fi
4262fi
4263
4264
4265ac_fn_c_check_header_compile "$LINENO" "dirent.h" "ac_cv_header_dirent_h" "$ac_includes_default"
4266if test "x$ac_cv_header_dirent_h" = xyes
4267then :
4268  printf "%s\n" "#define HAVE_DIRENT_H 1" >>confdefs.h
4269
4270fi
4271ac_fn_c_check_header_compile "$LINENO" "fcntl.h" "ac_cv_header_fcntl_h" "$ac_includes_default"
4272if test "x$ac_cv_header_fcntl_h" = xyes
4273then :
4274  printf "%s\n" "#define HAVE_FCNTL_H 1" >>confdefs.h
4275
4276fi
4277ac_fn_c_check_header_compile "$LINENO" "grp.h" "ac_cv_header_grp_h" "$ac_includes_default"
4278if test "x$ac_cv_header_grp_h" = xyes
4279then :
4280  printf "%s\n" "#define HAVE_GRP_H 1" >>confdefs.h
4281
4282fi
4283ac_fn_c_check_header_compile "$LINENO" "limits.h" "ac_cv_header_limits_h" "$ac_includes_default"
4284if test "x$ac_cv_header_limits_h" = xyes
4285then :
4286  printf "%s\n" "#define HAVE_LIMITS_H 1" >>confdefs.h
4287
4288fi
4289ac_fn_c_check_header_compile "$LINENO" "pwd.h" "ac_cv_header_pwd_h" "$ac_includes_default"
4290if test "x$ac_cv_header_pwd_h" = xyes
4291then :
4292  printf "%s\n" "#define HAVE_PWD_H 1" >>confdefs.h
4293
4294fi
4295ac_fn_c_check_header_compile "$LINENO" "signal.h" "ac_cv_header_signal_h" "$ac_includes_default"
4296if test "x$ac_cv_header_signal_h" = xyes
4297then :
4298  printf "%s\n" "#define HAVE_SIGNAL_H 1" >>confdefs.h
4299
4300fi
4301ac_fn_c_check_header_compile "$LINENO" "string.h" "ac_cv_header_string_h" "$ac_includes_default"
4302if test "x$ac_cv_header_string_h" = xyes
4303then :
4304  printf "%s\n" "#define HAVE_STRING_H 1" >>confdefs.h
4305
4306fi
4307
4308ac_fn_c_check_header_compile "$LINENO" "sys/resource.h" "ac_cv_header_sys_resource_h" "$ac_includes_default"
4309if test "x$ac_cv_header_sys_resource_h" = xyes
4310then :
4311  printf "%s\n" "#define HAVE_SYS_RESOURCE_H 1" >>confdefs.h
4312
4313fi
4314ac_fn_c_check_header_compile "$LINENO" "sys/stat.h" "ac_cv_header_sys_stat_h" "$ac_includes_default"
4315if test "x$ac_cv_header_sys_stat_h" = xyes
4316then :
4317  printf "%s\n" "#define HAVE_SYS_STAT_H 1" >>confdefs.h
4318
4319fi
4320ac_fn_c_check_header_compile "$LINENO" "sys/times.h" "ac_cv_header_sys_times_h" "$ac_includes_default"
4321if test "x$ac_cv_header_sys_times_h" = xyes
4322then :
4323  printf "%s\n" "#define HAVE_SYS_TIMES_H 1" >>confdefs.h
4324
4325fi
4326ac_fn_c_check_header_compile "$LINENO" "sys/time.h" "ac_cv_header_sys_time_h" "$ac_includes_default"
4327if test "x$ac_cv_header_sys_time_h" = xyes
4328then :
4329  printf "%s\n" "#define HAVE_SYS_TIME_H 1" >>confdefs.h
4330
4331fi
4332
4333ac_fn_c_check_header_compile "$LINENO" "sys/utsname.h" "ac_cv_header_sys_utsname_h" "$ac_includes_default"
4334if test "x$ac_cv_header_sys_utsname_h" = xyes
4335then :
4336  printf "%s\n" "#define HAVE_SYS_UTSNAME_H 1" >>confdefs.h
4337
4338fi
4339ac_fn_c_check_header_compile "$LINENO" "sys/wait.h" "ac_cv_header_sys_wait_h" "$ac_includes_default"
4340if test "x$ac_cv_header_sys_wait_h" = xyes
4341then :
4342  printf "%s\n" "#define HAVE_SYS_WAIT_H 1" >>confdefs.h
4343
4344fi
4345
4346ac_fn_c_check_header_compile "$LINENO" "bsd/libutil.h" "ac_cv_header_bsd_libutil_h" "$ac_includes_default"
4347if test "x$ac_cv_header_bsd_libutil_h" = xyes
4348then :
4349  printf "%s\n" "#define HAVE_BSD_LIBUTIL_H 1" >>confdefs.h
4350
4351fi
4352ac_fn_c_check_header_compile "$LINENO" "libutil.h" "ac_cv_header_libutil_h" "$ac_includes_default"
4353if test "x$ac_cv_header_libutil_h" = xyes
4354then :
4355  printf "%s\n" "#define HAVE_LIBUTIL_H 1" >>confdefs.h
4356
4357fi
4358ac_fn_c_check_header_compile "$LINENO" "pty.h" "ac_cv_header_pty_h" "$ac_includes_default"
4359if test "x$ac_cv_header_pty_h" = xyes
4360then :
4361  printf "%s\n" "#define HAVE_PTY_H 1" >>confdefs.h
4362
4363fi
4364ac_fn_c_check_header_compile "$LINENO" "utmp.h" "ac_cv_header_utmp_h" "$ac_includes_default"
4365if test "x$ac_cv_header_utmp_h" = xyes
4366then :
4367  printf "%s\n" "#define HAVE_UTMP_H 1" >>confdefs.h
4368
4369fi
4370
4371ac_fn_c_check_header_compile "$LINENO" "termios.h" "ac_cv_header_termios_h" "$ac_includes_default"
4372if test "x$ac_cv_header_termios_h" = xyes
4373then :
4374  printf "%s\n" "#define HAVE_TERMIOS_H 1" >>confdefs.h
4375
4376fi
4377ac_fn_c_check_header_compile "$LINENO" "time.h" "ac_cv_header_time_h" "$ac_includes_default"
4378if test "x$ac_cv_header_time_h" = xyes
4379then :
4380  printf "%s\n" "#define HAVE_TIME_H 1" >>confdefs.h
4381
4382fi
4383ac_fn_c_check_header_compile "$LINENO" "unistd.h" "ac_cv_header_unistd_h" "$ac_includes_default"
4384if test "x$ac_cv_header_unistd_h" = xyes
4385then :
4386  printf "%s\n" "#define HAVE_UNISTD_H 1" >>confdefs.h
4387
4388fi
4389ac_fn_c_check_header_compile "$LINENO" "utime.h" "ac_cv_header_utime_h" "$ac_includes_default"
4390if test "x$ac_cv_header_utime_h" = xyes
4391then :
4392  printf "%s\n" "#define HAVE_UTIME_H 1" >>confdefs.h
4393
4394fi
4395
4396
4397ac_fn_c_check_func "$LINENO" "getgrgid_r" "ac_cv_func_getgrgid_r"
4398if test "x$ac_cv_func_getgrgid_r" = xyes
4399then :
4400  printf "%s\n" "#define HAVE_GETGRGID_R 1" >>confdefs.h
4401
4402fi
4403ac_fn_c_check_func "$LINENO" "getgrnam_r" "ac_cv_func_getgrnam_r"
4404if test "x$ac_cv_func_getgrnam_r" = xyes
4405then :
4406  printf "%s\n" "#define HAVE_GETGRNAM_R 1" >>confdefs.h
4407
4408fi
4409ac_fn_c_check_func "$LINENO" "getpwnam_r" "ac_cv_func_getpwnam_r"
4410if test "x$ac_cv_func_getpwnam_r" = xyes
4411then :
4412  printf "%s\n" "#define HAVE_GETPWNAM_R 1" >>confdefs.h
4413
4414fi
4415ac_fn_c_check_func "$LINENO" "getpwuid_r" "ac_cv_func_getpwuid_r"
4416if test "x$ac_cv_func_getpwuid_r" = xyes
4417then :
4418  printf "%s\n" "#define HAVE_GETPWUID_R 1" >>confdefs.h
4419
4420fi
4421ac_fn_c_check_func "$LINENO" "getpwnam" "ac_cv_func_getpwnam"
4422if test "x$ac_cv_func_getpwnam" = xyes
4423then :
4424  printf "%s\n" "#define HAVE_GETPWNAM 1" >>confdefs.h
4425
4426fi
4427ac_fn_c_check_func "$LINENO" "getpwuid" "ac_cv_func_getpwuid"
4428if test "x$ac_cv_func_getpwuid" = xyes
4429then :
4430  printf "%s\n" "#define HAVE_GETPWUID 1" >>confdefs.h
4431
4432fi
4433
4434ac_fn_c_check_func "$LINENO" "getpwent" "ac_cv_func_getpwent"
4435if test "x$ac_cv_func_getpwent" = xyes
4436then :
4437  printf "%s\n" "#define HAVE_GETPWENT 1" >>confdefs.h
4438
4439fi
4440ac_fn_c_check_func "$LINENO" "getgrent" "ac_cv_func_getgrent"
4441if test "x$ac_cv_func_getgrent" = xyes
4442then :
4443  printf "%s\n" "#define HAVE_GETGRENT 1" >>confdefs.h
4444
4445fi
4446
4447ac_fn_c_check_func "$LINENO" "lchown" "ac_cv_func_lchown"
4448if test "x$ac_cv_func_lchown" = xyes
4449then :
4450  printf "%s\n" "#define HAVE_LCHOWN 1" >>confdefs.h
4451
4452fi
4453ac_fn_c_check_func "$LINENO" "setenv" "ac_cv_func_setenv"
4454if test "x$ac_cv_func_setenv" = xyes
4455then :
4456  printf "%s\n" "#define HAVE_SETENV 1" >>confdefs.h
4457
4458fi
4459ac_fn_c_check_func "$LINENO" "sysconf" "ac_cv_func_sysconf"
4460if test "x$ac_cv_func_sysconf" = xyes
4461then :
4462  printf "%s\n" "#define HAVE_SYSCONF 1" >>confdefs.h
4463
4464fi
4465ac_fn_c_check_func "$LINENO" "unsetenv" "ac_cv_func_unsetenv"
4466if test "x$ac_cv_func_unsetenv" = xyes
4467then :
4468  printf "%s\n" "#define HAVE_UNSETENV 1" >>confdefs.h
4469
4470fi
4471ac_fn_c_check_func "$LINENO" "clearenv" "ac_cv_func_clearenv"
4472if test "x$ac_cv_func_clearenv" = xyes
4473then :
4474  printf "%s\n" "#define HAVE_CLEARENV 1" >>confdefs.h
4475
4476fi
4477
4478ac_fn_c_check_func "$LINENO" "nanosleep" "ac_cv_func_nanosleep"
4479if test "x$ac_cv_func_nanosleep" = xyes
4480then :
4481  printf "%s\n" "#define HAVE_NANOSLEEP 1" >>confdefs.h
4482
4483fi
4484
4485ac_fn_c_check_func "$LINENO" "ptsname" "ac_cv_func_ptsname"
4486if test "x$ac_cv_func_ptsname" = xyes
4487then :
4488  printf "%s\n" "#define HAVE_PTSNAME 1" >>confdefs.h
4489
4490fi
4491
4492ac_fn_c_check_func "$LINENO" "setitimer" "ac_cv_func_setitimer"
4493if test "x$ac_cv_func_setitimer" = xyes
4494then :
4495  printf "%s\n" "#define HAVE_SETITIMER 1" >>confdefs.h
4496
4497fi
4498
4499ac_fn_c_check_func "$LINENO" "readdir_r" "ac_cv_func_readdir_r"
4500if test "x$ac_cv_func_readdir_r" = xyes
4501then :
4502  printf "%s\n" "#define HAVE_READDIR_R 1" >>confdefs.h
4503
4504fi
4505
4506
4507
4508
4509
4510  # Make sure we can run config.sub.
4511$SHELL "${ac_aux_dir}config.sub" sun4 >/dev/null 2>&1 ||
4512  as_fn_error $? "cannot run $SHELL ${ac_aux_dir}config.sub" "$LINENO" 5
4513
4514{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking build system type" >&5
4515printf %s "checking build system type... " >&6; }
4516if test ${ac_cv_build+y}
4517then :
4518  printf %s "(cached) " >&6
4519else $as_nop
4520  ac_build_alias=$build_alias
4521test "x$ac_build_alias" = x &&
4522  ac_build_alias=`$SHELL "${ac_aux_dir}config.guess"`
4523test "x$ac_build_alias" = x &&
4524  as_fn_error $? "cannot guess build type; you must specify one" "$LINENO" 5
4525ac_cv_build=`$SHELL "${ac_aux_dir}config.sub" $ac_build_alias` ||
4526  as_fn_error $? "$SHELL ${ac_aux_dir}config.sub $ac_build_alias failed" "$LINENO" 5
4527
4528fi
4529{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_build" >&5
4530printf "%s\n" "$ac_cv_build" >&6; }
4531case $ac_cv_build in
4532*-*-*) ;;
4533*) as_fn_error $? "invalid value of canonical build" "$LINENO" 5;;
4534esac
4535build=$ac_cv_build
4536ac_save_IFS=$IFS; IFS='-'
4537set x $ac_cv_build
4538shift
4539build_cpu=$1
4540build_vendor=$2
4541shift; shift
4542# Remember, the first character of IFS is used to create $*,
4543# except with old shells:
4544build_os=$*
4545IFS=$ac_save_IFS
4546case $build_os in *\ *) build_os=`echo "$build_os" | sed 's/ /-/g'`;; esac
4547
4548
4549{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking host system type" >&5
4550printf %s "checking host system type... " >&6; }
4551if test ${ac_cv_host+y}
4552then :
4553  printf %s "(cached) " >&6
4554else $as_nop
4555  if test "x$host_alias" = x; then
4556  ac_cv_host=$ac_cv_build
4557else
4558  ac_cv_host=`$SHELL "${ac_aux_dir}config.sub" $host_alias` ||
4559    as_fn_error $? "$SHELL ${ac_aux_dir}config.sub $host_alias failed" "$LINENO" 5
4560fi
4561
4562fi
4563{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_host" >&5
4564printf "%s\n" "$ac_cv_host" >&6; }
4565case $ac_cv_host in
4566*-*-*) ;;
4567*) as_fn_error $? "invalid value of canonical host" "$LINENO" 5;;
4568esac
4569host=$ac_cv_host
4570ac_save_IFS=$IFS; IFS='-'
4571set x $ac_cv_host
4572shift
4573host_cpu=$1
4574host_vendor=$2
4575shift; shift
4576# Remember, the first character of IFS is used to create $*,
4577# except with old shells:
4578host_os=$*
4579IFS=$ac_save_IFS
4580case $host_os in *\ *) host_os=`echo "$host_os" | sed 's/ /-/g'`;; esac
4581
4582
4583{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking target system type" >&5
4584printf %s "checking target system type... " >&6; }
4585if test ${ac_cv_target+y}
4586then :
4587  printf %s "(cached) " >&6
4588else $as_nop
4589  if test "x$target_alias" = x; then
4590  ac_cv_target=$ac_cv_host
4591else
4592  ac_cv_target=`$SHELL "${ac_aux_dir}config.sub" $target_alias` ||
4593    as_fn_error $? "$SHELL ${ac_aux_dir}config.sub $target_alias failed" "$LINENO" 5
4594fi
4595
4596fi
4597{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_target" >&5
4598printf "%s\n" "$ac_cv_target" >&6; }
4599case $ac_cv_target in
4600*-*-*) ;;
4601*) as_fn_error $? "invalid value of canonical target" "$LINENO" 5;;
4602esac
4603target=$ac_cv_target
4604ac_save_IFS=$IFS; IFS='-'
4605set x $ac_cv_target
4606shift
4607target_cpu=$1
4608target_vendor=$2
4609shift; shift
4610# Remember, the first character of IFS is used to create $*,
4611# except with old shells:
4612target_os=$*
4613IFS=$ac_save_IFS
4614case $target_os in *\ *) target_os=`echo "$target_os" | sed 's/ /-/g'`;; esac
4615
4616
4617# The aliases save the names the user supplied, while $host etc.
4618# will get canonicalized.
4619test -n "$target_alias" &&
4620  test "$program_prefix$program_suffix$program_transform_name" = \
4621    NONENONEs,x,x, &&
4622  program_prefix=${target_alias}-
4623case $target_os in #(
4624  *-android*) :
4625     ;; #(
4626  *) :
4627    ac_fn_c_check_func "$LINENO" "telldir" "ac_cv_func_telldir"
4628if test "x$ac_cv_func_telldir" = xyes
4629then :
4630  printf "%s\n" "#define HAVE_TELLDIR 1" >>confdefs.h
4631
4632fi
4633ac_fn_c_check_func "$LINENO" "seekdir" "ac_cv_func_seekdir"
4634if test "x$ac_cv_func_seekdir" = xyes
4635then :
4636  printf "%s\n" "#define HAVE_SEEKDIR 1" >>confdefs.h
4637
4638fi
4639 ;;
4640esac
4641
4642ac_fn_c_check_func "$LINENO" "_NSGetEnviron" "ac_cv_func__NSGetEnviron"
4643if test "x$ac_cv_func__NSGetEnviron" = xyes
4644then :
4645  printf "%s\n" "#define HAVE__NSGETENVIRON 1" >>confdefs.h
4646
4647fi
4648
4649
4650{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $CC options needed to detect all undeclared functions" >&5
4651printf %s "checking for $CC options needed to detect all undeclared functions... " >&6; }
4652if test ${ac_cv_c_undeclared_builtin_options+y}
4653then :
4654  printf %s "(cached) " >&6
4655else $as_nop
4656  ac_save_CFLAGS=$CFLAGS
4657   ac_cv_c_undeclared_builtin_options='cannot detect'
4658   for ac_arg in '' -fno-builtin; do
4659     CFLAGS="$ac_save_CFLAGS $ac_arg"
4660     # This test program should *not* compile successfully.
4661     cat confdefs.h - <<_ACEOF >conftest.$ac_ext
4662/* end confdefs.h.  */
4663
4664int
4665main (void)
4666{
4667(void) strchr;
4668  ;
4669  return 0;
4670}
4671_ACEOF
4672if ac_fn_c_try_compile "$LINENO"
4673then :
4674
4675else $as_nop
4676  # This test program should compile successfully.
4677        # No library function is consistently available on
4678        # freestanding implementations, so test against a dummy
4679        # declaration.  Include always-available headers on the
4680        # off chance that they somehow elicit warnings.
4681        cat confdefs.h - <<_ACEOF >conftest.$ac_ext
4682/* end confdefs.h.  */
4683#include <float.h>
4684#include <limits.h>
4685#include <stdarg.h>
4686#include <stddef.h>
4687extern void ac_decl (int, char *);
4688
4689int
4690main (void)
4691{
4692(void) ac_decl (0, (char *) 0);
4693  (void) ac_decl;
4694
4695  ;
4696  return 0;
4697}
4698_ACEOF
4699if ac_fn_c_try_compile "$LINENO"
4700then :
4701  if test x"$ac_arg" = x
4702then :
4703  ac_cv_c_undeclared_builtin_options='none needed'
4704else $as_nop
4705  ac_cv_c_undeclared_builtin_options=$ac_arg
4706fi
4707          break
4708fi
4709rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
4710fi
4711rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
4712    done
4713    CFLAGS=$ac_save_CFLAGS
4714
4715fi
4716{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_c_undeclared_builtin_options" >&5
4717printf "%s\n" "$ac_cv_c_undeclared_builtin_options" >&6; }
4718  case $ac_cv_c_undeclared_builtin_options in #(
4719  'cannot detect') :
4720    { { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
4721printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
4722as_fn_error $? "cannot make $CC report undeclared builtins
4723See \`config.log' for more details" "$LINENO" 5; } ;; #(
4724  'none needed') :
4725    ac_c_undeclared_builtin_options='' ;; #(
4726  *) :
4727    ac_c_undeclared_builtin_options=$ac_cv_c_undeclared_builtin_options ;;
4728esac
4729
4730ac_fn_check_decl "$LINENO" "execvpe" "ac_cv_have_decl_execvpe" "$ac_includes_default" "$ac_c_undeclared_builtin_options" "CFLAGS"
4731if test "x$ac_cv_have_decl_execvpe" = xyes
4732then :
4733  ac_have_decl=1
4734else $as_nop
4735  ac_have_decl=0
4736fi
4737printf "%s\n" "#define HAVE_DECL_EXECVPE $ac_have_decl" >>confdefs.h
4738
4739ac_fn_c_check_func "$LINENO" "execvpe" "ac_cv_func_execvpe"
4740if test "x$ac_cv_func_execvpe" = xyes
4741then :
4742  printf "%s\n" "#define HAVE_EXECVPE 1" >>confdefs.h
4743
4744fi
4745
4746
4747ac_fn_c_check_member "$LINENO" "struct stat" "st_atim" "ac_cv_member_struct_stat_st_atim" "$ac_includes_default"
4748if test "x$ac_cv_member_struct_stat_st_atim" = xyes
4749then :
4750
4751printf "%s\n" "#define HAVE_STRUCT_STAT_ST_ATIM 1" >>confdefs.h
4752
4753
4754fi
4755
4756ac_fn_c_check_member "$LINENO" "struct stat" "st_mtim" "ac_cv_member_struct_stat_st_mtim" "$ac_includes_default"
4757if test "x$ac_cv_member_struct_stat_st_mtim" = xyes
4758then :
4759
4760printf "%s\n" "#define HAVE_STRUCT_STAT_ST_MTIM 1" >>confdefs.h
4761
4762
4763fi
4764
4765ac_fn_c_check_member "$LINENO" "struct stat" "st_ctim" "ac_cv_member_struct_stat_st_ctim" "$ac_includes_default"
4766if test "x$ac_cv_member_struct_stat_st_ctim" = xyes
4767then :
4768
4769printf "%s\n" "#define HAVE_STRUCT_STAT_ST_CTIM 1" >>confdefs.h
4770
4771
4772fi
4773
4774ac_fn_c_check_member "$LINENO" "struct stat" "st_atimespec" "ac_cv_member_struct_stat_st_atimespec" "$ac_includes_default"
4775if test "x$ac_cv_member_struct_stat_st_atimespec" = xyes
4776then :
4777
4778printf "%s\n" "#define HAVE_STRUCT_STAT_ST_ATIMESPEC 1" >>confdefs.h
4779
4780
4781fi
4782
4783ac_fn_c_check_member "$LINENO" "struct stat" "st_mtimespec" "ac_cv_member_struct_stat_st_mtimespec" "$ac_includes_default"
4784if test "x$ac_cv_member_struct_stat_st_mtimespec" = xyes
4785then :
4786
4787printf "%s\n" "#define HAVE_STRUCT_STAT_ST_MTIMESPEC 1" >>confdefs.h
4788
4789
4790fi
4791
4792ac_fn_c_check_member "$LINENO" "struct stat" "st_ctimespec" "ac_cv_member_struct_stat_st_ctimespec" "$ac_includes_default"
4793if test "x$ac_cv_member_struct_stat_st_ctimespec" = xyes
4794then :
4795
4796printf "%s\n" "#define HAVE_STRUCT_STAT_ST_CTIMESPEC 1" >>confdefs.h
4797
4798
4799fi
4800
4801ac_fn_c_check_member "$LINENO" "struct stat" "st_atimensec" "ac_cv_member_struct_stat_st_atimensec" "$ac_includes_default"
4802if test "x$ac_cv_member_struct_stat_st_atimensec" = xyes
4803then :
4804
4805printf "%s\n" "#define HAVE_STRUCT_STAT_ST_ATIMENSEC 1" >>confdefs.h
4806
4807
4808fi
4809
4810ac_fn_c_check_member "$LINENO" "struct stat" "st_mtimensec" "ac_cv_member_struct_stat_st_mtimensec" "$ac_includes_default"
4811if test "x$ac_cv_member_struct_stat_st_mtimensec" = xyes
4812then :
4813
4814printf "%s\n" "#define HAVE_STRUCT_STAT_ST_MTIMENSEC 1" >>confdefs.h
4815
4816
4817fi
4818
4819ac_fn_c_check_member "$LINENO" "struct stat" "st_ctimensec" "ac_cv_member_struct_stat_st_ctimensec" "$ac_includes_default"
4820if test "x$ac_cv_member_struct_stat_st_ctimensec" = xyes
4821then :
4822
4823printf "%s\n" "#define HAVE_STRUCT_STAT_ST_CTIMENSEC 1" >>confdefs.h
4824
4825
4826fi
4827
4828ac_fn_c_check_member "$LINENO" "struct stat" "st_atime_n" "ac_cv_member_struct_stat_st_atime_n" "$ac_includes_default"
4829if test "x$ac_cv_member_struct_stat_st_atime_n" = xyes
4830then :
4831
4832printf "%s\n" "#define HAVE_STRUCT_STAT_ST_ATIME_N 1" >>confdefs.h
4833
4834
4835fi
4836
4837ac_fn_c_check_member "$LINENO" "struct stat" "st_mtime_n" "ac_cv_member_struct_stat_st_mtime_n" "$ac_includes_default"
4838if test "x$ac_cv_member_struct_stat_st_mtime_n" = xyes
4839then :
4840
4841printf "%s\n" "#define HAVE_STRUCT_STAT_ST_MTIME_N 1" >>confdefs.h
4842
4843
4844fi
4845
4846ac_fn_c_check_member "$LINENO" "struct stat" "st_ctime_n" "ac_cv_member_struct_stat_st_ctime_n" "$ac_includes_default"
4847if test "x$ac_cv_member_struct_stat_st_ctime_n" = xyes
4848then :
4849
4850printf "%s\n" "#define HAVE_STRUCT_STAT_ST_CTIME_N 1" >>confdefs.h
4851
4852
4853fi
4854
4855ac_fn_c_check_member "$LINENO" "struct stat" "st_uatime" "ac_cv_member_struct_stat_st_uatime" "$ac_includes_default"
4856if test "x$ac_cv_member_struct_stat_st_uatime" = xyes
4857then :
4858
4859printf "%s\n" "#define HAVE_STRUCT_STAT_ST_UATIME 1" >>confdefs.h
4860
4861
4862fi
4863
4864ac_fn_c_check_member "$LINENO" "struct stat" "st_umtime" "ac_cv_member_struct_stat_st_umtime" "$ac_includes_default"
4865if test "x$ac_cv_member_struct_stat_st_umtime" = xyes
4866then :
4867
4868printf "%s\n" "#define HAVE_STRUCT_STAT_ST_UMTIME 1" >>confdefs.h
4869
4870
4871fi
4872
4873ac_fn_c_check_member "$LINENO" "struct stat" "st_uctime" "ac_cv_member_struct_stat_st_uctime" "$ac_includes_default"
4874if test "x$ac_cv_member_struct_stat_st_uctime" = xyes
4875then :
4876
4877printf "%s\n" "#define HAVE_STRUCT_STAT_ST_UCTIME 1" >>confdefs.h
4878
4879
4880fi
4881
4882
4883ac_fn_c_check_member "$LINENO" "struct passwd" "pw_gecos" "ac_cv_member_struct_passwd_pw_gecos" "#include <pwd.h>
4884"
4885if test "x$ac_cv_member_struct_passwd_pw_gecos" = xyes
4886then :
4887
4888else $as_nop
4889
4890printf "%s\n" "#define HAVE_NO_PASSWD_PW_GECOS /**/" >>confdefs.h
4891
4892fi
4893
4894
4895# Functions for changing file timestamps
4896ac_fn_c_check_func "$LINENO" "utimensat" "ac_cv_func_utimensat"
4897if test "x$ac_cv_func_utimensat" = xyes
4898then :
4899  printf "%s\n" "#define HAVE_UTIMENSAT 1" >>confdefs.h
4900
4901fi
4902ac_fn_c_check_func "$LINENO" "futimens" "ac_cv_func_futimens"
4903if test "x$ac_cv_func_futimens" = xyes
4904then :
4905  printf "%s\n" "#define HAVE_FUTIMENS 1" >>confdefs.h
4906
4907fi
4908
4909ac_fn_c_check_func "$LINENO" "lutimes" "ac_cv_func_lutimes"
4910if test "x$ac_cv_func_lutimes" = xyes
4911then :
4912  printf "%s\n" "#define HAVE_LUTIMES 1" >>confdefs.h
4913
4914fi
4915ac_fn_c_check_func "$LINENO" "futimes" "ac_cv_func_futimes"
4916if test "x$ac_cv_func_futimes" = xyes
4917then :
4918  printf "%s\n" "#define HAVE_FUTIMES 1" >>confdefs.h
4919
4920fi
4921
4922
4923# Additional temp functions
4924# We explicilty check for android, as the check AC_CHECK_FUNCS performs returns "yes" for mkstemps
4925# when targetting android. See similar conditionals for seekdir and telldir.
4926case $target_os in #(
4927  *-android*) :
4928    ac_fn_c_check_func "$LINENO" "mkdtemp" "ac_cv_func_mkdtemp"
4929if test "x$ac_cv_func_mkdtemp" = xyes
4930then :
4931  printf "%s\n" "#define HAVE_MKDTEMP 1" >>confdefs.h
4932
4933fi
4934 ;; #(
4935  *) :
4936    ac_fn_c_check_func "$LINENO" "mkstemps" "ac_cv_func_mkstemps"
4937if test "x$ac_cv_func_mkstemps" = xyes
4938then :
4939  printf "%s\n" "#define HAVE_MKSTEMPS 1" >>confdefs.h
4940
4941fi
4942ac_fn_c_check_func "$LINENO" "mkdtemp" "ac_cv_func_mkdtemp"
4943if test "x$ac_cv_func_mkdtemp" = xyes
4944then :
4945  printf "%s\n" "#define HAVE_MKDTEMP 1" >>confdefs.h
4946
4947fi
4948 ;;
4949esac
4950
4951# Functions for file synchronization and allocation control
4952ac_fn_c_check_func "$LINENO" "fsync" "ac_cv_func_fsync"
4953if test "x$ac_cv_func_fsync" = xyes
4954then :
4955  printf "%s\n" "#define HAVE_FSYNC 1" >>confdefs.h
4956
4957fi
4958
4959
4960# On OSX linking against 'fdatasync' succeeds, but that doesn't pick
4961# the expected the POSIX 'fdatasync' function.  So make sure that we
4962# also have a function declaration in scope, in addition to being able
4963# to link against 'fdatasync'.
4964ac_fn_check_decl "$LINENO" "fdatasync" "ac_cv_have_decl_fdatasync" "$ac_includes_default" "$ac_c_undeclared_builtin_options" "CFLAGS"
4965if test "x$ac_cv_have_decl_fdatasync" = xyes
4966then :
4967  ac_have_decl=1
4968else $as_nop
4969  ac_have_decl=0
4970fi
4971printf "%s\n" "#define HAVE_DECL_FDATASYNC $ac_have_decl" >>confdefs.h
4972if test $ac_have_decl = 1
4973then :
4974  ac_fn_c_check_func "$LINENO" "fdatasync" "ac_cv_func_fdatasync"
4975if test "x$ac_cv_func_fdatasync" = xyes
4976then :
4977  printf "%s\n" "#define HAVE_FDATASYNC 1" >>confdefs.h
4978
4979fi
4980
4981fi
4982
4983
4984
4985ac_fn_c_check_func "$LINENO" "posix_fadvise" "ac_cv_func_posix_fadvise"
4986if test "x$ac_cv_func_posix_fadvise" = xyes
4987then :
4988  printf "%s\n" "#define HAVE_POSIX_FADVISE 1" >>confdefs.h
4989
4990fi
4991ac_fn_c_check_func "$LINENO" "posix_fallocate" "ac_cv_func_posix_fallocate"
4992if test "x$ac_cv_func_posix_fallocate" = xyes
4993then :
4994  printf "%s\n" "#define HAVE_POSIX_FALLOCATE 1" >>confdefs.h
4995
4996fi
4997
4998
4999# Some termios(3) functions known to be missing sometimes (see also #55)
5000ac_fn_check_decl "$LINENO" "tcdrain" "ac_cv_have_decl_tcdrain" "$ac_includes_default
5001#ifdef HAVE_TERMIOS_H
5002#include <termios.h>
5003#endif
5004
5005" "$ac_c_undeclared_builtin_options" "CFLAGS"
5006if test "x$ac_cv_have_decl_tcdrain" = xyes
5007then :
5008  ac_have_decl=1
5009else $as_nop
5010  ac_have_decl=0
5011fi
5012printf "%s\n" "#define HAVE_DECL_TCDRAIN $ac_have_decl" >>confdefs.h
5013if test $ac_have_decl = 1
5014then :
5015
5016printf "%s\n" "#define HAVE_TCDRAIN 1" >>confdefs.h
5017
5018fi
5019
5020
5021ac_fn_check_decl "$LINENO" "ctermid" "ac_cv_have_decl_ctermid" "$ac_includes_default
5022#ifdef HAVE_TERMIOS_H
5023#include <termios.h>
5024#endif
5025
5026" "$ac_c_undeclared_builtin_options" "CFLAGS"
5027if test "x$ac_cv_have_decl_ctermid" = xyes
5028then :
5029  ac_have_decl=1
5030else $as_nop
5031  ac_have_decl=0
5032fi
5033printf "%s\n" "#define HAVE_DECL_CTERMID $ac_have_decl" >>confdefs.h
5034if test $ac_have_decl = 1
5035then :
5036
5037printf "%s\n" "#define HAVE_CTERMID 1" >>confdefs.h
5038
5039fi
5040
5041
5042# Avoid adding rt if absent or unneeded
5043# shm_open needs -lrt on linux
5044{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for library containing shm_open" >&5
5045printf %s "checking for library containing shm_open... " >&6; }
5046if test ${ac_cv_search_shm_open+y}
5047then :
5048  printf %s "(cached) " >&6
5049else $as_nop
5050  ac_func_search_save_LIBS=$LIBS
5051cat confdefs.h - <<_ACEOF >conftest.$ac_ext
5052/* end confdefs.h.  */
5053
5054/* Override any GCC internal prototype to avoid an error.
5055   Use char because int might match the return type of a GCC
5056   builtin and then its argument prototype would still apply.  */
5057char shm_open ();
5058int
5059main (void)
5060{
5061return shm_open ();
5062  ;
5063  return 0;
5064}
5065_ACEOF
5066for ac_lib in '' rt
5067do
5068  if test -z "$ac_lib"; then
5069    ac_res="none required"
5070  else
5071    ac_res=-l$ac_lib
5072    LIBS="-l$ac_lib  $ac_func_search_save_LIBS"
5073  fi
5074  if ac_fn_c_try_link "$LINENO"
5075then :
5076  ac_cv_search_shm_open=$ac_res
5077fi
5078rm -f core conftest.err conftest.$ac_objext conftest.beam \
5079    conftest$ac_exeext
5080  if test ${ac_cv_search_shm_open+y}
5081then :
5082  break
5083fi
5084done
5085if test ${ac_cv_search_shm_open+y}
5086then :
5087
5088else $as_nop
5089  ac_cv_search_shm_open=no
5090fi
5091rm conftest.$ac_ext
5092LIBS=$ac_func_search_save_LIBS
5093fi
5094{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_search_shm_open" >&5
5095printf "%s\n" "$ac_cv_search_shm_open" >&6; }
5096ac_res=$ac_cv_search_shm_open
5097if test "$ac_res" != no
5098then :
5099  test "$ac_res" = "none required" || LIBS="$ac_res $LIBS"
5100  ac_fn_c_check_func "$LINENO" "shm_open" "ac_cv_func_shm_open"
5101if test "x$ac_cv_func_shm_open" = xyes
5102then :
5103  printf "%s\n" "#define HAVE_SHM_OPEN 1" >>confdefs.h
5104
5105fi
5106ac_fn_c_check_func "$LINENO" "shm_unlink" "ac_cv_func_shm_unlink"
5107if test "x$ac_cv_func_shm_unlink" = xyes
5108then :
5109  printf "%s\n" "#define HAVE_SHM_UNLINK 1" >>confdefs.h
5110
5111fi
5112
5113fi
5114
5115if test "x$ac_cv_search_shm_open" = x-lrt
5116then :
5117  EXTRA_LIBS="$EXTRA_LIBS rt"
5118fi
5119
5120for fp_const_name in SIGABRT SIGALRM SIGBUS SIGCHLD SIGCONT SIGFPE SIGHUP SIGILL SIGINT SIGKILL SIGPIPE SIGQUIT SIGSEGV SIGSTOP SIGTERM SIGTSTP SIGTTIN SIGTTOU SIGUSR1 SIGUSR2 SIGPOLL SIGPROF SIGSYS SIGTRAP SIGURG SIGVTALRM SIGXCPU SIGXFSZ SIG_BLOCK SIG_SETMASK SIG_UNBLOCK SIGINFO SIGWINCH
5121do
5122as_fp_Cache=`printf "%s\n" "fp_cv_const_$fp_const_name" | $as_tr_sh`
5123{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking value of $fp_const_name" >&5
5124printf %s "checking value of $fp_const_name... " >&6; }
5125if eval test \${$as_fp_Cache+y}
5126then :
5127  printf %s "(cached) " >&6
5128else $as_nop
5129  if ac_fn_c_compute_int "$LINENO" "$fp_const_name" "fp_check_const_result"        "
5130#if HAVE_SIGNAL_H
5131#include <signal.h>
5132#endif
5133"
5134then :
5135
5136else $as_nop
5137  fp_check_const_result='-1'
5138fi
5139
5140eval "$as_fp_Cache=\$fp_check_const_result"
5141fi
5142eval ac_res=\$$as_fp_Cache
5143	       { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_res" >&5
5144printf "%s\n" "$ac_res" >&6; }
5145cat >>confdefs.h <<_ACEOF
5146#define `printf "%s\n" "CONST_$fp_const_name" | $as_tr_cpp` `eval 'as_val=${'$as_fp_Cache'};printf "%s\n" "$as_val"'`
5147_ACEOF
5148
5149done
5150
5151
5152{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for _SC_GETGR_R_SIZE_MAX" >&5
5153printf %s "checking for _SC_GETGR_R_SIZE_MAX... " >&6; }
5154ac_ext=c
5155ac_cpp='$CPP $CPPFLAGS'
5156ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
5157ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
5158ac_compiler_gnu=$ac_cv_c_compiler_gnu
5159{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking how to run the C preprocessor" >&5
5160printf %s "checking how to run the C preprocessor... " >&6; }
5161# On Suns, sometimes $CPP names a directory.
5162if test -n "$CPP" && test -d "$CPP"; then
5163  CPP=
5164fi
5165if test -z "$CPP"; then
5166  if test ${ac_cv_prog_CPP+y}
5167then :
5168  printf %s "(cached) " >&6
5169else $as_nop
5170      # Double quotes because $CC needs to be expanded
5171    for CPP in "$CC -E" "$CC -E -traditional-cpp" cpp /lib/cpp
5172    do
5173      ac_preproc_ok=false
5174for ac_c_preproc_warn_flag in '' yes
5175do
5176  # Use a header file that comes with gcc, so configuring glibc
5177  # with a fresh cross-compiler works.
5178  # On the NeXT, cc -E runs the code through the compiler's parser,
5179  # not just through cpp. "Syntax error" is here to catch this case.
5180  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
5181/* end confdefs.h.  */
5182#include <limits.h>
5183		     Syntax error
5184_ACEOF
5185if ac_fn_c_try_cpp "$LINENO"
5186then :
5187
5188else $as_nop
5189  # Broken: fails on valid input.
5190continue
5191fi
5192rm -f conftest.err conftest.i conftest.$ac_ext
5193
5194  # OK, works on sane cases.  Now check whether nonexistent headers
5195  # can be detected and how.
5196  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
5197/* end confdefs.h.  */
5198#include <ac_nonexistent.h>
5199_ACEOF
5200if ac_fn_c_try_cpp "$LINENO"
5201then :
5202  # Broken: success on invalid input.
5203continue
5204else $as_nop
5205  # Passes both tests.
5206ac_preproc_ok=:
5207break
5208fi
5209rm -f conftest.err conftest.i conftest.$ac_ext
5210
5211done
5212# Because of `break', _AC_PREPROC_IFELSE's cleaning code was skipped.
5213rm -f conftest.i conftest.err conftest.$ac_ext
5214if $ac_preproc_ok
5215then :
5216  break
5217fi
5218
5219    done
5220    ac_cv_prog_CPP=$CPP
5221
5222fi
5223  CPP=$ac_cv_prog_CPP
5224else
5225  ac_cv_prog_CPP=$CPP
5226fi
5227{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $CPP" >&5
5228printf "%s\n" "$CPP" >&6; }
5229ac_preproc_ok=false
5230for ac_c_preproc_warn_flag in '' yes
5231do
5232  # Use a header file that comes with gcc, so configuring glibc
5233  # with a fresh cross-compiler works.
5234  # On the NeXT, cc -E runs the code through the compiler's parser,
5235  # not just through cpp. "Syntax error" is here to catch this case.
5236  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
5237/* end confdefs.h.  */
5238#include <limits.h>
5239		     Syntax error
5240_ACEOF
5241if ac_fn_c_try_cpp "$LINENO"
5242then :
5243
5244else $as_nop
5245  # Broken: fails on valid input.
5246continue
5247fi
5248rm -f conftest.err conftest.i conftest.$ac_ext
5249
5250  # OK, works on sane cases.  Now check whether nonexistent headers
5251  # can be detected and how.
5252  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
5253/* end confdefs.h.  */
5254#include <ac_nonexistent.h>
5255_ACEOF
5256if ac_fn_c_try_cpp "$LINENO"
5257then :
5258  # Broken: success on invalid input.
5259continue
5260else $as_nop
5261  # Passes both tests.
5262ac_preproc_ok=:
5263break
5264fi
5265rm -f conftest.err conftest.i conftest.$ac_ext
5266
5267done
5268# Because of `break', _AC_PREPROC_IFELSE's cleaning code was skipped.
5269rm -f conftest.i conftest.err conftest.$ac_ext
5270if $ac_preproc_ok
5271then :
5272
5273else $as_nop
5274  { { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
5275printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
5276as_fn_error $? "C preprocessor \"$CPP\" fails sanity check
5277See \`config.log' for more details" "$LINENO" 5; }
5278fi
5279
5280ac_ext=c
5281ac_cpp='$CPP $CPPFLAGS'
5282ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
5283ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
5284ac_compiler_gnu=$ac_cv_c_compiler_gnu
5285
5286
5287{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for grep that handles long lines and -e" >&5
5288printf %s "checking for grep that handles long lines and -e... " >&6; }
5289if test ${ac_cv_path_GREP+y}
5290then :
5291  printf %s "(cached) " >&6
5292else $as_nop
5293  if test -z "$GREP"; then
5294  ac_path_GREP_found=false
5295  # Loop through the user's path and test for each of PROGNAME-LIST
5296  as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
5297for as_dir in $PATH$PATH_SEPARATOR/usr/xpg4/bin
5298do
5299  IFS=$as_save_IFS
5300  case $as_dir in #(((
5301    '') as_dir=./ ;;
5302    */) ;;
5303    *) as_dir=$as_dir/ ;;
5304  esac
5305    for ac_prog in grep ggrep
5306   do
5307    for ac_exec_ext in '' $ac_executable_extensions; do
5308      ac_path_GREP="$as_dir$ac_prog$ac_exec_ext"
5309      as_fn_executable_p "$ac_path_GREP" || continue
5310# Check for GNU ac_path_GREP and select it if it is found.
5311  # Check for GNU $ac_path_GREP
5312case `"$ac_path_GREP" --version 2>&1` in
5313*GNU*)
5314  ac_cv_path_GREP="$ac_path_GREP" ac_path_GREP_found=:;;
5315*)
5316  ac_count=0
5317  printf %s 0123456789 >"conftest.in"
5318  while :
5319  do
5320    cat "conftest.in" "conftest.in" >"conftest.tmp"
5321    mv "conftest.tmp" "conftest.in"
5322    cp "conftest.in" "conftest.nl"
5323    printf "%s\n" 'GREP' >> "conftest.nl"
5324    "$ac_path_GREP" -e 'GREP$' -e '-(cannot match)-' < "conftest.nl" >"conftest.out" 2>/dev/null || break
5325    diff "conftest.out" "conftest.nl" >/dev/null 2>&1 || break
5326    as_fn_arith $ac_count + 1 && ac_count=$as_val
5327    if test $ac_count -gt ${ac_path_GREP_max-0}; then
5328      # Best one so far, save it but keep looking for a better one
5329      ac_cv_path_GREP="$ac_path_GREP"
5330      ac_path_GREP_max=$ac_count
5331    fi
5332    # 10*(2^10) chars as input seems more than enough
5333    test $ac_count -gt 10 && break
5334  done
5335  rm -f conftest.in conftest.tmp conftest.nl conftest.out;;
5336esac
5337
5338      $ac_path_GREP_found && break 3
5339    done
5340  done
5341  done
5342IFS=$as_save_IFS
5343  if test -z "$ac_cv_path_GREP"; then
5344    as_fn_error $? "no acceptable grep could be found in $PATH$PATH_SEPARATOR/usr/xpg4/bin" "$LINENO" 5
5345  fi
5346else
5347  ac_cv_path_GREP=$GREP
5348fi
5349
5350fi
5351{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_path_GREP" >&5
5352printf "%s\n" "$ac_cv_path_GREP" >&6; }
5353 GREP="$ac_cv_path_GREP"
5354
5355
5356{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for egrep" >&5
5357printf %s "checking for egrep... " >&6; }
5358if test ${ac_cv_path_EGREP+y}
5359then :
5360  printf %s "(cached) " >&6
5361else $as_nop
5362  if echo a | $GREP -E '(a|b)' >/dev/null 2>&1
5363   then ac_cv_path_EGREP="$GREP -E"
5364   else
5365     if test -z "$EGREP"; then
5366  ac_path_EGREP_found=false
5367  # Loop through the user's path and test for each of PROGNAME-LIST
5368  as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
5369for as_dir in $PATH$PATH_SEPARATOR/usr/xpg4/bin
5370do
5371  IFS=$as_save_IFS
5372  case $as_dir in #(((
5373    '') as_dir=./ ;;
5374    */) ;;
5375    *) as_dir=$as_dir/ ;;
5376  esac
5377    for ac_prog in egrep
5378   do
5379    for ac_exec_ext in '' $ac_executable_extensions; do
5380      ac_path_EGREP="$as_dir$ac_prog$ac_exec_ext"
5381      as_fn_executable_p "$ac_path_EGREP" || continue
5382# Check for GNU ac_path_EGREP and select it if it is found.
5383  # Check for GNU $ac_path_EGREP
5384case `"$ac_path_EGREP" --version 2>&1` in
5385*GNU*)
5386  ac_cv_path_EGREP="$ac_path_EGREP" ac_path_EGREP_found=:;;
5387*)
5388  ac_count=0
5389  printf %s 0123456789 >"conftest.in"
5390  while :
5391  do
5392    cat "conftest.in" "conftest.in" >"conftest.tmp"
5393    mv "conftest.tmp" "conftest.in"
5394    cp "conftest.in" "conftest.nl"
5395    printf "%s\n" 'EGREP' >> "conftest.nl"
5396    "$ac_path_EGREP" 'EGREP$' < "conftest.nl" >"conftest.out" 2>/dev/null || break
5397    diff "conftest.out" "conftest.nl" >/dev/null 2>&1 || break
5398    as_fn_arith $ac_count + 1 && ac_count=$as_val
5399    if test $ac_count -gt ${ac_path_EGREP_max-0}; then
5400      # Best one so far, save it but keep looking for a better one
5401      ac_cv_path_EGREP="$ac_path_EGREP"
5402      ac_path_EGREP_max=$ac_count
5403    fi
5404    # 10*(2^10) chars as input seems more than enough
5405    test $ac_count -gt 10 && break
5406  done
5407  rm -f conftest.in conftest.tmp conftest.nl conftest.out;;
5408esac
5409
5410      $ac_path_EGREP_found && break 3
5411    done
5412  done
5413  done
5414IFS=$as_save_IFS
5415  if test -z "$ac_cv_path_EGREP"; then
5416    as_fn_error $? "no acceptable egrep could be found in $PATH$PATH_SEPARATOR/usr/xpg4/bin" "$LINENO" 5
5417  fi
5418else
5419  ac_cv_path_EGREP=$EGREP
5420fi
5421
5422   fi
5423fi
5424{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_path_EGREP" >&5
5425printf "%s\n" "$ac_cv_path_EGREP" >&6; }
5426 EGREP="$ac_cv_path_EGREP"
5427
5428
5429cat confdefs.h - <<_ACEOF >conftest.$ac_ext
5430/* end confdefs.h.  */
5431
5432#include <unistd.h>
5433#ifdef _SC_GETGR_R_SIZE_MAX
5434we_have_that_sysconf_thing
5435#endif
5436
5437_ACEOF
5438if (eval "$ac_cpp conftest.$ac_ext") 2>&5 |
5439  $EGREP "we_have_that_sysconf_thing" >/dev/null 2>&1
5440then :
5441  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: yes" >&5
5442printf "%s\n" "yes" >&6; }
5443
5444printf "%s\n" "#define HAVE_SC_GETGR_R_SIZE_MAX 1" >>confdefs.h
5445
5446else $as_nop
5447  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
5448printf "%s\n" "no" >&6; }
5449fi
5450rm -rf conftest*
5451
5452
5453{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for _SC_GETPW_R_SIZE_MAX" >&5
5454printf %s "checking for _SC_GETPW_R_SIZE_MAX... " >&6; }
5455cat confdefs.h - <<_ACEOF >conftest.$ac_ext
5456/* end confdefs.h.  */
5457
5458#include <unistd.h>
5459#ifdef _SC_GETPW_R_SIZE_MAX
5460we_have_that_sysconf_thing
5461#endif
5462
5463_ACEOF
5464if (eval "$ac_cpp conftest.$ac_ext") 2>&5 |
5465  $EGREP "we_have_that_sysconf_thing" >/dev/null 2>&1
5466then :
5467  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: yes" >&5
5468printf "%s\n" "yes" >&6; }
5469
5470printf "%s\n" "#define HAVE_SC_GETPW_R_SIZE_MAX 1" >>confdefs.h
5471
5472else $as_nop
5473  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
5474printf "%s\n" "no" >&6; }
5475fi
5476rm -rf conftest*
5477
5478
5479
5480### On some systems usleep has no return value.  If it does have one,
5481### we'd like to return it; otherwise, we'll fake it.
5482{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking return type of usleep" >&5
5483printf %s "checking return type of usleep... " >&6; }
5484if test ${fptools_cv_func_usleep_return_type+y}
5485then :
5486  printf %s "(cached) " >&6
5487else $as_nop
5488  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
5489/* end confdefs.h.  */
5490#include <unistd.h>
5491
5492_ACEOF
5493if (eval "$ac_cpp conftest.$ac_ext") 2>&5 |
5494  $EGREP "void[      ]+usleep" >/dev/null 2>&1
5495then :
5496  fptools_cv_func_usleep_return_type=void
5497else $as_nop
5498  fptools_cv_func_usleep_return_type=int
5499fi
5500rm -rf conftest*
5501
5502fi
5503{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $fptools_cv_func_usleep_return_type" >&5
5504printf "%s\n" "$fptools_cv_func_usleep_return_type" >&6; }
5505case "$fptools_cv_func_usleep_return_type" in
5506  "void" )
5507
5508printf "%s\n" "#define USLEEP_RETURNS_VOID 1" >>confdefs.h
5509
5510  ;;
5511esac
5512
5513###  POSIX.1003.1 unsetenv returns 0 or -1 (EINVAL), but older implementations
5514###  in common use return void.
5515{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking return type of unsetenv" >&5
5516printf %s "checking return type of unsetenv... " >&6; }
5517if test ${fptools_cv_func_unsetenv_return_type+y}
5518then :
5519  printf %s "(cached) " >&6
5520else $as_nop
5521  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
5522/* end confdefs.h.  */
5523#include <stdlib.h>
5524
5525_ACEOF
5526if (eval "$ac_cpp conftest.$ac_ext") 2>&5 |
5527  $EGREP "void[      ]+unsetenv" >/dev/null 2>&1
5528then :
5529  fptools_cv_func_unsetenv_return_type=void
5530else $as_nop
5531  fptools_cv_func_unsetenv_return_type=int
5532fi
5533rm -rf conftest*
5534
5535fi
5536{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $fptools_cv_func_unsetenv_return_type" >&5
5537printf "%s\n" "$fptools_cv_func_unsetenv_return_type" >&6; }
5538case "$fptools_cv_func_unsetenv_return_type" in
5539  "void" )
5540
5541printf "%s\n" "#define UNSETENV_RETURNS_VOID 1" >>confdefs.h
5542
5543  ;;
5544esac
5545
5546{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for RTLD_NEXT from dlfcn.h" >&5
5547printf %s "checking for RTLD_NEXT from dlfcn.h... " >&6; }
5548cat confdefs.h - <<_ACEOF >conftest.$ac_ext
5549/* end confdefs.h.  */
5550
5551 #include <dlfcn.h>
5552 #ifdef RTLD_NEXT
5553        yes
5554 #endif
5555
5556_ACEOF
5557if (eval "$ac_cpp conftest.$ac_ext") 2>&5 |
5558  $EGREP "yes" >/dev/null 2>&1
5559then :
5560
5561  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: yes" >&5
5562printf "%s\n" "yes" >&6; }
5563
5564printf "%s\n" "#define HAVE_RTLDNEXT 1" >>confdefs.h
5565
5566
5567else $as_nop
5568
5569  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
5570printf "%s\n" "no" >&6; }
5571
5572fi
5573rm -rf conftest*
5574
5575
5576{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for RTLD_DEFAULT from dlfcn.h" >&5
5577printf %s "checking for RTLD_DEFAULT from dlfcn.h... " >&6; }
5578cat confdefs.h - <<_ACEOF >conftest.$ac_ext
5579/* end confdefs.h.  */
5580
5581 #include <dlfcn.h>
5582 #ifdef RTLD_DEFAULT
5583        yes
5584 #endif
5585
5586_ACEOF
5587if (eval "$ac_cpp conftest.$ac_ext") 2>&5 |
5588  $EGREP "yes" >/dev/null 2>&1
5589then :
5590
5591  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: yes" >&5
5592printf "%s\n" "yes" >&6; }
5593
5594printf "%s\n" "#define HAVE_RTLDDEFAULT 1" >>confdefs.h
5595
5596
5597else $as_nop
5598
5599  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
5600printf "%s\n" "no" >&6; }
5601
5602fi
5603rm -rf conftest*
5604
5605
5606
5607  for ac_func in openpty
5608do :
5609  ac_fn_c_check_func "$LINENO" "openpty" "ac_cv_func_openpty"
5610if test "x$ac_cv_func_openpty" = xyes
5611then :
5612  printf "%s\n" "#define HAVE_OPENPTY 1" >>confdefs.h
5613
5614else $as_nop
5615  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for openpty in -lutil" >&5
5616printf %s "checking for openpty in -lutil... " >&6; }
5617if test ${ac_cv_lib_util_openpty+y}
5618then :
5619  printf %s "(cached) " >&6
5620else $as_nop
5621  ac_check_lib_save_LIBS=$LIBS
5622LIBS="-lutil  $LIBS"
5623cat confdefs.h - <<_ACEOF >conftest.$ac_ext
5624/* end confdefs.h.  */
5625
5626/* Override any GCC internal prototype to avoid an error.
5627   Use char because int might match the return type of a GCC
5628   builtin and then its argument prototype would still apply.  */
5629char openpty ();
5630int
5631main (void)
5632{
5633return openpty ();
5634  ;
5635  return 0;
5636}
5637_ACEOF
5638if ac_fn_c_try_link "$LINENO"
5639then :
5640  ac_cv_lib_util_openpty=yes
5641else $as_nop
5642  ac_cv_lib_util_openpty=no
5643fi
5644rm -f core conftest.err conftest.$ac_objext conftest.beam \
5645    conftest$ac_exeext conftest.$ac_ext
5646LIBS=$ac_check_lib_save_LIBS
5647fi
5648{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_lib_util_openpty" >&5
5649printf "%s\n" "$ac_cv_lib_util_openpty" >&6; }
5650if test "x$ac_cv_lib_util_openpty" = xyes
5651then :
5652  printf "%s\n" "#define HAVE_OPENPTY 1" >>confdefs.h
5653 EXTRA_LIBS="$EXTRA_LIBS util"
5654else $as_nop
5655  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for openpty in -lbsd" >&5
5656printf %s "checking for openpty in -lbsd... " >&6; }
5657if test ${ac_cv_lib_bsd_openpty+y}
5658then :
5659  printf %s "(cached) " >&6
5660else $as_nop
5661  ac_check_lib_save_LIBS=$LIBS
5662LIBS="-lbsd  $LIBS"
5663cat confdefs.h - <<_ACEOF >conftest.$ac_ext
5664/* end confdefs.h.  */
5665
5666/* Override any GCC internal prototype to avoid an error.
5667   Use char because int might match the return type of a GCC
5668   builtin and then its argument prototype would still apply.  */
5669char openpty ();
5670int
5671main (void)
5672{
5673return openpty ();
5674  ;
5675  return 0;
5676}
5677_ACEOF
5678if ac_fn_c_try_link "$LINENO"
5679then :
5680  ac_cv_lib_bsd_openpty=yes
5681else $as_nop
5682  ac_cv_lib_bsd_openpty=no
5683fi
5684rm -f core conftest.err conftest.$ac_objext conftest.beam \
5685    conftest$ac_exeext conftest.$ac_ext
5686LIBS=$ac_check_lib_save_LIBS
5687fi
5688{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_lib_bsd_openpty" >&5
5689printf "%s\n" "$ac_cv_lib_bsd_openpty" >&6; }
5690if test "x$ac_cv_lib_bsd_openpty" = xyes
5691then :
5692  printf "%s\n" "#define HAVE_OPENPTY 1" >>confdefs.h
5693 EXTRA_LIBS="$EXTRA_LIBS bsd"
5694fi
5695
5696
5697fi
5698
5699
5700fi
5701
5702done
5703
5704{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for /dev/ptmx" >&5
5705printf %s "checking for /dev/ptmx... " >&6; }
5706if test -r /dev/ptmx
5707then
5708  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: yes" >&5
5709printf "%s\n" "yes" >&6; }
5710
5711printf "%s\n" "#define HAVE_DEV_PTMX 1" >>confdefs.h
5712
5713else
5714  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
5715printf "%s\n" "no" >&6; }
5716fi
5717
5718{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for /dev/ptc" >&5
5719printf %s "checking for /dev/ptc... " >&6; }
5720if test -r /dev/ptc
5721then
5722  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: yes" >&5
5723printf "%s\n" "yes" >&6; }
5724
5725printf "%s\n" "#define HAVE_DEV_PTC 1" >>confdefs.h
5726
5727else
5728  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
5729printf "%s\n" "no" >&6; }
5730fi
5731
5732# Avoid adding dl if absent or unneeded
5733{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for library containing dlopen" >&5
5734printf %s "checking for library containing dlopen... " >&6; }
5735if test ${ac_cv_search_dlopen+y}
5736then :
5737  printf %s "(cached) " >&6
5738else $as_nop
5739  ac_func_search_save_LIBS=$LIBS
5740cat confdefs.h - <<_ACEOF >conftest.$ac_ext
5741/* end confdefs.h.  */
5742
5743/* Override any GCC internal prototype to avoid an error.
5744   Use char because int might match the return type of a GCC
5745   builtin and then its argument prototype would still apply.  */
5746char dlopen ();
5747int
5748main (void)
5749{
5750return dlopen ();
5751  ;
5752  return 0;
5753}
5754_ACEOF
5755for ac_lib in '' dl
5756do
5757  if test -z "$ac_lib"; then
5758    ac_res="none required"
5759  else
5760    ac_res=-l$ac_lib
5761    LIBS="-l$ac_lib  $ac_func_search_save_LIBS"
5762  fi
5763  if ac_fn_c_try_link "$LINENO"
5764then :
5765  ac_cv_search_dlopen=$ac_res
5766fi
5767rm -f core conftest.err conftest.$ac_objext conftest.beam \
5768    conftest$ac_exeext
5769  if test ${ac_cv_search_dlopen+y}
5770then :
5771  break
5772fi
5773done
5774if test ${ac_cv_search_dlopen+y}
5775then :
5776
5777else $as_nop
5778  ac_cv_search_dlopen=no
5779fi
5780rm conftest.$ac_ext
5781LIBS=$ac_func_search_save_LIBS
5782fi
5783{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_search_dlopen" >&5
5784printf "%s\n" "$ac_cv_search_dlopen" >&6; }
5785ac_res=$ac_cv_search_dlopen
5786if test "$ac_res" != no
5787then :
5788  test "$ac_res" = "none required" || LIBS="$ac_res $LIBS"
5789  EXTRA_LIBS="$EXTRA_LIBS $ac_lib"
5790fi
5791
5792
5793# -{l,}pthread goo
5794
5795
5796{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for library containing sem_close" >&5
5797printf %s "checking for library containing sem_close... " >&6; }
5798if test ${ac_cv_search_sem_close+y}
5799then :
5800  printf %s "(cached) " >&6
5801else $as_nop
5802  ac_func_search_save_LIBS=$LIBS
5803cat confdefs.h - <<_ACEOF >conftest.$ac_ext
5804/* end confdefs.h.  */
5805
5806/* Override any GCC internal prototype to avoid an error.
5807   Use char because int might match the return type of a GCC
5808   builtin and then its argument prototype would still apply.  */
5809char sem_close ();
5810int
5811main (void)
5812{
5813return sem_close ();
5814  ;
5815  return 0;
5816}
5817_ACEOF
5818for ac_lib in '' pthread
5819do
5820  if test -z "$ac_lib"; then
5821    ac_res="none required"
5822  else
5823    ac_res=-l$ac_lib
5824    LIBS="-l$ac_lib  $ac_func_search_save_LIBS"
5825  fi
5826  if ac_fn_c_try_link "$LINENO"
5827then :
5828  ac_cv_search_sem_close=$ac_res
5829fi
5830rm -f core conftest.err conftest.$ac_objext conftest.beam \
5831    conftest$ac_exeext
5832  if test ${ac_cv_search_sem_close+y}
5833then :
5834  break
5835fi
5836done
5837if test ${ac_cv_search_sem_close+y}
5838then :
5839
5840else $as_nop
5841  ac_cv_search_sem_close=no
5842fi
5843rm conftest.$ac_ext
5844LIBS=$ac_func_search_save_LIBS
5845fi
5846{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_search_sem_close" >&5
5847printf "%s\n" "$ac_cv_search_sem_close" >&6; }
5848ac_res=$ac_cv_search_sem_close
5849if test "$ac_res" != no
5850then :
5851  test "$ac_res" = "none required" || LIBS="$ac_res $LIBS"
5852  EXTRA_LIBS="$EXTRA_LIBS $ac_lib"
5853else $as_nop
5854  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: Not found" >&5
5855printf "%s\n" "$as_me: Not found" >&6;}
5856fi
5857
5858
5859
5860ac_config_files="$ac_config_files unix.buildinfo"
5861
5862
5863cat >confcache <<\_ACEOF
5864# This file is a shell script that caches the results of configure
5865# tests run on this system so they can be shared between configure
5866# scripts and configure runs, see configure's option --config-cache.
5867# It is not useful on other systems.  If it contains results you don't
5868# want to keep, you may remove or edit it.
5869#
5870# config.status only pays attention to the cache file if you give it
5871# the --recheck option to rerun configure.
5872#
5873# `ac_cv_env_foo' variables (set or unset) will be overridden when
5874# loading this file, other *unset* `ac_cv_foo' will be assigned the
5875# following values.
5876
5877_ACEOF
5878
5879# The following way of writing the cache mishandles newlines in values,
5880# but we know of no workaround that is simple, portable, and efficient.
5881# So, we kill variables containing newlines.
5882# Ultrix sh set writes to stderr and can't be redirected directly,
5883# and sets the high bit in the cache file unless we assign to the vars.
5884(
5885  for ac_var in `(set) 2>&1 | sed -n 's/^\([a-zA-Z_][a-zA-Z0-9_]*\)=.*/\1/p'`; do
5886    eval ac_val=\$$ac_var
5887    case $ac_val in #(
5888    *${as_nl}*)
5889      case $ac_var in #(
5890      *_cv_*) { printf "%s\n" "$as_me:${as_lineno-$LINENO}: WARNING: cache variable $ac_var contains a newline" >&5
5891printf "%s\n" "$as_me: WARNING: cache variable $ac_var contains a newline" >&2;} ;;
5892      esac
5893      case $ac_var in #(
5894      _ | IFS | as_nl) ;; #(
5895      BASH_ARGV | BASH_SOURCE) eval $ac_var= ;; #(
5896      *) { eval $ac_var=; unset $ac_var;} ;;
5897      esac ;;
5898    esac
5899  done
5900
5901  (set) 2>&1 |
5902    case $as_nl`(ac_space=' '; set) 2>&1` in #(
5903    *${as_nl}ac_space=\ *)
5904      # `set' does not quote correctly, so add quotes: double-quote
5905      # substitution turns \\\\ into \\, and sed turns \\ into \.
5906      sed -n \
5907	"s/'/'\\\\''/g;
5908	  s/^\\([_$as_cr_alnum]*_cv_[_$as_cr_alnum]*\\)=\\(.*\\)/\\1='\\2'/p"
5909      ;; #(
5910    *)
5911      # `set' quotes correctly as required by POSIX, so do not add quotes.
5912      sed -n "/^[_$as_cr_alnum]*_cv_[_$as_cr_alnum]*=/p"
5913      ;;
5914    esac |
5915    sort
5916) |
5917  sed '
5918     /^ac_cv_env_/b end
5919     t clear
5920     :clear
5921     s/^\([^=]*\)=\(.*[{}].*\)$/test ${\1+y} || &/
5922     t end
5923     s/^\([^=]*\)=\(.*\)$/\1=${\1=\2}/
5924     :end' >>confcache
5925if diff "$cache_file" confcache >/dev/null 2>&1; then :; else
5926  if test -w "$cache_file"; then
5927    if test "x$cache_file" != "x/dev/null"; then
5928      { printf "%s\n" "$as_me:${as_lineno-$LINENO}: updating cache $cache_file" >&5
5929printf "%s\n" "$as_me: updating cache $cache_file" >&6;}
5930      if test ! -f "$cache_file" || test -h "$cache_file"; then
5931	cat confcache >"$cache_file"
5932      else
5933        case $cache_file in #(
5934        */* | ?:*)
5935	  mv -f confcache "$cache_file"$$ &&
5936	  mv -f "$cache_file"$$ "$cache_file" ;; #(
5937        *)
5938	  mv -f confcache "$cache_file" ;;
5939	esac
5940      fi
5941    fi
5942  else
5943    { printf "%s\n" "$as_me:${as_lineno-$LINENO}: not updating unwritable cache $cache_file" >&5
5944printf "%s\n" "$as_me: not updating unwritable cache $cache_file" >&6;}
5945  fi
5946fi
5947rm -f confcache
5948
5949test "x$prefix" = xNONE && prefix=$ac_default_prefix
5950# Let make expand exec_prefix.
5951test "x$exec_prefix" = xNONE && exec_prefix='${prefix}'
5952
5953DEFS=-DHAVE_CONFIG_H
5954
5955ac_libobjs=
5956ac_ltlibobjs=
5957U=
5958for ac_i in : $LIBOBJS; do test "x$ac_i" = x: && continue
5959  # 1. Remove the extension, and $U if already installed.
5960  ac_script='s/\$U\././;s/\.o$//;s/\.obj$//'
5961  ac_i=`printf "%s\n" "$ac_i" | sed "$ac_script"`
5962  # 2. Prepend LIBOBJDIR.  When used with automake>=1.10 LIBOBJDIR
5963  #    will be set to the directory where LIBOBJS objects are built.
5964  as_fn_append ac_libobjs " \${LIBOBJDIR}$ac_i\$U.$ac_objext"
5965  as_fn_append ac_ltlibobjs " \${LIBOBJDIR}$ac_i"'$U.lo'
5966done
5967LIBOBJS=$ac_libobjs
5968
5969LTLIBOBJS=$ac_ltlibobjs
5970
5971
5972
5973: "${CONFIG_STATUS=./config.status}"
5974ac_write_fail=0
5975ac_clean_files_save=$ac_clean_files
5976ac_clean_files="$ac_clean_files $CONFIG_STATUS"
5977{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: creating $CONFIG_STATUS" >&5
5978printf "%s\n" "$as_me: creating $CONFIG_STATUS" >&6;}
5979as_write_fail=0
5980cat >$CONFIG_STATUS <<_ASEOF || as_write_fail=1
5981#! $SHELL
5982# Generated by $as_me.
5983# Run this file to recreate the current configuration.
5984# Compiler output produced by configure, useful for debugging
5985# configure, is in config.log if it exists.
5986
5987debug=false
5988ac_cs_recheck=false
5989ac_cs_silent=false
5990
5991SHELL=\${CONFIG_SHELL-$SHELL}
5992export SHELL
5993_ASEOF
5994cat >>$CONFIG_STATUS <<\_ASEOF || as_write_fail=1
5995## -------------------- ##
5996## M4sh Initialization. ##
5997## -------------------- ##
5998
5999# Be more Bourne compatible
6000DUALCASE=1; export DUALCASE # for MKS sh
6001as_nop=:
6002if test ${ZSH_VERSION+y} && (emulate sh) >/dev/null 2>&1
6003then :
6004  emulate sh
6005  NULLCMD=:
6006  # Pre-4.2 versions of Zsh do word splitting on ${1+"$@"}, which
6007  # is contrary to our usage.  Disable this feature.
6008  alias -g '${1+"$@"}'='"$@"'
6009  setopt NO_GLOB_SUBST
6010else $as_nop
6011  case `(set -o) 2>/dev/null` in #(
6012  *posix*) :
6013    set -o posix ;; #(
6014  *) :
6015     ;;
6016esac
6017fi
6018
6019
6020
6021# Reset variables that may have inherited troublesome values from
6022# the environment.
6023
6024# IFS needs to be set, to space, tab, and newline, in precisely that order.
6025# (If _AS_PATH_WALK were called with IFS unset, it would have the
6026# side effect of setting IFS to empty, thus disabling word splitting.)
6027# Quoting is to prevent editors from complaining about space-tab.
6028as_nl='
6029'
6030export as_nl
6031IFS=" ""	$as_nl"
6032
6033PS1='$ '
6034PS2='> '
6035PS4='+ '
6036
6037# Ensure predictable behavior from utilities with locale-dependent output.
6038LC_ALL=C
6039export LC_ALL
6040LANGUAGE=C
6041export LANGUAGE
6042
6043# We cannot yet rely on "unset" to work, but we need these variables
6044# to be unset--not just set to an empty or harmless value--now, to
6045# avoid bugs in old shells (e.g. pre-3.0 UWIN ksh).  This construct
6046# also avoids known problems related to "unset" and subshell syntax
6047# in other old shells (e.g. bash 2.01 and pdksh 5.2.14).
6048for as_var in BASH_ENV ENV MAIL MAILPATH CDPATH
6049do eval test \${$as_var+y} \
6050  && ( (unset $as_var) || exit 1) >/dev/null 2>&1 && unset $as_var || :
6051done
6052
6053# Ensure that fds 0, 1, and 2 are open.
6054if (exec 3>&0) 2>/dev/null; then :; else exec 0</dev/null; fi
6055if (exec 3>&1) 2>/dev/null; then :; else exec 1>/dev/null; fi
6056if (exec 3>&2)            ; then :; else exec 2>/dev/null; fi
6057
6058# The user is always right.
6059if ${PATH_SEPARATOR+false} :; then
6060  PATH_SEPARATOR=:
6061  (PATH='/bin;/bin'; FPATH=$PATH; sh -c :) >/dev/null 2>&1 && {
6062    (PATH='/bin:/bin'; FPATH=$PATH; sh -c :) >/dev/null 2>&1 ||
6063      PATH_SEPARATOR=';'
6064  }
6065fi
6066
6067
6068# Find who we are.  Look in the path if we contain no directory separator.
6069as_myself=
6070case $0 in #((
6071  *[\\/]* ) as_myself=$0 ;;
6072  *) as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
6073for as_dir in $PATH
6074do
6075  IFS=$as_save_IFS
6076  case $as_dir in #(((
6077    '') as_dir=./ ;;
6078    */) ;;
6079    *) as_dir=$as_dir/ ;;
6080  esac
6081    test -r "$as_dir$0" && as_myself=$as_dir$0 && break
6082  done
6083IFS=$as_save_IFS
6084
6085     ;;
6086esac
6087# We did not find ourselves, most probably we were run as `sh COMMAND'
6088# in which case we are not to be found in the path.
6089if test "x$as_myself" = x; then
6090  as_myself=$0
6091fi
6092if test ! -f "$as_myself"; then
6093  printf "%s\n" "$as_myself: error: cannot find myself; rerun with an absolute file name" >&2
6094  exit 1
6095fi
6096
6097
6098
6099# as_fn_error STATUS ERROR [LINENO LOG_FD]
6100# ----------------------------------------
6101# Output "`basename $0`: error: ERROR" to stderr. If LINENO and LOG_FD are
6102# provided, also output the error to LOG_FD, referencing LINENO. Then exit the
6103# script with STATUS, using 1 if that was 0.
6104as_fn_error ()
6105{
6106  as_status=$1; test $as_status -eq 0 && as_status=1
6107  if test "$4"; then
6108    as_lineno=${as_lineno-"$3"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
6109    printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: $2" >&$4
6110  fi
6111  printf "%s\n" "$as_me: error: $2" >&2
6112  as_fn_exit $as_status
6113} # as_fn_error
6114
6115
6116
6117# as_fn_set_status STATUS
6118# -----------------------
6119# Set $? to STATUS, without forking.
6120as_fn_set_status ()
6121{
6122  return $1
6123} # as_fn_set_status
6124
6125# as_fn_exit STATUS
6126# -----------------
6127# Exit the shell with STATUS, even in a "trap 0" or "set -e" context.
6128as_fn_exit ()
6129{
6130  set +e
6131  as_fn_set_status $1
6132  exit $1
6133} # as_fn_exit
6134
6135# as_fn_unset VAR
6136# ---------------
6137# Portably unset VAR.
6138as_fn_unset ()
6139{
6140  { eval $1=; unset $1;}
6141}
6142as_unset=as_fn_unset
6143
6144# as_fn_append VAR VALUE
6145# ----------------------
6146# Append the text in VALUE to the end of the definition contained in VAR. Take
6147# advantage of any shell optimizations that allow amortized linear growth over
6148# repeated appends, instead of the typical quadratic growth present in naive
6149# implementations.
6150if (eval "as_var=1; as_var+=2; test x\$as_var = x12") 2>/dev/null
6151then :
6152  eval 'as_fn_append ()
6153  {
6154    eval $1+=\$2
6155  }'
6156else $as_nop
6157  as_fn_append ()
6158  {
6159    eval $1=\$$1\$2
6160  }
6161fi # as_fn_append
6162
6163# as_fn_arith ARG...
6164# ------------------
6165# Perform arithmetic evaluation on the ARGs, and store the result in the
6166# global $as_val. Take advantage of shells that can avoid forks. The arguments
6167# must be portable across $(()) and expr.
6168if (eval "test \$(( 1 + 1 )) = 2") 2>/dev/null
6169then :
6170  eval 'as_fn_arith ()
6171  {
6172    as_val=$(( $* ))
6173  }'
6174else $as_nop
6175  as_fn_arith ()
6176  {
6177    as_val=`expr "$@" || test $? -eq 1`
6178  }
6179fi # as_fn_arith
6180
6181
6182if expr a : '\(a\)' >/dev/null 2>&1 &&
6183   test "X`expr 00001 : '.*\(...\)'`" = X001; then
6184  as_expr=expr
6185else
6186  as_expr=false
6187fi
6188
6189if (basename -- /) >/dev/null 2>&1 && test "X`basename -- / 2>&1`" = "X/"; then
6190  as_basename=basename
6191else
6192  as_basename=false
6193fi
6194
6195if (as_dir=`dirname -- /` && test "X$as_dir" = X/) >/dev/null 2>&1; then
6196  as_dirname=dirname
6197else
6198  as_dirname=false
6199fi
6200
6201as_me=`$as_basename -- "$0" ||
6202$as_expr X/"$0" : '.*/\([^/][^/]*\)/*$' \| \
6203	 X"$0" : 'X\(//\)$' \| \
6204	 X"$0" : 'X\(/\)' \| . 2>/dev/null ||
6205printf "%s\n" X/"$0" |
6206    sed '/^.*\/\([^/][^/]*\)\/*$/{
6207	    s//\1/
6208	    q
6209	  }
6210	  /^X\/\(\/\/\)$/{
6211	    s//\1/
6212	    q
6213	  }
6214	  /^X\/\(\/\).*/{
6215	    s//\1/
6216	    q
6217	  }
6218	  s/.*/./; q'`
6219
6220# Avoid depending upon Character Ranges.
6221as_cr_letters='abcdefghijklmnopqrstuvwxyz'
6222as_cr_LETTERS='ABCDEFGHIJKLMNOPQRSTUVWXYZ'
6223as_cr_Letters=$as_cr_letters$as_cr_LETTERS
6224as_cr_digits='0123456789'
6225as_cr_alnum=$as_cr_Letters$as_cr_digits
6226
6227
6228# Determine whether it's possible to make 'echo' print without a newline.
6229# These variables are no longer used directly by Autoconf, but are AC_SUBSTed
6230# for compatibility with existing Makefiles.
6231ECHO_C= ECHO_N= ECHO_T=
6232case `echo -n x` in #(((((
6233-n*)
6234  case `echo 'xy\c'` in
6235  *c*) ECHO_T='	';;	# ECHO_T is single tab character.
6236  xy)  ECHO_C='\c';;
6237  *)   echo `echo ksh88 bug on AIX 6.1` > /dev/null
6238       ECHO_T='	';;
6239  esac;;
6240*)
6241  ECHO_N='-n';;
6242esac
6243
6244# For backward compatibility with old third-party macros, we provide
6245# the shell variables $as_echo and $as_echo_n.  New code should use
6246# AS_ECHO(["message"]) and AS_ECHO_N(["message"]), respectively.
6247as_echo='printf %s\n'
6248as_echo_n='printf %s'
6249
6250rm -f conf$$ conf$$.exe conf$$.file
6251if test -d conf$$.dir; then
6252  rm -f conf$$.dir/conf$$.file
6253else
6254  rm -f conf$$.dir
6255  mkdir conf$$.dir 2>/dev/null
6256fi
6257if (echo >conf$$.file) 2>/dev/null; then
6258  if ln -s conf$$.file conf$$ 2>/dev/null; then
6259    as_ln_s='ln -s'
6260    # ... but there are two gotchas:
6261    # 1) On MSYS, both `ln -s file dir' and `ln file dir' fail.
6262    # 2) DJGPP < 2.04 has no symlinks; `ln -s' creates a wrapper executable.
6263    # In both cases, we have to default to `cp -pR'.
6264    ln -s conf$$.file conf$$.dir 2>/dev/null && test ! -f conf$$.exe ||
6265      as_ln_s='cp -pR'
6266  elif ln conf$$.file conf$$ 2>/dev/null; then
6267    as_ln_s=ln
6268  else
6269    as_ln_s='cp -pR'
6270  fi
6271else
6272  as_ln_s='cp -pR'
6273fi
6274rm -f conf$$ conf$$.exe conf$$.dir/conf$$.file conf$$.file
6275rmdir conf$$.dir 2>/dev/null
6276
6277
6278# as_fn_mkdir_p
6279# -------------
6280# Create "$as_dir" as a directory, including parents if necessary.
6281as_fn_mkdir_p ()
6282{
6283
6284  case $as_dir in #(
6285  -*) as_dir=./$as_dir;;
6286  esac
6287  test -d "$as_dir" || eval $as_mkdir_p || {
6288    as_dirs=
6289    while :; do
6290      case $as_dir in #(
6291      *\'*) as_qdir=`printf "%s\n" "$as_dir" | sed "s/'/'\\\\\\\\''/g"`;; #'(
6292      *) as_qdir=$as_dir;;
6293      esac
6294      as_dirs="'$as_qdir' $as_dirs"
6295      as_dir=`$as_dirname -- "$as_dir" ||
6296$as_expr X"$as_dir" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
6297	 X"$as_dir" : 'X\(//\)[^/]' \| \
6298	 X"$as_dir" : 'X\(//\)$' \| \
6299	 X"$as_dir" : 'X\(/\)' \| . 2>/dev/null ||
6300printf "%s\n" X"$as_dir" |
6301    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
6302	    s//\1/
6303	    q
6304	  }
6305	  /^X\(\/\/\)[^/].*/{
6306	    s//\1/
6307	    q
6308	  }
6309	  /^X\(\/\/\)$/{
6310	    s//\1/
6311	    q
6312	  }
6313	  /^X\(\/\).*/{
6314	    s//\1/
6315	    q
6316	  }
6317	  s/.*/./; q'`
6318      test -d "$as_dir" && break
6319    done
6320    test -z "$as_dirs" || eval "mkdir $as_dirs"
6321  } || test -d "$as_dir" || as_fn_error $? "cannot create directory $as_dir"
6322
6323
6324} # as_fn_mkdir_p
6325if mkdir -p . 2>/dev/null; then
6326  as_mkdir_p='mkdir -p "$as_dir"'
6327else
6328  test -d ./-p && rmdir ./-p
6329  as_mkdir_p=false
6330fi
6331
6332
6333# as_fn_executable_p FILE
6334# -----------------------
6335# Test if FILE is an executable regular file.
6336as_fn_executable_p ()
6337{
6338  test -f "$1" && test -x "$1"
6339} # as_fn_executable_p
6340as_test_x='test -x'
6341as_executable_p=as_fn_executable_p
6342
6343# Sed expression to map a string onto a valid CPP name.
6344as_tr_cpp="eval sed 'y%*$as_cr_letters%P$as_cr_LETTERS%;s%[^_$as_cr_alnum]%_%g'"
6345
6346# Sed expression to map a string onto a valid variable name.
6347as_tr_sh="eval sed 'y%*+%pp%;s%[^_$as_cr_alnum]%_%g'"
6348
6349
6350exec 6>&1
6351## ----------------------------------- ##
6352## Main body of $CONFIG_STATUS script. ##
6353## ----------------------------------- ##
6354_ASEOF
6355test $as_write_fail = 0 && chmod +x $CONFIG_STATUS || ac_write_fail=1
6356
6357cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
6358# Save the log message, to keep $0 and so on meaningful, and to
6359# report actual input values of CONFIG_FILES etc. instead of their
6360# values after options handling.
6361ac_log="
6362This file was extended by Haskell unix package $as_me 2.0, which was
6363generated by GNU Autoconf 2.71.  Invocation command line was
6364
6365  CONFIG_FILES    = $CONFIG_FILES
6366  CONFIG_HEADERS  = $CONFIG_HEADERS
6367  CONFIG_LINKS    = $CONFIG_LINKS
6368  CONFIG_COMMANDS = $CONFIG_COMMANDS
6369  $ $0 $@
6370
6371on `(hostname || uname -n) 2>/dev/null | sed 1q`
6372"
6373
6374_ACEOF
6375
6376case $ac_config_files in *"
6377"*) set x $ac_config_files; shift; ac_config_files=$*;;
6378esac
6379
6380case $ac_config_headers in *"
6381"*) set x $ac_config_headers; shift; ac_config_headers=$*;;
6382esac
6383
6384
6385cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
6386# Files that config.status was made for.
6387config_files="$ac_config_files"
6388config_headers="$ac_config_headers"
6389
6390_ACEOF
6391
6392cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
6393ac_cs_usage="\
6394\`$as_me' instantiates files and other configuration actions
6395from templates according to the current configuration.  Unless the files
6396and actions are specified as TAGs, all are instantiated by default.
6397
6398Usage: $0 [OPTION]... [TAG]...
6399
6400  -h, --help       print this help, then exit
6401  -V, --version    print version number and configuration settings, then exit
6402      --config     print configuration, then exit
6403  -q, --quiet, --silent
6404                   do not print progress messages
6405  -d, --debug      don't remove temporary files
6406      --recheck    update $as_me by reconfiguring in the same conditions
6407      --file=FILE[:TEMPLATE]
6408                   instantiate the configuration file FILE
6409      --header=FILE[:TEMPLATE]
6410                   instantiate the configuration header FILE
6411
6412Configuration files:
6413$config_files
6414
6415Configuration headers:
6416$config_headers
6417
6418Report bugs to <libraries@haskell.org>."
6419
6420_ACEOF
6421ac_cs_config=`printf "%s\n" "$ac_configure_args" | sed "$ac_safe_unquote"`
6422ac_cs_config_escaped=`printf "%s\n" "$ac_cs_config" | sed "s/^ //; s/'/'\\\\\\\\''/g"`
6423cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
6424ac_cs_config='$ac_cs_config_escaped'
6425ac_cs_version="\\
6426Haskell unix package config.status 2.0
6427configured by $0, generated by GNU Autoconf 2.71,
6428  with options \\"\$ac_cs_config\\"
6429
6430Copyright (C) 2021 Free Software Foundation, Inc.
6431This config.status script is free software; the Free Software Foundation
6432gives unlimited permission to copy, distribute and modify it."
6433
6434ac_pwd='$ac_pwd'
6435srcdir='$srcdir'
6436test -n "\$AWK" || AWK=awk
6437_ACEOF
6438
6439cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
6440# The default lists apply if the user does not specify any file.
6441ac_need_defaults=:
6442while test $# != 0
6443do
6444  case $1 in
6445  --*=?*)
6446    ac_option=`expr "X$1" : 'X\([^=]*\)='`
6447    ac_optarg=`expr "X$1" : 'X[^=]*=\(.*\)'`
6448    ac_shift=:
6449    ;;
6450  --*=)
6451    ac_option=`expr "X$1" : 'X\([^=]*\)='`
6452    ac_optarg=
6453    ac_shift=:
6454    ;;
6455  *)
6456    ac_option=$1
6457    ac_optarg=$2
6458    ac_shift=shift
6459    ;;
6460  esac
6461
6462  case $ac_option in
6463  # Handling of the options.
6464  -recheck | --recheck | --rechec | --reche | --rech | --rec | --re | --r)
6465    ac_cs_recheck=: ;;
6466  --version | --versio | --versi | --vers | --ver | --ve | --v | -V )
6467    printf "%s\n" "$ac_cs_version"; exit ;;
6468  --config | --confi | --conf | --con | --co | --c )
6469    printf "%s\n" "$ac_cs_config"; exit ;;
6470  --debug | --debu | --deb | --de | --d | -d )
6471    debug=: ;;
6472  --file | --fil | --fi | --f )
6473    $ac_shift
6474    case $ac_optarg in
6475    *\'*) ac_optarg=`printf "%s\n" "$ac_optarg" | sed "s/'/'\\\\\\\\''/g"` ;;
6476    '') as_fn_error $? "missing file argument" ;;
6477    esac
6478    as_fn_append CONFIG_FILES " '$ac_optarg'"
6479    ac_need_defaults=false;;
6480  --header | --heade | --head | --hea )
6481    $ac_shift
6482    case $ac_optarg in
6483    *\'*) ac_optarg=`printf "%s\n" "$ac_optarg" | sed "s/'/'\\\\\\\\''/g"` ;;
6484    esac
6485    as_fn_append CONFIG_HEADERS " '$ac_optarg'"
6486    ac_need_defaults=false;;
6487  --he | --h)
6488    # Conflict between --help and --header
6489    as_fn_error $? "ambiguous option: \`$1'
6490Try \`$0 --help' for more information.";;
6491  --help | --hel | -h )
6492    printf "%s\n" "$ac_cs_usage"; exit ;;
6493  -q | -quiet | --quiet | --quie | --qui | --qu | --q \
6494  | -silent | --silent | --silen | --sile | --sil | --si | --s)
6495    ac_cs_silent=: ;;
6496
6497  # This is an error.
6498  -*) as_fn_error $? "unrecognized option: \`$1'
6499Try \`$0 --help' for more information." ;;
6500
6501  *) as_fn_append ac_config_targets " $1"
6502     ac_need_defaults=false ;;
6503
6504  esac
6505  shift
6506done
6507
6508ac_configure_extra_args=
6509
6510if $ac_cs_silent; then
6511  exec 6>/dev/null
6512  ac_configure_extra_args="$ac_configure_extra_args --silent"
6513fi
6514
6515_ACEOF
6516cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
6517if \$ac_cs_recheck; then
6518  set X $SHELL '$0' $ac_configure_args \$ac_configure_extra_args --no-create --no-recursion
6519  shift
6520  \printf "%s\n" "running CONFIG_SHELL=$SHELL \$*" >&6
6521  CONFIG_SHELL='$SHELL'
6522  export CONFIG_SHELL
6523  exec "\$@"
6524fi
6525
6526_ACEOF
6527cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
6528exec 5>>config.log
6529{
6530  echo
6531  sed 'h;s/./-/g;s/^.../## /;s/...$/ ##/;p;x;p;x' <<_ASBOX
6532## Running $as_me. ##
6533_ASBOX
6534  printf "%s\n" "$ac_log"
6535} >&5
6536
6537_ACEOF
6538cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
6539_ACEOF
6540
6541cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
6542
6543# Handling of arguments.
6544for ac_config_target in $ac_config_targets
6545do
6546  case $ac_config_target in
6547    "include/HsUnixConfig.h") CONFIG_HEADERS="$CONFIG_HEADERS include/HsUnixConfig.h" ;;
6548    "unix.buildinfo") CONFIG_FILES="$CONFIG_FILES unix.buildinfo" ;;
6549
6550  *) as_fn_error $? "invalid argument: \`$ac_config_target'" "$LINENO" 5;;
6551  esac
6552done
6553
6554
6555# If the user did not use the arguments to specify the items to instantiate,
6556# then the envvar interface is used.  Set only those that are not.
6557# We use the long form for the default assignment because of an extremely
6558# bizarre bug on SunOS 4.1.3.
6559if $ac_need_defaults; then
6560  test ${CONFIG_FILES+y} || CONFIG_FILES=$config_files
6561  test ${CONFIG_HEADERS+y} || CONFIG_HEADERS=$config_headers
6562fi
6563
6564# Have a temporary directory for convenience.  Make it in the build tree
6565# simply because there is no reason against having it here, and in addition,
6566# creating and moving files from /tmp can sometimes cause problems.
6567# Hook for its removal unless debugging.
6568# Note that there is a small window in which the directory will not be cleaned:
6569# after its creation but before its name has been assigned to `$tmp'.
6570$debug ||
6571{
6572  tmp= ac_tmp=
6573  trap 'exit_status=$?
6574  : "${ac_tmp:=$tmp}"
6575  { test ! -d "$ac_tmp" || rm -fr "$ac_tmp"; } && exit $exit_status
6576' 0
6577  trap 'as_fn_exit 1' 1 2 13 15
6578}
6579# Create a (secure) tmp directory for tmp files.
6580
6581{
6582  tmp=`(umask 077 && mktemp -d "./confXXXXXX") 2>/dev/null` &&
6583  test -d "$tmp"
6584}  ||
6585{
6586  tmp=./conf$$-$RANDOM
6587  (umask 077 && mkdir "$tmp")
6588} || as_fn_error $? "cannot create a temporary directory in ." "$LINENO" 5
6589ac_tmp=$tmp
6590
6591# Set up the scripts for CONFIG_FILES section.
6592# No need to generate them if there are no CONFIG_FILES.
6593# This happens for instance with `./config.status config.h'.
6594if test -n "$CONFIG_FILES"; then
6595
6596
6597ac_cr=`echo X | tr X '\015'`
6598# On cygwin, bash can eat \r inside `` if the user requested igncr.
6599# But we know of no other shell where ac_cr would be empty at this
6600# point, so we can use a bashism as a fallback.
6601if test "x$ac_cr" = x; then
6602  eval ac_cr=\$\'\\r\'
6603fi
6604ac_cs_awk_cr=`$AWK 'BEGIN { print "a\rb" }' </dev/null 2>/dev/null`
6605if test "$ac_cs_awk_cr" = "a${ac_cr}b"; then
6606  ac_cs_awk_cr='\\r'
6607else
6608  ac_cs_awk_cr=$ac_cr
6609fi
6610
6611echo 'BEGIN {' >"$ac_tmp/subs1.awk" &&
6612_ACEOF
6613
6614
6615{
6616  echo "cat >conf$$subs.awk <<_ACEOF" &&
6617  echo "$ac_subst_vars" | sed 's/.*/&!$&$ac_delim/' &&
6618  echo "_ACEOF"
6619} >conf$$subs.sh ||
6620  as_fn_error $? "could not make $CONFIG_STATUS" "$LINENO" 5
6621ac_delim_num=`echo "$ac_subst_vars" | grep -c '^'`
6622ac_delim='%!_!# '
6623for ac_last_try in false false false false false :; do
6624  . ./conf$$subs.sh ||
6625    as_fn_error $? "could not make $CONFIG_STATUS" "$LINENO" 5
6626
6627  ac_delim_n=`sed -n "s/.*$ac_delim\$/X/p" conf$$subs.awk | grep -c X`
6628  if test $ac_delim_n = $ac_delim_num; then
6629    break
6630  elif $ac_last_try; then
6631    as_fn_error $? "could not make $CONFIG_STATUS" "$LINENO" 5
6632  else
6633    ac_delim="$ac_delim!$ac_delim _$ac_delim!! "
6634  fi
6635done
6636rm -f conf$$subs.sh
6637
6638cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
6639cat >>"\$ac_tmp/subs1.awk" <<\\_ACAWK &&
6640_ACEOF
6641sed -n '
6642h
6643s/^/S["/; s/!.*/"]=/
6644p
6645g
6646s/^[^!]*!//
6647:repl
6648t repl
6649s/'"$ac_delim"'$//
6650t delim
6651:nl
6652h
6653s/\(.\{148\}\)..*/\1/
6654t more1
6655s/["\\]/\\&/g; s/^/"/; s/$/\\n"\\/
6656p
6657n
6658b repl
6659:more1
6660s/["\\]/\\&/g; s/^/"/; s/$/"\\/
6661p
6662g
6663s/.\{148\}//
6664t nl
6665:delim
6666h
6667s/\(.\{148\}\)..*/\1/
6668t more2
6669s/["\\]/\\&/g; s/^/"/; s/$/"/
6670p
6671b
6672:more2
6673s/["\\]/\\&/g; s/^/"/; s/$/"\\/
6674p
6675g
6676s/.\{148\}//
6677t delim
6678' <conf$$subs.awk | sed '
6679/^[^""]/{
6680  N
6681  s/\n//
6682}
6683' >>$CONFIG_STATUS || ac_write_fail=1
6684rm -f conf$$subs.awk
6685cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
6686_ACAWK
6687cat >>"\$ac_tmp/subs1.awk" <<_ACAWK &&
6688  for (key in S) S_is_set[key] = 1
6689  FS = ""
6690
6691}
6692{
6693  line = $ 0
6694  nfields = split(line, field, "@")
6695  substed = 0
6696  len = length(field[1])
6697  for (i = 2; i < nfields; i++) {
6698    key = field[i]
6699    keylen = length(key)
6700    if (S_is_set[key]) {
6701      value = S[key]
6702      line = substr(line, 1, len) "" value "" substr(line, len + keylen + 3)
6703      len += length(value) + length(field[++i])
6704      substed = 1
6705    } else
6706      len += 1 + keylen
6707  }
6708
6709  print line
6710}
6711
6712_ACAWK
6713_ACEOF
6714cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
6715if sed "s/$ac_cr//" < /dev/null > /dev/null 2>&1; then
6716  sed "s/$ac_cr\$//; s/$ac_cr/$ac_cs_awk_cr/g"
6717else
6718  cat
6719fi < "$ac_tmp/subs1.awk" > "$ac_tmp/subs.awk" \
6720  || as_fn_error $? "could not setup config files machinery" "$LINENO" 5
6721_ACEOF
6722
6723# VPATH may cause trouble with some makes, so we remove sole $(srcdir),
6724# ${srcdir} and @srcdir@ entries from VPATH if srcdir is ".", strip leading and
6725# trailing colons and then remove the whole line if VPATH becomes empty
6726# (actually we leave an empty line to preserve line numbers).
6727if test "x$srcdir" = x.; then
6728  ac_vpsub='/^[	 ]*VPATH[	 ]*=[	 ]*/{
6729h
6730s///
6731s/^/:/
6732s/[	 ]*$/:/
6733s/:\$(srcdir):/:/g
6734s/:\${srcdir}:/:/g
6735s/:@srcdir@:/:/g
6736s/^:*//
6737s/:*$//
6738x
6739s/\(=[	 ]*\).*/\1/
6740G
6741s/\n//
6742s/^[^=]*=[	 ]*$//
6743}'
6744fi
6745
6746cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
6747fi # test -n "$CONFIG_FILES"
6748
6749# Set up the scripts for CONFIG_HEADERS section.
6750# No need to generate them if there are no CONFIG_HEADERS.
6751# This happens for instance with `./config.status Makefile'.
6752if test -n "$CONFIG_HEADERS"; then
6753cat >"$ac_tmp/defines.awk" <<\_ACAWK ||
6754BEGIN {
6755_ACEOF
6756
6757# Transform confdefs.h into an awk script `defines.awk', embedded as
6758# here-document in config.status, that substitutes the proper values into
6759# config.h.in to produce config.h.
6760
6761# Create a delimiter string that does not exist in confdefs.h, to ease
6762# handling of long lines.
6763ac_delim='%!_!# '
6764for ac_last_try in false false :; do
6765  ac_tt=`sed -n "/$ac_delim/p" confdefs.h`
6766  if test -z "$ac_tt"; then
6767    break
6768  elif $ac_last_try; then
6769    as_fn_error $? "could not make $CONFIG_HEADERS" "$LINENO" 5
6770  else
6771    ac_delim="$ac_delim!$ac_delim _$ac_delim!! "
6772  fi
6773done
6774
6775# For the awk script, D is an array of macro values keyed by name,
6776# likewise P contains macro parameters if any.  Preserve backslash
6777# newline sequences.
6778
6779ac_word_re=[_$as_cr_Letters][_$as_cr_alnum]*
6780sed -n '
6781s/.\{148\}/&'"$ac_delim"'/g
6782t rset
6783:rset
6784s/^[	 ]*#[	 ]*define[	 ][	 ]*/ /
6785t def
6786d
6787:def
6788s/\\$//
6789t bsnl
6790s/["\\]/\\&/g
6791s/^ \('"$ac_word_re"'\)\(([^()]*)\)[	 ]*\(.*\)/P["\1"]="\2"\
6792D["\1"]=" \3"/p
6793s/^ \('"$ac_word_re"'\)[	 ]*\(.*\)/D["\1"]=" \2"/p
6794d
6795:bsnl
6796s/["\\]/\\&/g
6797s/^ \('"$ac_word_re"'\)\(([^()]*)\)[	 ]*\(.*\)/P["\1"]="\2"\
6798D["\1"]=" \3\\\\\\n"\\/p
6799t cont
6800s/^ \('"$ac_word_re"'\)[	 ]*\(.*\)/D["\1"]=" \2\\\\\\n"\\/p
6801t cont
6802d
6803:cont
6804n
6805s/.\{148\}/&'"$ac_delim"'/g
6806t clear
6807:clear
6808s/\\$//
6809t bsnlc
6810s/["\\]/\\&/g; s/^/"/; s/$/"/p
6811d
6812:bsnlc
6813s/["\\]/\\&/g; s/^/"/; s/$/\\\\\\n"\\/p
6814b cont
6815' <confdefs.h | sed '
6816s/'"$ac_delim"'/"\\\
6817"/g' >>$CONFIG_STATUS || ac_write_fail=1
6818
6819cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
6820  for (key in D) D_is_set[key] = 1
6821  FS = ""
6822}
6823/^[\t ]*#[\t ]*(define|undef)[\t ]+$ac_word_re([\t (]|\$)/ {
6824  line = \$ 0
6825  split(line, arg, " ")
6826  if (arg[1] == "#") {
6827    defundef = arg[2]
6828    mac1 = arg[3]
6829  } else {
6830    defundef = substr(arg[1], 2)
6831    mac1 = arg[2]
6832  }
6833  split(mac1, mac2, "(") #)
6834  macro = mac2[1]
6835  prefix = substr(line, 1, index(line, defundef) - 1)
6836  if (D_is_set[macro]) {
6837    # Preserve the white space surrounding the "#".
6838    print prefix "define", macro P[macro] D[macro]
6839    next
6840  } else {
6841    # Replace #undef with comments.  This is necessary, for example,
6842    # in the case of _POSIX_SOURCE, which is predefined and required
6843    # on some systems where configure will not decide to define it.
6844    if (defundef == "undef") {
6845      print "/*", prefix defundef, macro, "*/"
6846      next
6847    }
6848  }
6849}
6850{ print }
6851_ACAWK
6852_ACEOF
6853cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
6854  as_fn_error $? "could not setup config headers machinery" "$LINENO" 5
6855fi # test -n "$CONFIG_HEADERS"
6856
6857
6858eval set X "  :F $CONFIG_FILES  :H $CONFIG_HEADERS    "
6859shift
6860for ac_tag
6861do
6862  case $ac_tag in
6863  :[FHLC]) ac_mode=$ac_tag; continue;;
6864  esac
6865  case $ac_mode$ac_tag in
6866  :[FHL]*:*);;
6867  :L* | :C*:*) as_fn_error $? "invalid tag \`$ac_tag'" "$LINENO" 5;;
6868  :[FH]-) ac_tag=-:-;;
6869  :[FH]*) ac_tag=$ac_tag:$ac_tag.in;;
6870  esac
6871  ac_save_IFS=$IFS
6872  IFS=:
6873  set x $ac_tag
6874  IFS=$ac_save_IFS
6875  shift
6876  ac_file=$1
6877  shift
6878
6879  case $ac_mode in
6880  :L) ac_source=$1;;
6881  :[FH])
6882    ac_file_inputs=
6883    for ac_f
6884    do
6885      case $ac_f in
6886      -) ac_f="$ac_tmp/stdin";;
6887      *) # Look for the file first in the build tree, then in the source tree
6888	 # (if the path is not absolute).  The absolute path cannot be DOS-style,
6889	 # because $ac_f cannot contain `:'.
6890	 test -f "$ac_f" ||
6891	   case $ac_f in
6892	   [\\/$]*) false;;
6893	   *) test -f "$srcdir/$ac_f" && ac_f="$srcdir/$ac_f";;
6894	   esac ||
6895	   as_fn_error 1 "cannot find input file: \`$ac_f'" "$LINENO" 5;;
6896      esac
6897      case $ac_f in *\'*) ac_f=`printf "%s\n" "$ac_f" | sed "s/'/'\\\\\\\\''/g"`;; esac
6898      as_fn_append ac_file_inputs " '$ac_f'"
6899    done
6900
6901    # Let's still pretend it is `configure' which instantiates (i.e., don't
6902    # use $as_me), people would be surprised to read:
6903    #    /* config.h.  Generated by config.status.  */
6904    configure_input='Generated from '`
6905	  printf "%s\n" "$*" | sed 's|^[^:]*/||;s|:[^:]*/|, |g'
6906	`' by configure.'
6907    if test x"$ac_file" != x-; then
6908      configure_input="$ac_file.  $configure_input"
6909      { printf "%s\n" "$as_me:${as_lineno-$LINENO}: creating $ac_file" >&5
6910printf "%s\n" "$as_me: creating $ac_file" >&6;}
6911    fi
6912    # Neutralize special characters interpreted by sed in replacement strings.
6913    case $configure_input in #(
6914    *\&* | *\|* | *\\* )
6915       ac_sed_conf_input=`printf "%s\n" "$configure_input" |
6916       sed 's/[\\\\&|]/\\\\&/g'`;; #(
6917    *) ac_sed_conf_input=$configure_input;;
6918    esac
6919
6920    case $ac_tag in
6921    *:-:* | *:-) cat >"$ac_tmp/stdin" \
6922      || as_fn_error $? "could not create $ac_file" "$LINENO" 5 ;;
6923    esac
6924    ;;
6925  esac
6926
6927  ac_dir=`$as_dirname -- "$ac_file" ||
6928$as_expr X"$ac_file" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
6929	 X"$ac_file" : 'X\(//\)[^/]' \| \
6930	 X"$ac_file" : 'X\(//\)$' \| \
6931	 X"$ac_file" : 'X\(/\)' \| . 2>/dev/null ||
6932printf "%s\n" X"$ac_file" |
6933    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
6934	    s//\1/
6935	    q
6936	  }
6937	  /^X\(\/\/\)[^/].*/{
6938	    s//\1/
6939	    q
6940	  }
6941	  /^X\(\/\/\)$/{
6942	    s//\1/
6943	    q
6944	  }
6945	  /^X\(\/\).*/{
6946	    s//\1/
6947	    q
6948	  }
6949	  s/.*/./; q'`
6950  as_dir="$ac_dir"; as_fn_mkdir_p
6951  ac_builddir=.
6952
6953case "$ac_dir" in
6954.) ac_dir_suffix= ac_top_builddir_sub=. ac_top_build_prefix= ;;
6955*)
6956  ac_dir_suffix=/`printf "%s\n" "$ac_dir" | sed 's|^\.[\\/]||'`
6957  # A ".." for each directory in $ac_dir_suffix.
6958  ac_top_builddir_sub=`printf "%s\n" "$ac_dir_suffix" | sed 's|/[^\\/]*|/..|g;s|/||'`
6959  case $ac_top_builddir_sub in
6960  "") ac_top_builddir_sub=. ac_top_build_prefix= ;;
6961  *)  ac_top_build_prefix=$ac_top_builddir_sub/ ;;
6962  esac ;;
6963esac
6964ac_abs_top_builddir=$ac_pwd
6965ac_abs_builddir=$ac_pwd$ac_dir_suffix
6966# for backward compatibility:
6967ac_top_builddir=$ac_top_build_prefix
6968
6969case $srcdir in
6970  .)  # We are building in place.
6971    ac_srcdir=.
6972    ac_top_srcdir=$ac_top_builddir_sub
6973    ac_abs_top_srcdir=$ac_pwd ;;
6974  [\\/]* | ?:[\\/]* )  # Absolute name.
6975    ac_srcdir=$srcdir$ac_dir_suffix;
6976    ac_top_srcdir=$srcdir
6977    ac_abs_top_srcdir=$srcdir ;;
6978  *) # Relative name.
6979    ac_srcdir=$ac_top_build_prefix$srcdir$ac_dir_suffix
6980    ac_top_srcdir=$ac_top_build_prefix$srcdir
6981    ac_abs_top_srcdir=$ac_pwd/$srcdir ;;
6982esac
6983ac_abs_srcdir=$ac_abs_top_srcdir$ac_dir_suffix
6984
6985
6986  case $ac_mode in
6987  :F)
6988  #
6989  # CONFIG_FILE
6990  #
6991
6992_ACEOF
6993
6994cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
6995# If the template does not know about datarootdir, expand it.
6996# FIXME: This hack should be removed a few years after 2.60.
6997ac_datarootdir_hack=; ac_datarootdir_seen=
6998ac_sed_dataroot='
6999/datarootdir/ {
7000  p
7001  q
7002}
7003/@datadir@/p
7004/@docdir@/p
7005/@infodir@/p
7006/@localedir@/p
7007/@mandir@/p'
7008case `eval "sed -n \"\$ac_sed_dataroot\" $ac_file_inputs"` in
7009*datarootdir*) ac_datarootdir_seen=yes;;
7010*@datadir@*|*@docdir@*|*@infodir@*|*@localedir@*|*@mandir@*)
7011  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: WARNING: $ac_file_inputs seems to ignore the --datarootdir setting" >&5
7012printf "%s\n" "$as_me: WARNING: $ac_file_inputs seems to ignore the --datarootdir setting" >&2;}
7013_ACEOF
7014cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
7015  ac_datarootdir_hack='
7016  s&@datadir@&$datadir&g
7017  s&@docdir@&$docdir&g
7018  s&@infodir@&$infodir&g
7019  s&@localedir@&$localedir&g
7020  s&@mandir@&$mandir&g
7021  s&\\\${datarootdir}&$datarootdir&g' ;;
7022esac
7023_ACEOF
7024
7025# Neutralize VPATH when `$srcdir' = `.'.
7026# Shell code in configure.ac might set extrasub.
7027# FIXME: do we really want to maintain this feature?
7028cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
7029ac_sed_extra="$ac_vpsub
7030$extrasub
7031_ACEOF
7032cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
7033:t
7034/@[a-zA-Z_][a-zA-Z_0-9]*@/!b
7035s|@configure_input@|$ac_sed_conf_input|;t t
7036s&@top_builddir@&$ac_top_builddir_sub&;t t
7037s&@top_build_prefix@&$ac_top_build_prefix&;t t
7038s&@srcdir@&$ac_srcdir&;t t
7039s&@abs_srcdir@&$ac_abs_srcdir&;t t
7040s&@top_srcdir@&$ac_top_srcdir&;t t
7041s&@abs_top_srcdir@&$ac_abs_top_srcdir&;t t
7042s&@builddir@&$ac_builddir&;t t
7043s&@abs_builddir@&$ac_abs_builddir&;t t
7044s&@abs_top_builddir@&$ac_abs_top_builddir&;t t
7045$ac_datarootdir_hack
7046"
7047eval sed \"\$ac_sed_extra\" "$ac_file_inputs" | $AWK -f "$ac_tmp/subs.awk" \
7048  >$ac_tmp/out || as_fn_error $? "could not create $ac_file" "$LINENO" 5
7049
7050test -z "$ac_datarootdir_hack$ac_datarootdir_seen" &&
7051  { ac_out=`sed -n '/\${datarootdir}/p' "$ac_tmp/out"`; test -n "$ac_out"; } &&
7052  { ac_out=`sed -n '/^[	 ]*datarootdir[	 ]*:*=/p' \
7053      "$ac_tmp/out"`; test -z "$ac_out"; } &&
7054  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: WARNING: $ac_file contains a reference to the variable \`datarootdir'
7055which seems to be undefined.  Please make sure it is defined" >&5
7056printf "%s\n" "$as_me: WARNING: $ac_file contains a reference to the variable \`datarootdir'
7057which seems to be undefined.  Please make sure it is defined" >&2;}
7058
7059  rm -f "$ac_tmp/stdin"
7060  case $ac_file in
7061  -) cat "$ac_tmp/out" && rm -f "$ac_tmp/out";;
7062  *) rm -f "$ac_file" && mv "$ac_tmp/out" "$ac_file";;
7063  esac \
7064  || as_fn_error $? "could not create $ac_file" "$LINENO" 5
7065 ;;
7066  :H)
7067  #
7068  # CONFIG_HEADER
7069  #
7070  if test x"$ac_file" != x-; then
7071    {
7072      printf "%s\n" "/* $configure_input  */" >&1 \
7073      && eval '$AWK -f "$ac_tmp/defines.awk"' "$ac_file_inputs"
7074    } >"$ac_tmp/config.h" \
7075      || as_fn_error $? "could not create $ac_file" "$LINENO" 5
7076    if diff "$ac_file" "$ac_tmp/config.h" >/dev/null 2>&1; then
7077      { printf "%s\n" "$as_me:${as_lineno-$LINENO}: $ac_file is unchanged" >&5
7078printf "%s\n" "$as_me: $ac_file is unchanged" >&6;}
7079    else
7080      rm -f "$ac_file"
7081      mv "$ac_tmp/config.h" "$ac_file" \
7082	|| as_fn_error $? "could not create $ac_file" "$LINENO" 5
7083    fi
7084  else
7085    printf "%s\n" "/* $configure_input  */" >&1 \
7086      && eval '$AWK -f "$ac_tmp/defines.awk"' "$ac_file_inputs" \
7087      || as_fn_error $? "could not create -" "$LINENO" 5
7088  fi
7089 ;;
7090
7091
7092  esac
7093
7094done # for ac_tag
7095
7096
7097as_fn_exit 0
7098_ACEOF
7099ac_clean_files=$ac_clean_files_save
7100
7101test $ac_write_fail = 0 ||
7102  as_fn_error $? "write failure creating $CONFIG_STATUS" "$LINENO" 5
7103
7104
7105# configure is writing to config.log, and then calls config.status.
7106# config.status does its own redirection, appending to config.log.
7107# Unfortunately, on DOS this fails, as config.log is still kept open
7108# by configure, so config.status won't be able to write to it; its
7109# output is simply discarded.  So we exec the FD to /dev/null,
7110# effectively closing config.log, so it can be properly (re)opened and
7111# appended to by config.status.  When coming back to configure, we
7112# need to make the FD available again.
7113if test "$no_create" != yes; then
7114  ac_cs_success=:
7115  ac_config_status_args=
7116  test "$silent" = yes &&
7117    ac_config_status_args="$ac_config_status_args --quiet"
7118  exec 5>/dev/null
7119  $SHELL $CONFIG_STATUS $ac_config_status_args || ac_cs_success=false
7120  exec 5>>config.log
7121  # Use ||, not &&, to avoid exiting from the if with $? = 1, which
7122  # would make configure fail if this is the last instruction.
7123  $ac_cs_success || as_fn_exit 1
7124fi
7125if test -n "$ac_unrecognized_opts" && test "$enable_option_checking" != no; then
7126  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: WARNING: unrecognized options: $ac_unrecognized_opts" >&5
7127printf "%s\n" "$as_me: WARNING: unrecognized options: $ac_unrecognized_opts" >&2;}
7128fi
7129
7130
7131