1#! /bin/sh
2# Guess values for system-dependent variables and create Makefiles.
3# Generated by GNU Autoconf 2.71 for Haskell time package 1.9.3.
4#
5# Report bugs to <ashley@semantic.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"
186  if (eval "$as_required") 2>/dev/null
187then :
188  as_have_required=yes
189else $as_nop
190  as_have_required=no
191fi
192  if test x$as_have_required = xyes && (eval "$as_suggested") 2>/dev/null
193then :
194
195else $as_nop
196  as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
197as_found=false
198for as_dir in /bin$PATH_SEPARATOR/usr/bin$PATH_SEPARATOR$PATH
199do
200  IFS=$as_save_IFS
201  case $as_dir in #(((
202    '') as_dir=./ ;;
203    */) ;;
204    *) as_dir=$as_dir/ ;;
205  esac
206  as_found=:
207  case $as_dir in #(
208	 /*)
209	   for as_base in sh bash ksh sh5; do
210	     # Try only shells that exist, to save several forks.
211	     as_shell=$as_dir$as_base
212	     if { test -f "$as_shell" || test -f "$as_shell.exe"; } &&
213		    as_run=a "$as_shell" -c "$as_bourne_compatible""$as_required" 2>/dev/null
214then :
215  CONFIG_SHELL=$as_shell as_have_required=yes
216		   if as_run=a "$as_shell" -c "$as_bourne_compatible""$as_suggested" 2>/dev/null
217then :
218  break 2
219fi
220fi
221	   done;;
222       esac
223  as_found=false
224done
225IFS=$as_save_IFS
226if $as_found
227then :
228
229else $as_nop
230  if { test -f "$SHELL" || test -f "$SHELL.exe"; } &&
231	      as_run=a "$SHELL" -c "$as_bourne_compatible""$as_required" 2>/dev/null
232then :
233  CONFIG_SHELL=$SHELL as_have_required=yes
234fi
235fi
236
237
238      if test "x$CONFIG_SHELL" != x
239then :
240  export CONFIG_SHELL
241             # We cannot yet assume a decent shell, so we have to provide a
242# neutralization value for shells without unset; and this also
243# works around shells that cannot unset nonexistent variables.
244# Preserve -v and -x to the replacement shell.
245BASH_ENV=/dev/null
246ENV=/dev/null
247(unset BASH_ENV) >/dev/null 2>&1 && unset BASH_ENV ENV
248case $- in # ((((
249  *v*x* | *x*v* ) as_opts=-vx ;;
250  *v* ) as_opts=-v ;;
251  *x* ) as_opts=-x ;;
252  * ) as_opts= ;;
253esac
254exec $CONFIG_SHELL $as_opts "$as_myself" ${1+"$@"}
255# Admittedly, this is quite paranoid, since all the known shells bail
256# out after a failed `exec'.
257printf "%s\n" "$0: could not re-execute with $CONFIG_SHELL" >&2
258exit 255
259fi
260
261    if test x$as_have_required = xno
262then :
263  printf "%s\n" "$0: This script requires a shell more modern than all"
264  printf "%s\n" "$0: the shells that I found on your system."
265  if test ${ZSH_VERSION+y} ; then
266    printf "%s\n" "$0: In particular, zsh $ZSH_VERSION has bugs and should"
267    printf "%s\n" "$0: be upgraded to zsh 4.3.4 or later."
268  else
269    printf "%s\n" "$0: Please tell bug-autoconf@gnu.org and
270$0: ashley@semantic.org about your system, including any
271$0: error possibly output before this message. Then install
272$0: a modern shell, or manually run the script under such a
273$0: shell if you do have one."
274  fi
275  exit 1
276fi
277fi
278fi
279SHELL=${CONFIG_SHELL-/bin/sh}
280export SHELL
281# Unset more variables known to interfere with behavior of common tools.
282CLICOLOR_FORCE= GREP_OPTIONS=
283unset CLICOLOR_FORCE GREP_OPTIONS
284
285## --------------------- ##
286## M4sh Shell Functions. ##
287## --------------------- ##
288# as_fn_unset VAR
289# ---------------
290# Portably unset VAR.
291as_fn_unset ()
292{
293  { eval $1=; unset $1;}
294}
295as_unset=as_fn_unset
296
297
298# as_fn_set_status STATUS
299# -----------------------
300# Set $? to STATUS, without forking.
301as_fn_set_status ()
302{
303  return $1
304} # as_fn_set_status
305
306# as_fn_exit STATUS
307# -----------------
308# Exit the shell with STATUS, even in a "trap 0" or "set -e" context.
309as_fn_exit ()
310{
311  set +e
312  as_fn_set_status $1
313  exit $1
314} # as_fn_exit
315# as_fn_nop
316# ---------
317# Do nothing but, unlike ":", preserve the value of $?.
318as_fn_nop ()
319{
320  return $?
321}
322as_nop=as_fn_nop
323
324# as_fn_mkdir_p
325# -------------
326# Create "$as_dir" as a directory, including parents if necessary.
327as_fn_mkdir_p ()
328{
329
330  case $as_dir in #(
331  -*) as_dir=./$as_dir;;
332  esac
333  test -d "$as_dir" || eval $as_mkdir_p || {
334    as_dirs=
335    while :; do
336      case $as_dir in #(
337      *\'*) as_qdir=`printf "%s\n" "$as_dir" | sed "s/'/'\\\\\\\\''/g"`;; #'(
338      *) as_qdir=$as_dir;;
339      esac
340      as_dirs="'$as_qdir' $as_dirs"
341      as_dir=`$as_dirname -- "$as_dir" ||
342$as_expr X"$as_dir" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
343	 X"$as_dir" : 'X\(//\)[^/]' \| \
344	 X"$as_dir" : 'X\(//\)$' \| \
345	 X"$as_dir" : 'X\(/\)' \| . 2>/dev/null ||
346printf "%s\n" X"$as_dir" |
347    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
348	    s//\1/
349	    q
350	  }
351	  /^X\(\/\/\)[^/].*/{
352	    s//\1/
353	    q
354	  }
355	  /^X\(\/\/\)$/{
356	    s//\1/
357	    q
358	  }
359	  /^X\(\/\).*/{
360	    s//\1/
361	    q
362	  }
363	  s/.*/./; q'`
364      test -d "$as_dir" && break
365    done
366    test -z "$as_dirs" || eval "mkdir $as_dirs"
367  } || test -d "$as_dir" || as_fn_error $? "cannot create directory $as_dir"
368
369
370} # as_fn_mkdir_p
371
372# as_fn_executable_p FILE
373# -----------------------
374# Test if FILE is an executable regular file.
375as_fn_executable_p ()
376{
377  test -f "$1" && test -x "$1"
378} # as_fn_executable_p
379# as_fn_append VAR VALUE
380# ----------------------
381# Append the text in VALUE to the end of the definition contained in VAR. Take
382# advantage of any shell optimizations that allow amortized linear growth over
383# repeated appends, instead of the typical quadratic growth present in naive
384# implementations.
385if (eval "as_var=1; as_var+=2; test x\$as_var = x12") 2>/dev/null
386then :
387  eval 'as_fn_append ()
388  {
389    eval $1+=\$2
390  }'
391else $as_nop
392  as_fn_append ()
393  {
394    eval $1=\$$1\$2
395  }
396fi # as_fn_append
397
398# as_fn_arith ARG...
399# ------------------
400# Perform arithmetic evaluation on the ARGs, and store the result in the
401# global $as_val. Take advantage of shells that can avoid forks. The arguments
402# must be portable across $(()) and expr.
403if (eval "test \$(( 1 + 1 )) = 2") 2>/dev/null
404then :
405  eval 'as_fn_arith ()
406  {
407    as_val=$(( $* ))
408  }'
409else $as_nop
410  as_fn_arith ()
411  {
412    as_val=`expr "$@" || test $? -eq 1`
413  }
414fi # as_fn_arith
415
416# as_fn_nop
417# ---------
418# Do nothing but, unlike ":", preserve the value of $?.
419as_fn_nop ()
420{
421  return $?
422}
423as_nop=as_fn_nop
424
425# as_fn_error STATUS ERROR [LINENO LOG_FD]
426# ----------------------------------------
427# Output "`basename $0`: error: ERROR" to stderr. If LINENO and LOG_FD are
428# provided, also output the error to LOG_FD, referencing LINENO. Then exit the
429# script with STATUS, using 1 if that was 0.
430as_fn_error ()
431{
432  as_status=$1; test $as_status -eq 0 && as_status=1
433  if test "$4"; then
434    as_lineno=${as_lineno-"$3"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
435    printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: $2" >&$4
436  fi
437  printf "%s\n" "$as_me: error: $2" >&2
438  as_fn_exit $as_status
439} # as_fn_error
440
441if expr a : '\(a\)' >/dev/null 2>&1 &&
442   test "X`expr 00001 : '.*\(...\)'`" = X001; then
443  as_expr=expr
444else
445  as_expr=false
446fi
447
448if (basename -- /) >/dev/null 2>&1 && test "X`basename -- / 2>&1`" = "X/"; then
449  as_basename=basename
450else
451  as_basename=false
452fi
453
454if (as_dir=`dirname -- /` && test "X$as_dir" = X/) >/dev/null 2>&1; then
455  as_dirname=dirname
456else
457  as_dirname=false
458fi
459
460as_me=`$as_basename -- "$0" ||
461$as_expr X/"$0" : '.*/\([^/][^/]*\)/*$' \| \
462	 X"$0" : 'X\(//\)$' \| \
463	 X"$0" : 'X\(/\)' \| . 2>/dev/null ||
464printf "%s\n" X/"$0" |
465    sed '/^.*\/\([^/][^/]*\)\/*$/{
466	    s//\1/
467	    q
468	  }
469	  /^X\/\(\/\/\)$/{
470	    s//\1/
471	    q
472	  }
473	  /^X\/\(\/\).*/{
474	    s//\1/
475	    q
476	  }
477	  s/.*/./; q'`
478
479# Avoid depending upon Character Ranges.
480as_cr_letters='abcdefghijklmnopqrstuvwxyz'
481as_cr_LETTERS='ABCDEFGHIJKLMNOPQRSTUVWXYZ'
482as_cr_Letters=$as_cr_letters$as_cr_LETTERS
483as_cr_digits='0123456789'
484as_cr_alnum=$as_cr_Letters$as_cr_digits
485
486
487  as_lineno_1=$LINENO as_lineno_1a=$LINENO
488  as_lineno_2=$LINENO as_lineno_2a=$LINENO
489  eval 'test "x$as_lineno_1'$as_run'" != "x$as_lineno_2'$as_run'" &&
490  test "x`expr $as_lineno_1'$as_run' + 1`" = "x$as_lineno_2'$as_run'"' || {
491  # Blame Lee E. McMahon (1931-1989) for sed's syntax.  :-)
492  sed -n '
493    p
494    /[$]LINENO/=
495  ' <$as_myself |
496    sed '
497      s/[$]LINENO.*/&-/
498      t lineno
499      b
500      :lineno
501      N
502      :loop
503      s/[$]LINENO\([^'$as_cr_alnum'_].*\n\)\(.*\)/\2\1\2/
504      t loop
505      s/-\n.*//
506    ' >$as_me.lineno &&
507  chmod +x "$as_me.lineno" ||
508    { printf "%s\n" "$as_me: error: cannot create $as_me.lineno; rerun with a POSIX shell" >&2; as_fn_exit 1; }
509
510  # If we had to re-execute with $CONFIG_SHELL, we're ensured to have
511  # already done that, so ensure we don't try to do so again and fall
512  # in an infinite loop.  This has already happened in practice.
513  _as_can_reexec=no; export _as_can_reexec
514  # Don't try to exec as it changes $[0], causing all sort of problems
515  # (the dirname of $[0] is not the place where we might find the
516  # original and so on.  Autoconf is especially sensitive to this).
517  . "./$as_me.lineno"
518  # Exit status is that of the last command.
519  exit
520}
521
522
523# Determine whether it's possible to make 'echo' print without a newline.
524# These variables are no longer used directly by Autoconf, but are AC_SUBSTed
525# for compatibility with existing Makefiles.
526ECHO_C= ECHO_N= ECHO_T=
527case `echo -n x` in #(((((
528-n*)
529  case `echo 'xy\c'` in
530  *c*) ECHO_T='	';;	# ECHO_T is single tab character.
531  xy)  ECHO_C='\c';;
532  *)   echo `echo ksh88 bug on AIX 6.1` > /dev/null
533       ECHO_T='	';;
534  esac;;
535*)
536  ECHO_N='-n';;
537esac
538
539# For backward compatibility with old third-party macros, we provide
540# the shell variables $as_echo and $as_echo_n.  New code should use
541# AS_ECHO(["message"]) and AS_ECHO_N(["message"]), respectively.
542as_echo='printf %s\n'
543as_echo_n='printf %s'
544
545
546rm -f conf$$ conf$$.exe conf$$.file
547if test -d conf$$.dir; then
548  rm -f conf$$.dir/conf$$.file
549else
550  rm -f conf$$.dir
551  mkdir conf$$.dir 2>/dev/null
552fi
553if (echo >conf$$.file) 2>/dev/null; then
554  if ln -s conf$$.file conf$$ 2>/dev/null; then
555    as_ln_s='ln -s'
556    # ... but there are two gotchas:
557    # 1) On MSYS, both `ln -s file dir' and `ln file dir' fail.
558    # 2) DJGPP < 2.04 has no symlinks; `ln -s' creates a wrapper executable.
559    # In both cases, we have to default to `cp -pR'.
560    ln -s conf$$.file conf$$.dir 2>/dev/null && test ! -f conf$$.exe ||
561      as_ln_s='cp -pR'
562  elif ln conf$$.file conf$$ 2>/dev/null; then
563    as_ln_s=ln
564  else
565    as_ln_s='cp -pR'
566  fi
567else
568  as_ln_s='cp -pR'
569fi
570rm -f conf$$ conf$$.exe conf$$.dir/conf$$.file conf$$.file
571rmdir conf$$.dir 2>/dev/null
572
573if mkdir -p . 2>/dev/null; then
574  as_mkdir_p='mkdir -p "$as_dir"'
575else
576  test -d ./-p && rmdir ./-p
577  as_mkdir_p=false
578fi
579
580as_test_x='test -x'
581as_executable_p=as_fn_executable_p
582
583# Sed expression to map a string onto a valid CPP name.
584as_tr_cpp="eval sed 'y%*$as_cr_letters%P$as_cr_LETTERS%;s%[^_$as_cr_alnum]%_%g'"
585
586# Sed expression to map a string onto a valid variable name.
587as_tr_sh="eval sed 'y%*+%pp%;s%[^_$as_cr_alnum]%_%g'"
588
589
590test -n "$DJDIR" || exec 7<&0 </dev/null
591exec 6>&1
592
593# Name of the host.
594# hostname on some systems (SVR3.2, old GNU/Linux) returns a bogus exit status,
595# so uname gets run too.
596ac_hostname=`(hostname || uname -n) 2>/dev/null | sed 1q`
597
598#
599# Initializations.
600#
601ac_default_prefix=/usr/local
602ac_clean_files=
603ac_config_libobj_dir=.
604LIBOBJS=
605cross_compiling=no
606subdirs=
607MFLAGS=
608MAKEFLAGS=
609
610# Identity of this package.
611PACKAGE_NAME='Haskell time package'
612PACKAGE_TARNAME='time'
613PACKAGE_VERSION='1.9.3'
614PACKAGE_STRING='Haskell time package 1.9.3'
615PACKAGE_BUGREPORT='ashley@semantic.org'
616PACKAGE_URL=''
617
618ac_unique_file="lib/include/HsTime.h"
619# Factoring default headers for most tests.
620ac_includes_default="\
621#include <stddef.h>
622#ifdef HAVE_STDIO_H
623# include <stdio.h>
624#endif
625#ifdef HAVE_STDLIB_H
626# include <stdlib.h>
627#endif
628#ifdef HAVE_STRING_H
629# include <string.h>
630#endif
631#ifdef HAVE_INTTYPES_H
632# include <inttypes.h>
633#endif
634#ifdef HAVE_STDINT_H
635# include <stdint.h>
636#endif
637#ifdef HAVE_STRINGS_H
638# include <strings.h>
639#endif
640#ifdef HAVE_SYS_TYPES_H
641# include <sys/types.h>
642#endif
643#ifdef HAVE_SYS_STAT_H
644# include <sys/stat.h>
645#endif
646#ifdef HAVE_UNISTD_H
647# include <unistd.h>
648#endif"
649
650ac_header_c_list=
651ac_subst_vars='LTLIBOBJS
652LIBOBJS
653OBJEXT
654EXEEXT
655ac_ct_CC
656CPPFLAGS
657LDFLAGS
658CFLAGS
659CC
660target_alias
661host_alias
662build_alias
663LIBS
664ECHO_T
665ECHO_N
666ECHO_C
667DEFS
668mandir
669localedir
670libdir
671psdir
672pdfdir
673dvidir
674htmldir
675infodir
676docdir
677oldincludedir
678includedir
679runstatedir
680localstatedir
681sharedstatedir
682sysconfdir
683datadir
684datarootdir
685libexecdir
686sbindir
687bindir
688program_transform_name
689prefix
690exec_prefix
691PACKAGE_URL
692PACKAGE_BUGREPORT
693PACKAGE_STRING
694PACKAGE_VERSION
695PACKAGE_TARNAME
696PACKAGE_NAME
697PATH_SEPARATOR
698SHELL'
699ac_subst_files=''
700ac_user_opts='
701enable_option_checking
702with_gcc
703with_compiler
704'
705      ac_precious_vars='build_alias
706host_alias
707target_alias
708CC
709CFLAGS
710LDFLAGS
711LIBS
712CPPFLAGS'
713
714
715# Initialize some variables set by options.
716ac_init_help=
717ac_init_version=false
718ac_unrecognized_opts=
719ac_unrecognized_sep=
720# The variables have the same names as the options, with
721# dashes changed to underlines.
722cache_file=/dev/null
723exec_prefix=NONE
724no_create=
725no_recursion=
726prefix=NONE
727program_prefix=NONE
728program_suffix=NONE
729program_transform_name=s,x,x,
730silent=
731site=
732srcdir=
733verbose=
734x_includes=NONE
735x_libraries=NONE
736
737# Installation directory options.
738# These are left unexpanded so users can "make install exec_prefix=/foo"
739# and all the variables that are supposed to be based on exec_prefix
740# by default will actually change.
741# Use braces instead of parens because sh, perl, etc. also accept them.
742# (The list follows the same order as the GNU Coding Standards.)
743bindir='${exec_prefix}/bin'
744sbindir='${exec_prefix}/sbin'
745libexecdir='${exec_prefix}/libexec'
746datarootdir='${prefix}/share'
747datadir='${datarootdir}'
748sysconfdir='${prefix}/etc'
749sharedstatedir='${prefix}/com'
750localstatedir='${prefix}/var'
751runstatedir='${localstatedir}/run'
752includedir='${prefix}/include'
753oldincludedir='/usr/include'
754docdir='${datarootdir}/doc/${PACKAGE_TARNAME}'
755infodir='${datarootdir}/info'
756htmldir='${docdir}'
757dvidir='${docdir}'
758pdfdir='${docdir}'
759psdir='${docdir}'
760libdir='${exec_prefix}/lib'
761localedir='${datarootdir}/locale'
762mandir='${datarootdir}/man'
763
764ac_prev=
765ac_dashdash=
766for ac_option
767do
768  # If the previous option needs an argument, assign it.
769  if test -n "$ac_prev"; then
770    eval $ac_prev=\$ac_option
771    ac_prev=
772    continue
773  fi
774
775  case $ac_option in
776  *=?*) ac_optarg=`expr "X$ac_option" : '[^=]*=\(.*\)'` ;;
777  *=)   ac_optarg= ;;
778  *)    ac_optarg=yes ;;
779  esac
780
781  case $ac_dashdash$ac_option in
782  --)
783    ac_dashdash=yes ;;
784
785  -bindir | --bindir | --bindi | --bind | --bin | --bi)
786    ac_prev=bindir ;;
787  -bindir=* | --bindir=* | --bindi=* | --bind=* | --bin=* | --bi=*)
788    bindir=$ac_optarg ;;
789
790  -build | --build | --buil | --bui | --bu)
791    ac_prev=build_alias ;;
792  -build=* | --build=* | --buil=* | --bui=* | --bu=*)
793    build_alias=$ac_optarg ;;
794
795  -cache-file | --cache-file | --cache-fil | --cache-fi \
796  | --cache-f | --cache- | --cache | --cach | --cac | --ca | --c)
797    ac_prev=cache_file ;;
798  -cache-file=* | --cache-file=* | --cache-fil=* | --cache-fi=* \
799  | --cache-f=* | --cache-=* | --cache=* | --cach=* | --cac=* | --ca=* | --c=*)
800    cache_file=$ac_optarg ;;
801
802  --config-cache | -C)
803    cache_file=config.cache ;;
804
805  -datadir | --datadir | --datadi | --datad)
806    ac_prev=datadir ;;
807  -datadir=* | --datadir=* | --datadi=* | --datad=*)
808    datadir=$ac_optarg ;;
809
810  -datarootdir | --datarootdir | --datarootdi | --datarootd | --dataroot \
811  | --dataroo | --dataro | --datar)
812    ac_prev=datarootdir ;;
813  -datarootdir=* | --datarootdir=* | --datarootdi=* | --datarootd=* \
814  | --dataroot=* | --dataroo=* | --dataro=* | --datar=*)
815    datarootdir=$ac_optarg ;;
816
817  -disable-* | --disable-*)
818    ac_useropt=`expr "x$ac_option" : 'x-*disable-\(.*\)'`
819    # Reject names that are not valid shell variable names.
820    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
821      as_fn_error $? "invalid feature name: \`$ac_useropt'"
822    ac_useropt_orig=$ac_useropt
823    ac_useropt=`printf "%s\n" "$ac_useropt" | sed 's/[-+.]/_/g'`
824    case $ac_user_opts in
825      *"
826"enable_$ac_useropt"
827"*) ;;
828      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--disable-$ac_useropt_orig"
829	 ac_unrecognized_sep=', ';;
830    esac
831    eval enable_$ac_useropt=no ;;
832
833  -docdir | --docdir | --docdi | --doc | --do)
834    ac_prev=docdir ;;
835  -docdir=* | --docdir=* | --docdi=* | --doc=* | --do=*)
836    docdir=$ac_optarg ;;
837
838  -dvidir | --dvidir | --dvidi | --dvid | --dvi | --dv)
839    ac_prev=dvidir ;;
840  -dvidir=* | --dvidir=* | --dvidi=* | --dvid=* | --dvi=* | --dv=*)
841    dvidir=$ac_optarg ;;
842
843  -enable-* | --enable-*)
844    ac_useropt=`expr "x$ac_option" : 'x-*enable-\([^=]*\)'`
845    # Reject names that are not valid shell variable names.
846    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
847      as_fn_error $? "invalid feature name: \`$ac_useropt'"
848    ac_useropt_orig=$ac_useropt
849    ac_useropt=`printf "%s\n" "$ac_useropt" | sed 's/[-+.]/_/g'`
850    case $ac_user_opts in
851      *"
852"enable_$ac_useropt"
853"*) ;;
854      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--enable-$ac_useropt_orig"
855	 ac_unrecognized_sep=', ';;
856    esac
857    eval enable_$ac_useropt=\$ac_optarg ;;
858
859  -exec-prefix | --exec_prefix | --exec-prefix | --exec-prefi \
860  | --exec-pref | --exec-pre | --exec-pr | --exec-p | --exec- \
861  | --exec | --exe | --ex)
862    ac_prev=exec_prefix ;;
863  -exec-prefix=* | --exec_prefix=* | --exec-prefix=* | --exec-prefi=* \
864  | --exec-pref=* | --exec-pre=* | --exec-pr=* | --exec-p=* | --exec-=* \
865  | --exec=* | --exe=* | --ex=*)
866    exec_prefix=$ac_optarg ;;
867
868  -gas | --gas | --ga | --g)
869    # Obsolete; use --with-gas.
870    with_gas=yes ;;
871
872  -help | --help | --hel | --he | -h)
873    ac_init_help=long ;;
874  -help=r* | --help=r* | --hel=r* | --he=r* | -hr*)
875    ac_init_help=recursive ;;
876  -help=s* | --help=s* | --hel=s* | --he=s* | -hs*)
877    ac_init_help=short ;;
878
879  -host | --host | --hos | --ho)
880    ac_prev=host_alias ;;
881  -host=* | --host=* | --hos=* | --ho=*)
882    host_alias=$ac_optarg ;;
883
884  -htmldir | --htmldir | --htmldi | --htmld | --html | --htm | --ht)
885    ac_prev=htmldir ;;
886  -htmldir=* | --htmldir=* | --htmldi=* | --htmld=* | --html=* | --htm=* \
887  | --ht=*)
888    htmldir=$ac_optarg ;;
889
890  -includedir | --includedir | --includedi | --included | --include \
891  | --includ | --inclu | --incl | --inc)
892    ac_prev=includedir ;;
893  -includedir=* | --includedir=* | --includedi=* | --included=* | --include=* \
894  | --includ=* | --inclu=* | --incl=* | --inc=*)
895    includedir=$ac_optarg ;;
896
897  -infodir | --infodir | --infodi | --infod | --info | --inf)
898    ac_prev=infodir ;;
899  -infodir=* | --infodir=* | --infodi=* | --infod=* | --info=* | --inf=*)
900    infodir=$ac_optarg ;;
901
902  -libdir | --libdir | --libdi | --libd)
903    ac_prev=libdir ;;
904  -libdir=* | --libdir=* | --libdi=* | --libd=*)
905    libdir=$ac_optarg ;;
906
907  -libexecdir | --libexecdir | --libexecdi | --libexecd | --libexec \
908  | --libexe | --libex | --libe)
909    ac_prev=libexecdir ;;
910  -libexecdir=* | --libexecdir=* | --libexecdi=* | --libexecd=* | --libexec=* \
911  | --libexe=* | --libex=* | --libe=*)
912    libexecdir=$ac_optarg ;;
913
914  -localedir | --localedir | --localedi | --localed | --locale)
915    ac_prev=localedir ;;
916  -localedir=* | --localedir=* | --localedi=* | --localed=* | --locale=*)
917    localedir=$ac_optarg ;;
918
919  -localstatedir | --localstatedir | --localstatedi | --localstated \
920  | --localstate | --localstat | --localsta | --localst | --locals)
921    ac_prev=localstatedir ;;
922  -localstatedir=* | --localstatedir=* | --localstatedi=* | --localstated=* \
923  | --localstate=* | --localstat=* | --localsta=* | --localst=* | --locals=*)
924    localstatedir=$ac_optarg ;;
925
926  -mandir | --mandir | --mandi | --mand | --man | --ma | --m)
927    ac_prev=mandir ;;
928  -mandir=* | --mandir=* | --mandi=* | --mand=* | --man=* | --ma=* | --m=*)
929    mandir=$ac_optarg ;;
930
931  -nfp | --nfp | --nf)
932    # Obsolete; use --without-fp.
933    with_fp=no ;;
934
935  -no-create | --no-create | --no-creat | --no-crea | --no-cre \
936  | --no-cr | --no-c | -n)
937    no_create=yes ;;
938
939  -no-recursion | --no-recursion | --no-recursio | --no-recursi \
940  | --no-recurs | --no-recur | --no-recu | --no-rec | --no-re | --no-r)
941    no_recursion=yes ;;
942
943  -oldincludedir | --oldincludedir | --oldincludedi | --oldincluded \
944  | --oldinclude | --oldinclud | --oldinclu | --oldincl | --oldinc \
945  | --oldin | --oldi | --old | --ol | --o)
946    ac_prev=oldincludedir ;;
947  -oldincludedir=* | --oldincludedir=* | --oldincludedi=* | --oldincluded=* \
948  | --oldinclude=* | --oldinclud=* | --oldinclu=* | --oldincl=* | --oldinc=* \
949  | --oldin=* | --oldi=* | --old=* | --ol=* | --o=*)
950    oldincludedir=$ac_optarg ;;
951
952  -prefix | --prefix | --prefi | --pref | --pre | --pr | --p)
953    ac_prev=prefix ;;
954  -prefix=* | --prefix=* | --prefi=* | --pref=* | --pre=* | --pr=* | --p=*)
955    prefix=$ac_optarg ;;
956
957  -program-prefix | --program-prefix | --program-prefi | --program-pref \
958  | --program-pre | --program-pr | --program-p)
959    ac_prev=program_prefix ;;
960  -program-prefix=* | --program-prefix=* | --program-prefi=* \
961  | --program-pref=* | --program-pre=* | --program-pr=* | --program-p=*)
962    program_prefix=$ac_optarg ;;
963
964  -program-suffix | --program-suffix | --program-suffi | --program-suff \
965  | --program-suf | --program-su | --program-s)
966    ac_prev=program_suffix ;;
967  -program-suffix=* | --program-suffix=* | --program-suffi=* \
968  | --program-suff=* | --program-suf=* | --program-su=* | --program-s=*)
969    program_suffix=$ac_optarg ;;
970
971  -program-transform-name | --program-transform-name \
972  | --program-transform-nam | --program-transform-na \
973  | --program-transform-n | --program-transform- \
974  | --program-transform | --program-transfor \
975  | --program-transfo | --program-transf \
976  | --program-trans | --program-tran \
977  | --progr-tra | --program-tr | --program-t)
978    ac_prev=program_transform_name ;;
979  -program-transform-name=* | --program-transform-name=* \
980  | --program-transform-nam=* | --program-transform-na=* \
981  | --program-transform-n=* | --program-transform-=* \
982  | --program-transform=* | --program-transfor=* \
983  | --program-transfo=* | --program-transf=* \
984  | --program-trans=* | --program-tran=* \
985  | --progr-tra=* | --program-tr=* | --program-t=*)
986    program_transform_name=$ac_optarg ;;
987
988  -pdfdir | --pdfdir | --pdfdi | --pdfd | --pdf | --pd)
989    ac_prev=pdfdir ;;
990  -pdfdir=* | --pdfdir=* | --pdfdi=* | --pdfd=* | --pdf=* | --pd=*)
991    pdfdir=$ac_optarg ;;
992
993  -psdir | --psdir | --psdi | --psd | --ps)
994    ac_prev=psdir ;;
995  -psdir=* | --psdir=* | --psdi=* | --psd=* | --ps=*)
996    psdir=$ac_optarg ;;
997
998  -q | -quiet | --quiet | --quie | --qui | --qu | --q \
999  | -silent | --silent | --silen | --sile | --sil)
1000    silent=yes ;;
1001
1002  -runstatedir | --runstatedir | --runstatedi | --runstated \
1003  | --runstate | --runstat | --runsta | --runst | --runs \
1004  | --run | --ru | --r)
1005    ac_prev=runstatedir ;;
1006  -runstatedir=* | --runstatedir=* | --runstatedi=* | --runstated=* \
1007  | --runstate=* | --runstat=* | --runsta=* | --runst=* | --runs=* \
1008  | --run=* | --ru=* | --r=*)
1009    runstatedir=$ac_optarg ;;
1010
1011  -sbindir | --sbindir | --sbindi | --sbind | --sbin | --sbi | --sb)
1012    ac_prev=sbindir ;;
1013  -sbindir=* | --sbindir=* | --sbindi=* | --sbind=* | --sbin=* \
1014  | --sbi=* | --sb=*)
1015    sbindir=$ac_optarg ;;
1016
1017  -sharedstatedir | --sharedstatedir | --sharedstatedi \
1018  | --sharedstated | --sharedstate | --sharedstat | --sharedsta \
1019  | --sharedst | --shareds | --shared | --share | --shar \
1020  | --sha | --sh)
1021    ac_prev=sharedstatedir ;;
1022  -sharedstatedir=* | --sharedstatedir=* | --sharedstatedi=* \
1023  | --sharedstated=* | --sharedstate=* | --sharedstat=* | --sharedsta=* \
1024  | --sharedst=* | --shareds=* | --shared=* | --share=* | --shar=* \
1025  | --sha=* | --sh=*)
1026    sharedstatedir=$ac_optarg ;;
1027
1028  -site | --site | --sit)
1029    ac_prev=site ;;
1030  -site=* | --site=* | --sit=*)
1031    site=$ac_optarg ;;
1032
1033  -srcdir | --srcdir | --srcdi | --srcd | --src | --sr)
1034    ac_prev=srcdir ;;
1035  -srcdir=* | --srcdir=* | --srcdi=* | --srcd=* | --src=* | --sr=*)
1036    srcdir=$ac_optarg ;;
1037
1038  -sysconfdir | --sysconfdir | --sysconfdi | --sysconfd | --sysconf \
1039  | --syscon | --sysco | --sysc | --sys | --sy)
1040    ac_prev=sysconfdir ;;
1041  -sysconfdir=* | --sysconfdir=* | --sysconfdi=* | --sysconfd=* | --sysconf=* \
1042  | --syscon=* | --sysco=* | --sysc=* | --sys=* | --sy=*)
1043    sysconfdir=$ac_optarg ;;
1044
1045  -target | --target | --targe | --targ | --tar | --ta | --t)
1046    ac_prev=target_alias ;;
1047  -target=* | --target=* | --targe=* | --targ=* | --tar=* | --ta=* | --t=*)
1048    target_alias=$ac_optarg ;;
1049
1050  -v | -verbose | --verbose | --verbos | --verbo | --verb)
1051    verbose=yes ;;
1052
1053  -version | --version | --versio | --versi | --vers | -V)
1054    ac_init_version=: ;;
1055
1056  -with-* | --with-*)
1057    ac_useropt=`expr "x$ac_option" : 'x-*with-\([^=]*\)'`
1058    # Reject names that are not valid shell variable names.
1059    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
1060      as_fn_error $? "invalid package name: \`$ac_useropt'"
1061    ac_useropt_orig=$ac_useropt
1062    ac_useropt=`printf "%s\n" "$ac_useropt" | sed 's/[-+.]/_/g'`
1063    case $ac_user_opts in
1064      *"
1065"with_$ac_useropt"
1066"*) ;;
1067      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--with-$ac_useropt_orig"
1068	 ac_unrecognized_sep=', ';;
1069    esac
1070    eval with_$ac_useropt=\$ac_optarg ;;
1071
1072  -without-* | --without-*)
1073    ac_useropt=`expr "x$ac_option" : 'x-*without-\(.*\)'`
1074    # Reject names that are not valid shell variable names.
1075    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
1076      as_fn_error $? "invalid package name: \`$ac_useropt'"
1077    ac_useropt_orig=$ac_useropt
1078    ac_useropt=`printf "%s\n" "$ac_useropt" | sed 's/[-+.]/_/g'`
1079    case $ac_user_opts in
1080      *"
1081"with_$ac_useropt"
1082"*) ;;
1083      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--without-$ac_useropt_orig"
1084	 ac_unrecognized_sep=', ';;
1085    esac
1086    eval with_$ac_useropt=no ;;
1087
1088  --x)
1089    # Obsolete; use --with-x.
1090    with_x=yes ;;
1091
1092  -x-includes | --x-includes | --x-include | --x-includ | --x-inclu \
1093  | --x-incl | --x-inc | --x-in | --x-i)
1094    ac_prev=x_includes ;;
1095  -x-includes=* | --x-includes=* | --x-include=* | --x-includ=* | --x-inclu=* \
1096  | --x-incl=* | --x-inc=* | --x-in=* | --x-i=*)
1097    x_includes=$ac_optarg ;;
1098
1099  -x-libraries | --x-libraries | --x-librarie | --x-librari \
1100  | --x-librar | --x-libra | --x-libr | --x-lib | --x-li | --x-l)
1101    ac_prev=x_libraries ;;
1102  -x-libraries=* | --x-libraries=* | --x-librarie=* | --x-librari=* \
1103  | --x-librar=* | --x-libra=* | --x-libr=* | --x-lib=* | --x-li=* | --x-l=*)
1104    x_libraries=$ac_optarg ;;
1105
1106  -*) as_fn_error $? "unrecognized option: \`$ac_option'
1107Try \`$0 --help' for more information"
1108    ;;
1109
1110  *=*)
1111    ac_envvar=`expr "x$ac_option" : 'x\([^=]*\)='`
1112    # Reject names that are not valid shell variable names.
1113    case $ac_envvar in #(
1114      '' | [0-9]* | *[!_$as_cr_alnum]* )
1115      as_fn_error $? "invalid variable name: \`$ac_envvar'" ;;
1116    esac
1117    eval $ac_envvar=\$ac_optarg
1118    export $ac_envvar ;;
1119
1120  *)
1121    # FIXME: should be removed in autoconf 3.0.
1122    printf "%s\n" "$as_me: WARNING: you should use --build, --host, --target" >&2
1123    expr "x$ac_option" : ".*[^-._$as_cr_alnum]" >/dev/null &&
1124      printf "%s\n" "$as_me: WARNING: invalid host type: $ac_option" >&2
1125    : "${build_alias=$ac_option} ${host_alias=$ac_option} ${target_alias=$ac_option}"
1126    ;;
1127
1128  esac
1129done
1130
1131if test -n "$ac_prev"; then
1132  ac_option=--`echo $ac_prev | sed 's/_/-/g'`
1133  as_fn_error $? "missing argument to $ac_option"
1134fi
1135
1136if test -n "$ac_unrecognized_opts"; then
1137  case $enable_option_checking in
1138    no) ;;
1139    fatal) as_fn_error $? "unrecognized options: $ac_unrecognized_opts" ;;
1140    *)     printf "%s\n" "$as_me: WARNING: unrecognized options: $ac_unrecognized_opts" >&2 ;;
1141  esac
1142fi
1143
1144# Check all directory arguments for consistency.
1145for ac_var in	exec_prefix prefix bindir sbindir libexecdir datarootdir \
1146		datadir sysconfdir sharedstatedir localstatedir includedir \
1147		oldincludedir docdir infodir htmldir dvidir pdfdir psdir \
1148		libdir localedir mandir runstatedir
1149do
1150  eval ac_val=\$$ac_var
1151  # Remove trailing slashes.
1152  case $ac_val in
1153    */ )
1154      ac_val=`expr "X$ac_val" : 'X\(.*[^/]\)' \| "X$ac_val" : 'X\(.*\)'`
1155      eval $ac_var=\$ac_val;;
1156  esac
1157  # Be sure to have absolute directory names.
1158  case $ac_val in
1159    [\\/$]* | ?:[\\/]* )  continue;;
1160    NONE | '' ) case $ac_var in *prefix ) continue;; esac;;
1161  esac
1162  as_fn_error $? "expected an absolute directory name for --$ac_var: $ac_val"
1163done
1164
1165# There might be people who depend on the old broken behavior: `$host'
1166# used to hold the argument of --host etc.
1167# FIXME: To remove some day.
1168build=$build_alias
1169host=$host_alias
1170target=$target_alias
1171
1172# FIXME: To remove some day.
1173if test "x$host_alias" != x; then
1174  if test "x$build_alias" = x; then
1175    cross_compiling=maybe
1176  elif test "x$build_alias" != "x$host_alias"; then
1177    cross_compiling=yes
1178  fi
1179fi
1180
1181ac_tool_prefix=
1182test -n "$host_alias" && ac_tool_prefix=$host_alias-
1183
1184test "$silent" = yes && exec 6>/dev/null
1185
1186
1187ac_pwd=`pwd` && test -n "$ac_pwd" &&
1188ac_ls_di=`ls -di .` &&
1189ac_pwd_ls_di=`cd "$ac_pwd" && ls -di .` ||
1190  as_fn_error $? "working directory cannot be determined"
1191test "X$ac_ls_di" = "X$ac_pwd_ls_di" ||
1192  as_fn_error $? "pwd does not report name of working directory"
1193
1194
1195# Find the source files, if location was not specified.
1196if test -z "$srcdir"; then
1197  ac_srcdir_defaulted=yes
1198  # Try the directory containing this script, then the parent directory.
1199  ac_confdir=`$as_dirname -- "$as_myself" ||
1200$as_expr X"$as_myself" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
1201	 X"$as_myself" : 'X\(//\)[^/]' \| \
1202	 X"$as_myself" : 'X\(//\)$' \| \
1203	 X"$as_myself" : 'X\(/\)' \| . 2>/dev/null ||
1204printf "%s\n" X"$as_myself" |
1205    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
1206	    s//\1/
1207	    q
1208	  }
1209	  /^X\(\/\/\)[^/].*/{
1210	    s//\1/
1211	    q
1212	  }
1213	  /^X\(\/\/\)$/{
1214	    s//\1/
1215	    q
1216	  }
1217	  /^X\(\/\).*/{
1218	    s//\1/
1219	    q
1220	  }
1221	  s/.*/./; q'`
1222  srcdir=$ac_confdir
1223  if test ! -r "$srcdir/$ac_unique_file"; then
1224    srcdir=..
1225  fi
1226else
1227  ac_srcdir_defaulted=no
1228fi
1229if test ! -r "$srcdir/$ac_unique_file"; then
1230  test "$ac_srcdir_defaulted" = yes && srcdir="$ac_confdir or .."
1231  as_fn_error $? "cannot find sources ($ac_unique_file) in $srcdir"
1232fi
1233ac_msg="sources are in $srcdir, but \`cd $srcdir' does not work"
1234ac_abs_confdir=`(
1235	cd "$srcdir" && test -r "./$ac_unique_file" || as_fn_error $? "$ac_msg"
1236	pwd)`
1237# When building in place, set srcdir=.
1238if test "$ac_abs_confdir" = "$ac_pwd"; then
1239  srcdir=.
1240fi
1241# Remove unnecessary trailing slashes from srcdir.
1242# Double slashes in file names in object file debugging info
1243# mess up M-x gdb in Emacs.
1244case $srcdir in
1245*/) srcdir=`expr "X$srcdir" : 'X\(.*[^/]\)' \| "X$srcdir" : 'X\(.*\)'`;;
1246esac
1247for ac_var in $ac_precious_vars; do
1248  eval ac_env_${ac_var}_set=\${${ac_var}+set}
1249  eval ac_env_${ac_var}_value=\$${ac_var}
1250  eval ac_cv_env_${ac_var}_set=\${${ac_var}+set}
1251  eval ac_cv_env_${ac_var}_value=\$${ac_var}
1252done
1253
1254#
1255# Report the --help message.
1256#
1257if test "$ac_init_help" = "long"; then
1258  # Omit some internal or obsolete options to make the list less imposing.
1259  # This message is too long to be a string in the A/UX 3.1 sh.
1260  cat <<_ACEOF
1261\`configure' configures Haskell time package 1.9.3 to adapt to many kinds of systems.
1262
1263Usage: $0 [OPTION]... [VAR=VALUE]...
1264
1265To assign environment variables (e.g., CC, CFLAGS...), specify them as
1266VAR=VALUE.  See below for descriptions of some of the useful variables.
1267
1268Defaults for the options are specified in brackets.
1269
1270Configuration:
1271  -h, --help              display this help and exit
1272      --help=short        display options specific to this package
1273      --help=recursive    display the short help of all the included packages
1274  -V, --version           display version information and exit
1275  -q, --quiet, --silent   do not print \`checking ...' messages
1276      --cache-file=FILE   cache test results in FILE [disabled]
1277  -C, --config-cache      alias for \`--cache-file=config.cache'
1278  -n, --no-create         do not create output files
1279      --srcdir=DIR        find the sources in DIR [configure dir or \`..']
1280
1281Installation directories:
1282  --prefix=PREFIX         install architecture-independent files in PREFIX
1283                          [$ac_default_prefix]
1284  --exec-prefix=EPREFIX   install architecture-dependent files in EPREFIX
1285                          [PREFIX]
1286
1287By default, \`make install' will install all the files in
1288\`$ac_default_prefix/bin', \`$ac_default_prefix/lib' etc.  You can specify
1289an installation prefix other than \`$ac_default_prefix' using \`--prefix',
1290for instance \`--prefix=\$HOME'.
1291
1292For better control, use the options below.
1293
1294Fine tuning of the installation directories:
1295  --bindir=DIR            user executables [EPREFIX/bin]
1296  --sbindir=DIR           system admin executables [EPREFIX/sbin]
1297  --libexecdir=DIR        program executables [EPREFIX/libexec]
1298  --sysconfdir=DIR        read-only single-machine data [PREFIX/etc]
1299  --sharedstatedir=DIR    modifiable architecture-independent data [PREFIX/com]
1300  --localstatedir=DIR     modifiable single-machine data [PREFIX/var]
1301  --runstatedir=DIR       modifiable per-process data [LOCALSTATEDIR/run]
1302  --libdir=DIR            object code libraries [EPREFIX/lib]
1303  --includedir=DIR        C header files [PREFIX/include]
1304  --oldincludedir=DIR     C header files for non-gcc [/usr/include]
1305  --datarootdir=DIR       read-only arch.-independent data root [PREFIX/share]
1306  --datadir=DIR           read-only architecture-independent data [DATAROOTDIR]
1307  --infodir=DIR           info documentation [DATAROOTDIR/info]
1308  --localedir=DIR         locale-dependent data [DATAROOTDIR/locale]
1309  --mandir=DIR            man documentation [DATAROOTDIR/man]
1310  --docdir=DIR            documentation root [DATAROOTDIR/doc/time]
1311  --htmldir=DIR           html documentation [DOCDIR]
1312  --dvidir=DIR            dvi documentation [DOCDIR]
1313  --pdfdir=DIR            pdf documentation [DOCDIR]
1314  --psdir=DIR             ps documentation [DOCDIR]
1315_ACEOF
1316
1317  cat <<\_ACEOF
1318_ACEOF
1319fi
1320
1321if test -n "$ac_init_help"; then
1322  case $ac_init_help in
1323     short | recursive ) echo "Configuration of Haskell time package 1.9.3:";;
1324   esac
1325  cat <<\_ACEOF
1326
1327Optional Packages:
1328  --with-PACKAGE[=ARG]    use PACKAGE [ARG=yes]
1329  --without-PACKAGE       do not use PACKAGE (same as --with-PACKAGE=no)
1330Gnu C compiler
1331Haskell compiler
1332
1333Some influential environment variables:
1334  CC          C compiler command
1335  CFLAGS      C compiler flags
1336  LDFLAGS     linker flags, e.g. -L<lib dir> if you have libraries in a
1337              nonstandard directory <lib dir>
1338  LIBS        libraries to pass to the linker, e.g. -l<library>
1339  CPPFLAGS    (Objective) C/C++ preprocessor flags, e.g. -I<include dir> if
1340              you have headers in a nonstandard directory <include dir>
1341
1342Use these variables to override the choices made by `configure' or to help
1343it to find libraries and programs with nonstandard names/locations.
1344
1345Report bugs to <ashley@semantic.org>.
1346_ACEOF
1347ac_status=$?
1348fi
1349
1350if test "$ac_init_help" = "recursive"; then
1351  # If there are subdirs, report their specific --help.
1352  for ac_dir in : $ac_subdirs_all; do test "x$ac_dir" = x: && continue
1353    test -d "$ac_dir" ||
1354      { cd "$srcdir" && ac_pwd=`pwd` && srcdir=. && test -d "$ac_dir"; } ||
1355      continue
1356    ac_builddir=.
1357
1358case "$ac_dir" in
1359.) ac_dir_suffix= ac_top_builddir_sub=. ac_top_build_prefix= ;;
1360*)
1361  ac_dir_suffix=/`printf "%s\n" "$ac_dir" | sed 's|^\.[\\/]||'`
1362  # A ".." for each directory in $ac_dir_suffix.
1363  ac_top_builddir_sub=`printf "%s\n" "$ac_dir_suffix" | sed 's|/[^\\/]*|/..|g;s|/||'`
1364  case $ac_top_builddir_sub in
1365  "") ac_top_builddir_sub=. ac_top_build_prefix= ;;
1366  *)  ac_top_build_prefix=$ac_top_builddir_sub/ ;;
1367  esac ;;
1368esac
1369ac_abs_top_builddir=$ac_pwd
1370ac_abs_builddir=$ac_pwd$ac_dir_suffix
1371# for backward compatibility:
1372ac_top_builddir=$ac_top_build_prefix
1373
1374case $srcdir in
1375  .)  # We are building in place.
1376    ac_srcdir=.
1377    ac_top_srcdir=$ac_top_builddir_sub
1378    ac_abs_top_srcdir=$ac_pwd ;;
1379  [\\/]* | ?:[\\/]* )  # Absolute name.
1380    ac_srcdir=$srcdir$ac_dir_suffix;
1381    ac_top_srcdir=$srcdir
1382    ac_abs_top_srcdir=$srcdir ;;
1383  *) # Relative name.
1384    ac_srcdir=$ac_top_build_prefix$srcdir$ac_dir_suffix
1385    ac_top_srcdir=$ac_top_build_prefix$srcdir
1386    ac_abs_top_srcdir=$ac_pwd/$srcdir ;;
1387esac
1388ac_abs_srcdir=$ac_abs_top_srcdir$ac_dir_suffix
1389
1390    cd "$ac_dir" || { ac_status=$?; continue; }
1391    # Check for configure.gnu first; this name is used for a wrapper for
1392    # Metaconfig's "Configure" on case-insensitive file systems.
1393    if test -f "$ac_srcdir/configure.gnu"; then
1394      echo &&
1395      $SHELL "$ac_srcdir/configure.gnu" --help=recursive
1396    elif test -f "$ac_srcdir/configure"; then
1397      echo &&
1398      $SHELL "$ac_srcdir/configure" --help=recursive
1399    else
1400      printf "%s\n" "$as_me: WARNING: no configuration information is in $ac_dir" >&2
1401    fi || ac_status=$?
1402    cd "$ac_pwd" || { ac_status=$?; break; }
1403  done
1404fi
1405
1406test -n "$ac_init_help" && exit $ac_status
1407if $ac_init_version; then
1408  cat <<\_ACEOF
1409Haskell time package configure 1.9.3
1410generated by GNU Autoconf 2.71
1411
1412Copyright (C) 2021 Free Software Foundation, Inc.
1413This configure script is free software; the Free Software Foundation
1414gives unlimited permission to copy, distribute and modify it.
1415_ACEOF
1416  exit
1417fi
1418
1419## ------------------------ ##
1420## Autoconf initialization. ##
1421## ------------------------ ##
1422
1423# ac_fn_c_try_compile LINENO
1424# --------------------------
1425# Try to compile conftest.$ac_ext, and return whether this succeeded.
1426ac_fn_c_try_compile ()
1427{
1428  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1429  rm -f conftest.$ac_objext conftest.beam
1430  if { { ac_try="$ac_compile"
1431case "(($ac_try" in
1432  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
1433  *) ac_try_echo=$ac_try;;
1434esac
1435eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
1436printf "%s\n" "$ac_try_echo"; } >&5
1437  (eval "$ac_compile") 2>conftest.err
1438  ac_status=$?
1439  if test -s conftest.err; then
1440    grep -v '^ *+' conftest.err >conftest.er1
1441    cat conftest.er1 >&5
1442    mv -f conftest.er1 conftest.err
1443  fi
1444  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
1445  test $ac_status = 0; } && {
1446	 test -z "$ac_c_werror_flag" ||
1447	 test ! -s conftest.err
1448       } && test -s conftest.$ac_objext
1449then :
1450  ac_retval=0
1451else $as_nop
1452  printf "%s\n" "$as_me: failed program was:" >&5
1453sed 's/^/| /' conftest.$ac_ext >&5
1454
1455	ac_retval=1
1456fi
1457  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1458  as_fn_set_status $ac_retval
1459
1460} # ac_fn_c_try_compile
1461
1462# ac_fn_c_check_header_compile LINENO HEADER VAR INCLUDES
1463# -------------------------------------------------------
1464# Tests whether HEADER exists and can be compiled using the include files in
1465# INCLUDES, setting the cache variable VAR accordingly.
1466ac_fn_c_check_header_compile ()
1467{
1468  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1469  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $2" >&5
1470printf %s "checking for $2... " >&6; }
1471if eval test \${$3+y}
1472then :
1473  printf %s "(cached) " >&6
1474else $as_nop
1475  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1476/* end confdefs.h.  */
1477$4
1478#include <$2>
1479_ACEOF
1480if ac_fn_c_try_compile "$LINENO"
1481then :
1482  eval "$3=yes"
1483else $as_nop
1484  eval "$3=no"
1485fi
1486rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
1487fi
1488eval ac_res=\$$3
1489	       { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_res" >&5
1490printf "%s\n" "$ac_res" >&6; }
1491  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1492
1493} # ac_fn_c_check_header_compile
1494
1495# ac_fn_c_try_link LINENO
1496# -----------------------
1497# Try to link conftest.$ac_ext, and return whether this succeeded.
1498ac_fn_c_try_link ()
1499{
1500  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1501  rm -f conftest.$ac_objext conftest.beam conftest$ac_exeext
1502  if { { ac_try="$ac_link"
1503case "(($ac_try" in
1504  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
1505  *) ac_try_echo=$ac_try;;
1506esac
1507eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
1508printf "%s\n" "$ac_try_echo"; } >&5
1509  (eval "$ac_link") 2>conftest.err
1510  ac_status=$?
1511  if test -s conftest.err; then
1512    grep -v '^ *+' conftest.err >conftest.er1
1513    cat conftest.er1 >&5
1514    mv -f conftest.er1 conftest.err
1515  fi
1516  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
1517  test $ac_status = 0; } && {
1518	 test -z "$ac_c_werror_flag" ||
1519	 test ! -s conftest.err
1520       } && test -s conftest$ac_exeext && {
1521	 test "$cross_compiling" = yes ||
1522	 test -x conftest$ac_exeext
1523       }
1524then :
1525  ac_retval=0
1526else $as_nop
1527  printf "%s\n" "$as_me: failed program was:" >&5
1528sed 's/^/| /' conftest.$ac_ext >&5
1529
1530	ac_retval=1
1531fi
1532  # Delete the IPA/IPO (Inter Procedural Analysis/Optimization) information
1533  # created by the PGI compiler (conftest_ipa8_conftest.oo), as it would
1534  # interfere with the next link command; also delete a directory that is
1535  # left behind by Apple's compiler.  We do this before executing the actions.
1536  rm -rf conftest.dSYM conftest_ipa8_conftest.oo
1537  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1538  as_fn_set_status $ac_retval
1539
1540} # ac_fn_c_try_link
1541
1542# ac_fn_c_check_func LINENO FUNC VAR
1543# ----------------------------------
1544# Tests whether FUNC exists, setting the cache variable VAR accordingly
1545ac_fn_c_check_func ()
1546{
1547  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1548  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $2" >&5
1549printf %s "checking for $2... " >&6; }
1550if eval test \${$3+y}
1551then :
1552  printf %s "(cached) " >&6
1553else $as_nop
1554  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1555/* end confdefs.h.  */
1556/* Define $2 to an innocuous variant, in case <limits.h> declares $2.
1557   For example, HP-UX 11i <limits.h> declares gettimeofday.  */
1558#define $2 innocuous_$2
1559
1560/* System header to define __stub macros and hopefully few prototypes,
1561   which can conflict with char $2 (); below.  */
1562
1563#include <limits.h>
1564#undef $2
1565
1566/* Override any GCC internal prototype to avoid an error.
1567   Use char because int might match the return type of a GCC
1568   builtin and then its argument prototype would still apply.  */
1569#ifdef __cplusplus
1570extern "C"
1571#endif
1572char $2 ();
1573/* The GNU C library defines this for functions which it implements
1574    to always fail with ENOSYS.  Some functions are actually named
1575    something starting with __ and the normal name is an alias.  */
1576#if defined __stub_$2 || defined __stub___$2
1577choke me
1578#endif
1579
1580int
1581main (void)
1582{
1583return $2 ();
1584  ;
1585  return 0;
1586}
1587_ACEOF
1588if ac_fn_c_try_link "$LINENO"
1589then :
1590  eval "$3=yes"
1591else $as_nop
1592  eval "$3=no"
1593fi
1594rm -f core conftest.err conftest.$ac_objext conftest.beam \
1595    conftest$ac_exeext conftest.$ac_ext
1596fi
1597eval ac_res=\$$3
1598	       { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_res" >&5
1599printf "%s\n" "$ac_res" >&6; }
1600  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1601
1602} # ac_fn_c_check_func
1603
1604# ac_fn_c_check_member LINENO AGGR MEMBER VAR INCLUDES
1605# ----------------------------------------------------
1606# Tries to find if the field MEMBER exists in type AGGR, after including
1607# INCLUDES, setting cache variable VAR accordingly.
1608ac_fn_c_check_member ()
1609{
1610  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1611  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $2.$3" >&5
1612printf %s "checking for $2.$3... " >&6; }
1613if eval test \${$4+y}
1614then :
1615  printf %s "(cached) " >&6
1616else $as_nop
1617  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1618/* end confdefs.h.  */
1619$5
1620int
1621main (void)
1622{
1623static $2 ac_aggr;
1624if (ac_aggr.$3)
1625return 0;
1626  ;
1627  return 0;
1628}
1629_ACEOF
1630if ac_fn_c_try_compile "$LINENO"
1631then :
1632  eval "$4=yes"
1633else $as_nop
1634  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1635/* end confdefs.h.  */
1636$5
1637int
1638main (void)
1639{
1640static $2 ac_aggr;
1641if (sizeof ac_aggr.$3)
1642return 0;
1643  ;
1644  return 0;
1645}
1646_ACEOF
1647if ac_fn_c_try_compile "$LINENO"
1648then :
1649  eval "$4=yes"
1650else $as_nop
1651  eval "$4=no"
1652fi
1653rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
1654fi
1655rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
1656fi
1657eval ac_res=\$$4
1658	       { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_res" >&5
1659printf "%s\n" "$ac_res" >&6; }
1660  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1661
1662} # ac_fn_c_check_member
1663
1664# ac_fn_check_decl LINENO SYMBOL VAR INCLUDES EXTRA-OPTIONS FLAG-VAR
1665# ------------------------------------------------------------------
1666# Tests whether SYMBOL is declared in INCLUDES, setting cache variable VAR
1667# accordingly. Pass EXTRA-OPTIONS to the compiler, using FLAG-VAR.
1668ac_fn_check_decl ()
1669{
1670  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1671  as_decl_name=`echo $2|sed 's/ *(.*//'`
1672  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking whether $as_decl_name is declared" >&5
1673printf %s "checking whether $as_decl_name is declared... " >&6; }
1674if eval test \${$3+y}
1675then :
1676  printf %s "(cached) " >&6
1677else $as_nop
1678  as_decl_use=`echo $2|sed -e 's/(/((/' -e 's/)/) 0&/' -e 's/,/) 0& (/g'`
1679  eval ac_save_FLAGS=\$$6
1680  as_fn_append $6 " $5"
1681  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1682/* end confdefs.h.  */
1683$4
1684int
1685main (void)
1686{
1687#ifndef $as_decl_name
1688#ifdef __cplusplus
1689  (void) $as_decl_use;
1690#else
1691  (void) $as_decl_name;
1692#endif
1693#endif
1694
1695  ;
1696  return 0;
1697}
1698_ACEOF
1699if ac_fn_c_try_compile "$LINENO"
1700then :
1701  eval "$3=yes"
1702else $as_nop
1703  eval "$3=no"
1704fi
1705rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
1706  eval $6=\$ac_save_FLAGS
1707
1708fi
1709eval ac_res=\$$3
1710	       { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_res" >&5
1711printf "%s\n" "$ac_res" >&6; }
1712  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1713
1714} # ac_fn_check_decl
1715ac_configure_args_raw=
1716for ac_arg
1717do
1718  case $ac_arg in
1719  *\'*)
1720    ac_arg=`printf "%s\n" "$ac_arg" | sed "s/'/'\\\\\\\\''/g"` ;;
1721  esac
1722  as_fn_append ac_configure_args_raw " '$ac_arg'"
1723done
1724
1725case $ac_configure_args_raw in
1726  *$as_nl*)
1727    ac_safe_unquote= ;;
1728  *)
1729    ac_unsafe_z='|&;<>()$`\\"*?[ ''	' # This string ends in space, tab.
1730    ac_unsafe_a="$ac_unsafe_z#~"
1731    ac_safe_unquote="s/ '\\([^$ac_unsafe_a][^$ac_unsafe_z]*\\)'/ \\1/g"
1732    ac_configure_args_raw=`      printf "%s\n" "$ac_configure_args_raw" | sed "$ac_safe_unquote"`;;
1733esac
1734
1735cat >config.log <<_ACEOF
1736This file contains any messages produced by compilers while
1737running configure, to aid debugging if configure makes a mistake.
1738
1739It was created by Haskell time package $as_me 1.9.3, which was
1740generated by GNU Autoconf 2.71.  Invocation command line was
1741
1742  $ $0$ac_configure_args_raw
1743
1744_ACEOF
1745exec 5>>config.log
1746{
1747cat <<_ASUNAME
1748## --------- ##
1749## Platform. ##
1750## --------- ##
1751
1752hostname = `(hostname || uname -n) 2>/dev/null | sed 1q`
1753uname -m = `(uname -m) 2>/dev/null || echo unknown`
1754uname -r = `(uname -r) 2>/dev/null || echo unknown`
1755uname -s = `(uname -s) 2>/dev/null || echo unknown`
1756uname -v = `(uname -v) 2>/dev/null || echo unknown`
1757
1758/usr/bin/uname -p = `(/usr/bin/uname -p) 2>/dev/null || echo unknown`
1759/bin/uname -X     = `(/bin/uname -X) 2>/dev/null     || echo unknown`
1760
1761/bin/arch              = `(/bin/arch) 2>/dev/null              || echo unknown`
1762/usr/bin/arch -k       = `(/usr/bin/arch -k) 2>/dev/null       || echo unknown`
1763/usr/convex/getsysinfo = `(/usr/convex/getsysinfo) 2>/dev/null || echo unknown`
1764/usr/bin/hostinfo      = `(/usr/bin/hostinfo) 2>/dev/null      || echo unknown`
1765/bin/machine           = `(/bin/machine) 2>/dev/null           || echo unknown`
1766/usr/bin/oslevel       = `(/usr/bin/oslevel) 2>/dev/null       || echo unknown`
1767/bin/universe          = `(/bin/universe) 2>/dev/null          || echo unknown`
1768
1769_ASUNAME
1770
1771as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
1772for as_dir in $PATH
1773do
1774  IFS=$as_save_IFS
1775  case $as_dir in #(((
1776    '') as_dir=./ ;;
1777    */) ;;
1778    *) as_dir=$as_dir/ ;;
1779  esac
1780    printf "%s\n" "PATH: $as_dir"
1781  done
1782IFS=$as_save_IFS
1783
1784} >&5
1785
1786cat >&5 <<_ACEOF
1787
1788
1789## ----------- ##
1790## Core tests. ##
1791## ----------- ##
1792
1793_ACEOF
1794
1795
1796# Keep a trace of the command line.
1797# Strip out --no-create and --no-recursion so they do not pile up.
1798# Strip out --silent because we don't want to record it for future runs.
1799# Also quote any args containing shell meta-characters.
1800# Make two passes to allow for proper duplicate-argument suppression.
1801ac_configure_args=
1802ac_configure_args0=
1803ac_configure_args1=
1804ac_must_keep_next=false
1805for ac_pass in 1 2
1806do
1807  for ac_arg
1808  do
1809    case $ac_arg in
1810    -no-create | --no-c* | -n | -no-recursion | --no-r*) continue ;;
1811    -q | -quiet | --quiet | --quie | --qui | --qu | --q \
1812    | -silent | --silent | --silen | --sile | --sil)
1813      continue ;;
1814    *\'*)
1815      ac_arg=`printf "%s\n" "$ac_arg" | sed "s/'/'\\\\\\\\''/g"` ;;
1816    esac
1817    case $ac_pass in
1818    1) as_fn_append ac_configure_args0 " '$ac_arg'" ;;
1819    2)
1820      as_fn_append ac_configure_args1 " '$ac_arg'"
1821      if test $ac_must_keep_next = true; then
1822	ac_must_keep_next=false # Got value, back to normal.
1823      else
1824	case $ac_arg in
1825	  *=* | --config-cache | -C | -disable-* | --disable-* \
1826	  | -enable-* | --enable-* | -gas | --g* | -nfp | --nf* \
1827	  | -q | -quiet | --q* | -silent | --sil* | -v | -verb* \
1828	  | -with-* | --with-* | -without-* | --without-* | --x)
1829	    case "$ac_configure_args0 " in
1830	      "$ac_configure_args1"*" '$ac_arg' "* ) continue ;;
1831	    esac
1832	    ;;
1833	  -* ) ac_must_keep_next=true ;;
1834	esac
1835      fi
1836      as_fn_append ac_configure_args " '$ac_arg'"
1837      ;;
1838    esac
1839  done
1840done
1841{ ac_configure_args0=; unset ac_configure_args0;}
1842{ ac_configure_args1=; unset ac_configure_args1;}
1843
1844# When interrupted or exit'd, cleanup temporary files, and complete
1845# config.log.  We remove comments because anyway the quotes in there
1846# would cause problems or look ugly.
1847# WARNING: Use '\'' to represent an apostrophe within the trap.
1848# WARNING: Do not start the trap code with a newline, due to a FreeBSD 4.0 bug.
1849trap 'exit_status=$?
1850  # Sanitize IFS.
1851  IFS=" ""	$as_nl"
1852  # Save into config.log some information that might help in debugging.
1853  {
1854    echo
1855
1856    printf "%s\n" "## ---------------- ##
1857## Cache variables. ##
1858## ---------------- ##"
1859    echo
1860    # The following way of writing the cache mishandles newlines in values,
1861(
1862  for ac_var in `(set) 2>&1 | sed -n '\''s/^\([a-zA-Z_][a-zA-Z0-9_]*\)=.*/\1/p'\''`; do
1863    eval ac_val=\$$ac_var
1864    case $ac_val in #(
1865    *${as_nl}*)
1866      case $ac_var in #(
1867      *_cv_*) { printf "%s\n" "$as_me:${as_lineno-$LINENO}: WARNING: cache variable $ac_var contains a newline" >&5
1868printf "%s\n" "$as_me: WARNING: cache variable $ac_var contains a newline" >&2;} ;;
1869      esac
1870      case $ac_var in #(
1871      _ | IFS | as_nl) ;; #(
1872      BASH_ARGV | BASH_SOURCE) eval $ac_var= ;; #(
1873      *) { eval $ac_var=; unset $ac_var;} ;;
1874      esac ;;
1875    esac
1876  done
1877  (set) 2>&1 |
1878    case $as_nl`(ac_space='\'' '\''; set) 2>&1` in #(
1879    *${as_nl}ac_space=\ *)
1880      sed -n \
1881	"s/'\''/'\''\\\\'\'''\''/g;
1882	  s/^\\([_$as_cr_alnum]*_cv_[_$as_cr_alnum]*\\)=\\(.*\\)/\\1='\''\\2'\''/p"
1883      ;; #(
1884    *)
1885      sed -n "/^[_$as_cr_alnum]*_cv_[_$as_cr_alnum]*=/p"
1886      ;;
1887    esac |
1888    sort
1889)
1890    echo
1891
1892    printf "%s\n" "## ----------------- ##
1893## Output variables. ##
1894## ----------------- ##"
1895    echo
1896    for ac_var in $ac_subst_vars
1897    do
1898      eval ac_val=\$$ac_var
1899      case $ac_val in
1900      *\'\''*) ac_val=`printf "%s\n" "$ac_val" | sed "s/'\''/'\''\\\\\\\\'\'''\''/g"`;;
1901      esac
1902      printf "%s\n" "$ac_var='\''$ac_val'\''"
1903    done | sort
1904    echo
1905
1906    if test -n "$ac_subst_files"; then
1907      printf "%s\n" "## ------------------- ##
1908## File substitutions. ##
1909## ------------------- ##"
1910      echo
1911      for ac_var in $ac_subst_files
1912      do
1913	eval ac_val=\$$ac_var
1914	case $ac_val in
1915	*\'\''*) ac_val=`printf "%s\n" "$ac_val" | sed "s/'\''/'\''\\\\\\\\'\'''\''/g"`;;
1916	esac
1917	printf "%s\n" "$ac_var='\''$ac_val'\''"
1918      done | sort
1919      echo
1920    fi
1921
1922    if test -s confdefs.h; then
1923      printf "%s\n" "## ----------- ##
1924## confdefs.h. ##
1925## ----------- ##"
1926      echo
1927      cat confdefs.h
1928      echo
1929    fi
1930    test "$ac_signal" != 0 &&
1931      printf "%s\n" "$as_me: caught signal $ac_signal"
1932    printf "%s\n" "$as_me: exit $exit_status"
1933  } >&5
1934  rm -f core *.core core.conftest.* &&
1935    rm -f -r conftest* confdefs* conf$$* $ac_clean_files &&
1936    exit $exit_status
1937' 0
1938for ac_signal in 1 2 13 15; do
1939  trap 'ac_signal='$ac_signal'; as_fn_exit 1' $ac_signal
1940done
1941ac_signal=0
1942
1943# confdefs.h avoids OS command line length limits that DEFS can exceed.
1944rm -f -r conftest* confdefs.h
1945
1946printf "%s\n" "/* confdefs.h */" > confdefs.h
1947
1948# Predefined preprocessor variables.
1949
1950printf "%s\n" "#define PACKAGE_NAME \"$PACKAGE_NAME\"" >>confdefs.h
1951
1952printf "%s\n" "#define PACKAGE_TARNAME \"$PACKAGE_TARNAME\"" >>confdefs.h
1953
1954printf "%s\n" "#define PACKAGE_VERSION \"$PACKAGE_VERSION\"" >>confdefs.h
1955
1956printf "%s\n" "#define PACKAGE_STRING \"$PACKAGE_STRING\"" >>confdefs.h
1957
1958printf "%s\n" "#define PACKAGE_BUGREPORT \"$PACKAGE_BUGREPORT\"" >>confdefs.h
1959
1960printf "%s\n" "#define PACKAGE_URL \"$PACKAGE_URL\"" >>confdefs.h
1961
1962
1963# Let the site file select an alternate cache file if it wants to.
1964# Prefer an explicitly selected file to automatically selected ones.
1965if test -n "$CONFIG_SITE"; then
1966  ac_site_files="$CONFIG_SITE"
1967elif test "x$prefix" != xNONE; then
1968  ac_site_files="$prefix/share/config.site $prefix/etc/config.site"
1969else
1970  ac_site_files="$ac_default_prefix/share/config.site $ac_default_prefix/etc/config.site"
1971fi
1972
1973for ac_site_file in $ac_site_files
1974do
1975  case $ac_site_file in #(
1976  */*) :
1977     ;; #(
1978  *) :
1979    ac_site_file=./$ac_site_file ;;
1980esac
1981  if test -f "$ac_site_file" && test -r "$ac_site_file"; then
1982    { printf "%s\n" "$as_me:${as_lineno-$LINENO}: loading site script $ac_site_file" >&5
1983printf "%s\n" "$as_me: loading site script $ac_site_file" >&6;}
1984    sed 's/^/| /' "$ac_site_file" >&5
1985    . "$ac_site_file" \
1986      || { { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
1987printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
1988as_fn_error $? "failed to load site script $ac_site_file
1989See \`config.log' for more details" "$LINENO" 5; }
1990  fi
1991done
1992
1993if test -r "$cache_file"; then
1994  # Some versions of bash will fail to source /dev/null (special files
1995  # actually), so we avoid doing that.  DJGPP emulates it as a regular file.
1996  if test /dev/null != "$cache_file" && test -f "$cache_file"; then
1997    { printf "%s\n" "$as_me:${as_lineno-$LINENO}: loading cache $cache_file" >&5
1998printf "%s\n" "$as_me: loading cache $cache_file" >&6;}
1999    case $cache_file in
2000      [\\/]* | ?:[\\/]* ) . "$cache_file";;
2001      *)                      . "./$cache_file";;
2002    esac
2003  fi
2004else
2005  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: creating cache $cache_file" >&5
2006printf "%s\n" "$as_me: creating cache $cache_file" >&6;}
2007  >$cache_file
2008fi
2009
2010# Test code for whether the C compiler supports C89 (global declarations)
2011ac_c_conftest_c89_globals='
2012/* Does the compiler advertise C89 conformance?
2013   Do not test the value of __STDC__, because some compilers set it to 0
2014   while being otherwise adequately conformant. */
2015#if !defined __STDC__
2016# error "Compiler does not advertise C89 conformance"
2017#endif
2018
2019#include <stddef.h>
2020#include <stdarg.h>
2021struct stat;
2022/* Most of the following tests are stolen from RCS 5.7 src/conf.sh.  */
2023struct buf { int x; };
2024struct buf * (*rcsopen) (struct buf *, struct stat *, int);
2025static char *e (p, i)
2026     char **p;
2027     int i;
2028{
2029  return p[i];
2030}
2031static char *f (char * (*g) (char **, int), char **p, ...)
2032{
2033  char *s;
2034  va_list v;
2035  va_start (v,p);
2036  s = g (p, va_arg (v,int));
2037  va_end (v);
2038  return s;
2039}
2040
2041/* OSF 4.0 Compaq cc is some sort of almost-ANSI by default.  It has
2042   function prototypes and stuff, but not \xHH hex character constants.
2043   These do not provoke an error unfortunately, instead are silently treated
2044   as an "x".  The following induces an error, until -std is added to get
2045   proper ANSI mode.  Curiously \x00 != x always comes out true, for an
2046   array size at least.  It is necessary to write \x00 == 0 to get something
2047   that is true only with -std.  */
2048int osf4_cc_array ['\''\x00'\'' == 0 ? 1 : -1];
2049
2050/* IBM C 6 for AIX is almost-ANSI by default, but it replaces macro parameters
2051   inside strings and character constants.  */
2052#define FOO(x) '\''x'\''
2053int xlc6_cc_array[FOO(a) == '\''x'\'' ? 1 : -1];
2054
2055int test (int i, double x);
2056struct s1 {int (*f) (int a);};
2057struct s2 {int (*f) (double a);};
2058int pairnames (int, char **, int *(*)(struct buf *, struct stat *, int),
2059               int, int);'
2060
2061# Test code for whether the C compiler supports C89 (body of main).
2062ac_c_conftest_c89_main='
2063ok |= (argc == 0 || f (e, argv, 0) != argv[0] || f (e, argv, 1) != argv[1]);
2064'
2065
2066# Test code for whether the C compiler supports C99 (global declarations)
2067ac_c_conftest_c99_globals='
2068// Does the compiler advertise C99 conformance?
2069#if !defined __STDC_VERSION__ || __STDC_VERSION__ < 199901L
2070# error "Compiler does not advertise C99 conformance"
2071#endif
2072
2073#include <stdbool.h>
2074extern int puts (const char *);
2075extern int printf (const char *, ...);
2076extern int dprintf (int, const char *, ...);
2077extern void *malloc (size_t);
2078
2079// Check varargs macros.  These examples are taken from C99 6.10.3.5.
2080// dprintf is used instead of fprintf to avoid needing to declare
2081// FILE and stderr.
2082#define debug(...) dprintf (2, __VA_ARGS__)
2083#define showlist(...) puts (#__VA_ARGS__)
2084#define report(test,...) ((test) ? puts (#test) : printf (__VA_ARGS__))
2085static void
2086test_varargs_macros (void)
2087{
2088  int x = 1234;
2089  int y = 5678;
2090  debug ("Flag");
2091  debug ("X = %d\n", x);
2092  showlist (The first, second, and third items.);
2093  report (x>y, "x is %d but y is %d", x, y);
2094}
2095
2096// Check long long types.
2097#define BIG64 18446744073709551615ull
2098#define BIG32 4294967295ul
2099#define BIG_OK (BIG64 / BIG32 == 4294967297ull && BIG64 % BIG32 == 0)
2100#if !BIG_OK
2101  #error "your preprocessor is broken"
2102#endif
2103#if BIG_OK
2104#else
2105  #error "your preprocessor is broken"
2106#endif
2107static long long int bignum = -9223372036854775807LL;
2108static unsigned long long int ubignum = BIG64;
2109
2110struct incomplete_array
2111{
2112  int datasize;
2113  double data[];
2114};
2115
2116struct named_init {
2117  int number;
2118  const wchar_t *name;
2119  double average;
2120};
2121
2122typedef const char *ccp;
2123
2124static inline int
2125test_restrict (ccp restrict text)
2126{
2127  // See if C++-style comments work.
2128  // Iterate through items via the restricted pointer.
2129  // Also check for declarations in for loops.
2130  for (unsigned int i = 0; *(text+i) != '\''\0'\''; ++i)
2131    continue;
2132  return 0;
2133}
2134
2135// Check varargs and va_copy.
2136static bool
2137test_varargs (const char *format, ...)
2138{
2139  va_list args;
2140  va_start (args, format);
2141  va_list args_copy;
2142  va_copy (args_copy, args);
2143
2144  const char *str = "";
2145  int number = 0;
2146  float fnumber = 0;
2147
2148  while (*format)
2149    {
2150      switch (*format++)
2151	{
2152	case '\''s'\'': // string
2153	  str = va_arg (args_copy, const char *);
2154	  break;
2155	case '\''d'\'': // int
2156	  number = va_arg (args_copy, int);
2157	  break;
2158	case '\''f'\'': // float
2159	  fnumber = va_arg (args_copy, double);
2160	  break;
2161	default:
2162	  break;
2163	}
2164    }
2165  va_end (args_copy);
2166  va_end (args);
2167
2168  return *str && number && fnumber;
2169}
2170'
2171
2172# Test code for whether the C compiler supports C99 (body of main).
2173ac_c_conftest_c99_main='
2174  // Check bool.
2175  _Bool success = false;
2176  success |= (argc != 0);
2177
2178  // Check restrict.
2179  if (test_restrict ("String literal") == 0)
2180    success = true;
2181  char *restrict newvar = "Another string";
2182
2183  // Check varargs.
2184  success &= test_varargs ("s, d'\'' f .", "string", 65, 34.234);
2185  test_varargs_macros ();
2186
2187  // Check flexible array members.
2188  struct incomplete_array *ia =
2189    malloc (sizeof (struct incomplete_array) + (sizeof (double) * 10));
2190  ia->datasize = 10;
2191  for (int i = 0; i < ia->datasize; ++i)
2192    ia->data[i] = i * 1.234;
2193
2194  // Check named initializers.
2195  struct named_init ni = {
2196    .number = 34,
2197    .name = L"Test wide string",
2198    .average = 543.34343,
2199  };
2200
2201  ni.number = 58;
2202
2203  int dynamic_array[ni.number];
2204  dynamic_array[0] = argv[0][0];
2205  dynamic_array[ni.number - 1] = 543;
2206
2207  // work around unused variable warnings
2208  ok |= (!success || bignum == 0LL || ubignum == 0uLL || newvar[0] == '\''x'\''
2209	 || dynamic_array[ni.number - 1] != 543);
2210'
2211
2212# Test code for whether the C compiler supports C11 (global declarations)
2213ac_c_conftest_c11_globals='
2214// Does the compiler advertise C11 conformance?
2215#if !defined __STDC_VERSION__ || __STDC_VERSION__ < 201112L
2216# error "Compiler does not advertise C11 conformance"
2217#endif
2218
2219// Check _Alignas.
2220char _Alignas (double) aligned_as_double;
2221char _Alignas (0) no_special_alignment;
2222extern char aligned_as_int;
2223char _Alignas (0) _Alignas (int) aligned_as_int;
2224
2225// Check _Alignof.
2226enum
2227{
2228  int_alignment = _Alignof (int),
2229  int_array_alignment = _Alignof (int[100]),
2230  char_alignment = _Alignof (char)
2231};
2232_Static_assert (0 < -_Alignof (int), "_Alignof is signed");
2233
2234// Check _Noreturn.
2235int _Noreturn does_not_return (void) { for (;;) continue; }
2236
2237// Check _Static_assert.
2238struct test_static_assert
2239{
2240  int x;
2241  _Static_assert (sizeof (int) <= sizeof (long int),
2242                  "_Static_assert does not work in struct");
2243  long int y;
2244};
2245
2246// Check UTF-8 literals.
2247#define u8 syntax error!
2248char const utf8_literal[] = u8"happens to be ASCII" "another string";
2249
2250// Check duplicate typedefs.
2251typedef long *long_ptr;
2252typedef long int *long_ptr;
2253typedef long_ptr long_ptr;
2254
2255// Anonymous structures and unions -- taken from C11 6.7.2.1 Example 1.
2256struct anonymous
2257{
2258  union {
2259    struct { int i; int j; };
2260    struct { int k; long int l; } w;
2261  };
2262  int m;
2263} v1;
2264'
2265
2266# Test code for whether the C compiler supports C11 (body of main).
2267ac_c_conftest_c11_main='
2268  _Static_assert ((offsetof (struct anonymous, i)
2269		   == offsetof (struct anonymous, w.k)),
2270		  "Anonymous union alignment botch");
2271  v1.i = 2;
2272  v1.w.k = 5;
2273  ok |= v1.i != 5;
2274'
2275
2276# Test code for whether the C compiler supports C11 (complete).
2277ac_c_conftest_c11_program="${ac_c_conftest_c89_globals}
2278${ac_c_conftest_c99_globals}
2279${ac_c_conftest_c11_globals}
2280
2281int
2282main (int argc, char **argv)
2283{
2284  int ok = 0;
2285  ${ac_c_conftest_c89_main}
2286  ${ac_c_conftest_c99_main}
2287  ${ac_c_conftest_c11_main}
2288  return ok;
2289}
2290"
2291
2292# Test code for whether the C compiler supports C99 (complete).
2293ac_c_conftest_c99_program="${ac_c_conftest_c89_globals}
2294${ac_c_conftest_c99_globals}
2295
2296int
2297main (int argc, char **argv)
2298{
2299  int ok = 0;
2300  ${ac_c_conftest_c89_main}
2301  ${ac_c_conftest_c99_main}
2302  return ok;
2303}
2304"
2305
2306# Test code for whether the C compiler supports C89 (complete).
2307ac_c_conftest_c89_program="${ac_c_conftest_c89_globals}
2308
2309int
2310main (int argc, char **argv)
2311{
2312  int ok = 0;
2313  ${ac_c_conftest_c89_main}
2314  return ok;
2315}
2316"
2317
2318as_fn_append ac_header_c_list " stdio.h stdio_h HAVE_STDIO_H"
2319as_fn_append ac_header_c_list " stdlib.h stdlib_h HAVE_STDLIB_H"
2320as_fn_append ac_header_c_list " string.h string_h HAVE_STRING_H"
2321as_fn_append ac_header_c_list " inttypes.h inttypes_h HAVE_INTTYPES_H"
2322as_fn_append ac_header_c_list " stdint.h stdint_h HAVE_STDINT_H"
2323as_fn_append ac_header_c_list " strings.h strings_h HAVE_STRINGS_H"
2324as_fn_append ac_header_c_list " sys/stat.h sys_stat_h HAVE_SYS_STAT_H"
2325as_fn_append ac_header_c_list " sys/types.h sys_types_h HAVE_SYS_TYPES_H"
2326as_fn_append ac_header_c_list " unistd.h unistd_h HAVE_UNISTD_H"
2327as_fn_append ac_header_c_list " wchar.h wchar_h HAVE_WCHAR_H"
2328as_fn_append ac_header_c_list " minix/config.h minix_config_h HAVE_MINIX_CONFIG_H"
2329as_fn_append ac_header_c_list " sys/time.h sys_time_h HAVE_SYS_TIME_H"
2330# Check that the precious variables saved in the cache have kept the same
2331# value.
2332ac_cache_corrupted=false
2333for ac_var in $ac_precious_vars; do
2334  eval ac_old_set=\$ac_cv_env_${ac_var}_set
2335  eval ac_new_set=\$ac_env_${ac_var}_set
2336  eval ac_old_val=\$ac_cv_env_${ac_var}_value
2337  eval ac_new_val=\$ac_env_${ac_var}_value
2338  case $ac_old_set,$ac_new_set in
2339    set,)
2340      { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: \`$ac_var' was set to \`$ac_old_val' in the previous run" >&5
2341printf "%s\n" "$as_me: error: \`$ac_var' was set to \`$ac_old_val' in the previous run" >&2;}
2342      ac_cache_corrupted=: ;;
2343    ,set)
2344      { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: \`$ac_var' was not set in the previous run" >&5
2345printf "%s\n" "$as_me: error: \`$ac_var' was not set in the previous run" >&2;}
2346      ac_cache_corrupted=: ;;
2347    ,);;
2348    *)
2349      if test "x$ac_old_val" != "x$ac_new_val"; then
2350	# differences in whitespace do not lead to failure.
2351	ac_old_val_w=`echo x $ac_old_val`
2352	ac_new_val_w=`echo x $ac_new_val`
2353	if test "$ac_old_val_w" != "$ac_new_val_w"; then
2354	  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: \`$ac_var' has changed since the previous run:" >&5
2355printf "%s\n" "$as_me: error: \`$ac_var' has changed since the previous run:" >&2;}
2356	  ac_cache_corrupted=:
2357	else
2358	  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: warning: ignoring whitespace changes in \`$ac_var' since the previous run:" >&5
2359printf "%s\n" "$as_me: warning: ignoring whitespace changes in \`$ac_var' since the previous run:" >&2;}
2360	  eval $ac_var=\$ac_old_val
2361	fi
2362	{ printf "%s\n" "$as_me:${as_lineno-$LINENO}:   former value:  \`$ac_old_val'" >&5
2363printf "%s\n" "$as_me:   former value:  \`$ac_old_val'" >&2;}
2364	{ printf "%s\n" "$as_me:${as_lineno-$LINENO}:   current value: \`$ac_new_val'" >&5
2365printf "%s\n" "$as_me:   current value: \`$ac_new_val'" >&2;}
2366      fi;;
2367  esac
2368  # Pass precious variables to config.status.
2369  if test "$ac_new_set" = set; then
2370    case $ac_new_val in
2371    *\'*) ac_arg=$ac_var=`printf "%s\n" "$ac_new_val" | sed "s/'/'\\\\\\\\''/g"` ;;
2372    *) ac_arg=$ac_var=$ac_new_val ;;
2373    esac
2374    case " $ac_configure_args " in
2375      *" '$ac_arg' "*) ;; # Avoid dups.  Use of quotes ensures accuracy.
2376      *) as_fn_append ac_configure_args " '$ac_arg'" ;;
2377    esac
2378  fi
2379done
2380if $ac_cache_corrupted; then
2381  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
2382printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
2383  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: changes in the environment can compromise the build" >&5
2384printf "%s\n" "$as_me: error: changes in the environment can compromise the build" >&2;}
2385  as_fn_error $? "run \`${MAKE-make} distclean' and/or \`rm $cache_file'
2386	    and start over" "$LINENO" 5
2387fi
2388## -------------------- ##
2389## Main body of script. ##
2390## -------------------- ##
2391
2392ac_ext=c
2393ac_cpp='$CPP $CPPFLAGS'
2394ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
2395ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
2396ac_compiler_gnu=$ac_cv_c_compiler_gnu
2397
2398
2399
2400# Safety check: Ensure that we are in the correct source directory.
2401
2402
2403# These are to silence warnings with older Cabal versions
2404
2405# Check whether --with-gcc was given.
2406if test ${with_gcc+y}
2407then :
2408  withval=$with_gcc;
2409fi
2410
2411
2412# Check whether --with-compiler was given.
2413if test ${with_compiler+y}
2414then :
2415  withval=$with_compiler;
2416fi
2417
2418
2419
2420
2421
2422
2423
2424
2425
2426
2427
2428ac_ext=c
2429ac_cpp='$CPP $CPPFLAGS'
2430ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
2431ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
2432ac_compiler_gnu=$ac_cv_c_compiler_gnu
2433if test -n "$ac_tool_prefix"; then
2434  # Extract the first word of "${ac_tool_prefix}gcc", so it can be a program name with args.
2435set dummy ${ac_tool_prefix}gcc; ac_word=$2
2436{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2437printf %s "checking for $ac_word... " >&6; }
2438if test ${ac_cv_prog_CC+y}
2439then :
2440  printf %s "(cached) " >&6
2441else $as_nop
2442  if test -n "$CC"; then
2443  ac_cv_prog_CC="$CC" # Let the user override the test.
2444else
2445as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2446for as_dir in $PATH
2447do
2448  IFS=$as_save_IFS
2449  case $as_dir in #(((
2450    '') as_dir=./ ;;
2451    */) ;;
2452    *) as_dir=$as_dir/ ;;
2453  esac
2454    for ac_exec_ext in '' $ac_executable_extensions; do
2455  if as_fn_executable_p "$as_dir$ac_word$ac_exec_ext"; then
2456    ac_cv_prog_CC="${ac_tool_prefix}gcc"
2457    printf "%s\n" "$as_me:${as_lineno-$LINENO}: found $as_dir$ac_word$ac_exec_ext" >&5
2458    break 2
2459  fi
2460done
2461  done
2462IFS=$as_save_IFS
2463
2464fi
2465fi
2466CC=$ac_cv_prog_CC
2467if test -n "$CC"; then
2468  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
2469printf "%s\n" "$CC" >&6; }
2470else
2471  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
2472printf "%s\n" "no" >&6; }
2473fi
2474
2475
2476fi
2477if test -z "$ac_cv_prog_CC"; then
2478  ac_ct_CC=$CC
2479  # Extract the first word of "gcc", so it can be a program name with args.
2480set dummy gcc; ac_word=$2
2481{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2482printf %s "checking for $ac_word... " >&6; }
2483if test ${ac_cv_prog_ac_ct_CC+y}
2484then :
2485  printf %s "(cached) " >&6
2486else $as_nop
2487  if test -n "$ac_ct_CC"; then
2488  ac_cv_prog_ac_ct_CC="$ac_ct_CC" # Let the user override the test.
2489else
2490as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2491for as_dir in $PATH
2492do
2493  IFS=$as_save_IFS
2494  case $as_dir in #(((
2495    '') as_dir=./ ;;
2496    */) ;;
2497    *) as_dir=$as_dir/ ;;
2498  esac
2499    for ac_exec_ext in '' $ac_executable_extensions; do
2500  if as_fn_executable_p "$as_dir$ac_word$ac_exec_ext"; then
2501    ac_cv_prog_ac_ct_CC="gcc"
2502    printf "%s\n" "$as_me:${as_lineno-$LINENO}: found $as_dir$ac_word$ac_exec_ext" >&5
2503    break 2
2504  fi
2505done
2506  done
2507IFS=$as_save_IFS
2508
2509fi
2510fi
2511ac_ct_CC=$ac_cv_prog_ac_ct_CC
2512if test -n "$ac_ct_CC"; then
2513  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_ct_CC" >&5
2514printf "%s\n" "$ac_ct_CC" >&6; }
2515else
2516  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
2517printf "%s\n" "no" >&6; }
2518fi
2519
2520  if test "x$ac_ct_CC" = x; then
2521    CC=""
2522  else
2523    case $cross_compiling:$ac_tool_warned in
2524yes:)
2525{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: WARNING: using cross tools not prefixed with host triplet" >&5
2526printf "%s\n" "$as_me: WARNING: using cross tools not prefixed with host triplet" >&2;}
2527ac_tool_warned=yes ;;
2528esac
2529    CC=$ac_ct_CC
2530  fi
2531else
2532  CC="$ac_cv_prog_CC"
2533fi
2534
2535if test -z "$CC"; then
2536          if test -n "$ac_tool_prefix"; then
2537    # Extract the first word of "${ac_tool_prefix}cc", so it can be a program name with args.
2538set dummy ${ac_tool_prefix}cc; ac_word=$2
2539{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2540printf %s "checking for $ac_word... " >&6; }
2541if test ${ac_cv_prog_CC+y}
2542then :
2543  printf %s "(cached) " >&6
2544else $as_nop
2545  if test -n "$CC"; then
2546  ac_cv_prog_CC="$CC" # Let the user override the test.
2547else
2548as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2549for as_dir in $PATH
2550do
2551  IFS=$as_save_IFS
2552  case $as_dir in #(((
2553    '') as_dir=./ ;;
2554    */) ;;
2555    *) as_dir=$as_dir/ ;;
2556  esac
2557    for ac_exec_ext in '' $ac_executable_extensions; do
2558  if as_fn_executable_p "$as_dir$ac_word$ac_exec_ext"; then
2559    ac_cv_prog_CC="${ac_tool_prefix}cc"
2560    printf "%s\n" "$as_me:${as_lineno-$LINENO}: found $as_dir$ac_word$ac_exec_ext" >&5
2561    break 2
2562  fi
2563done
2564  done
2565IFS=$as_save_IFS
2566
2567fi
2568fi
2569CC=$ac_cv_prog_CC
2570if test -n "$CC"; then
2571  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
2572printf "%s\n" "$CC" >&6; }
2573else
2574  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
2575printf "%s\n" "no" >&6; }
2576fi
2577
2578
2579  fi
2580fi
2581if test -z "$CC"; then
2582  # Extract the first word of "cc", so it can be a program name with args.
2583set dummy cc; ac_word=$2
2584{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2585printf %s "checking for $ac_word... " >&6; }
2586if test ${ac_cv_prog_CC+y}
2587then :
2588  printf %s "(cached) " >&6
2589else $as_nop
2590  if test -n "$CC"; then
2591  ac_cv_prog_CC="$CC" # Let the user override the test.
2592else
2593  ac_prog_rejected=no
2594as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2595for as_dir in $PATH
2596do
2597  IFS=$as_save_IFS
2598  case $as_dir in #(((
2599    '') as_dir=./ ;;
2600    */) ;;
2601    *) as_dir=$as_dir/ ;;
2602  esac
2603    for ac_exec_ext in '' $ac_executable_extensions; do
2604  if as_fn_executable_p "$as_dir$ac_word$ac_exec_ext"; then
2605    if test "$as_dir$ac_word$ac_exec_ext" = "/usr/ucb/cc"; then
2606       ac_prog_rejected=yes
2607       continue
2608     fi
2609    ac_cv_prog_CC="cc"
2610    printf "%s\n" "$as_me:${as_lineno-$LINENO}: found $as_dir$ac_word$ac_exec_ext" >&5
2611    break 2
2612  fi
2613done
2614  done
2615IFS=$as_save_IFS
2616
2617if test $ac_prog_rejected = yes; then
2618  # We found a bogon in the path, so make sure we never use it.
2619  set dummy $ac_cv_prog_CC
2620  shift
2621  if test $# != 0; then
2622    # We chose a different compiler from the bogus one.
2623    # However, it has the same basename, so the bogon will be chosen
2624    # first if we set CC to just the basename; use the full file name.
2625    shift
2626    ac_cv_prog_CC="$as_dir$ac_word${1+' '}$@"
2627  fi
2628fi
2629fi
2630fi
2631CC=$ac_cv_prog_CC
2632if test -n "$CC"; then
2633  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
2634printf "%s\n" "$CC" >&6; }
2635else
2636  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
2637printf "%s\n" "no" >&6; }
2638fi
2639
2640
2641fi
2642if test -z "$CC"; then
2643  if test -n "$ac_tool_prefix"; then
2644  for ac_prog in cl.exe
2645  do
2646    # Extract the first word of "$ac_tool_prefix$ac_prog", so it can be a program name with args.
2647set dummy $ac_tool_prefix$ac_prog; ac_word=$2
2648{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2649printf %s "checking for $ac_word... " >&6; }
2650if test ${ac_cv_prog_CC+y}
2651then :
2652  printf %s "(cached) " >&6
2653else $as_nop
2654  if test -n "$CC"; then
2655  ac_cv_prog_CC="$CC" # Let the user override the test.
2656else
2657as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2658for as_dir in $PATH
2659do
2660  IFS=$as_save_IFS
2661  case $as_dir in #(((
2662    '') as_dir=./ ;;
2663    */) ;;
2664    *) as_dir=$as_dir/ ;;
2665  esac
2666    for ac_exec_ext in '' $ac_executable_extensions; do
2667  if as_fn_executable_p "$as_dir$ac_word$ac_exec_ext"; then
2668    ac_cv_prog_CC="$ac_tool_prefix$ac_prog"
2669    printf "%s\n" "$as_me:${as_lineno-$LINENO}: found $as_dir$ac_word$ac_exec_ext" >&5
2670    break 2
2671  fi
2672done
2673  done
2674IFS=$as_save_IFS
2675
2676fi
2677fi
2678CC=$ac_cv_prog_CC
2679if test -n "$CC"; then
2680  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
2681printf "%s\n" "$CC" >&6; }
2682else
2683  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
2684printf "%s\n" "no" >&6; }
2685fi
2686
2687
2688    test -n "$CC" && break
2689  done
2690fi
2691if test -z "$CC"; then
2692  ac_ct_CC=$CC
2693  for ac_prog in cl.exe
2694do
2695  # Extract the first word of "$ac_prog", so it can be a program name with args.
2696set dummy $ac_prog; ac_word=$2
2697{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2698printf %s "checking for $ac_word... " >&6; }
2699if test ${ac_cv_prog_ac_ct_CC+y}
2700then :
2701  printf %s "(cached) " >&6
2702else $as_nop
2703  if test -n "$ac_ct_CC"; then
2704  ac_cv_prog_ac_ct_CC="$ac_ct_CC" # Let the user override the test.
2705else
2706as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2707for as_dir in $PATH
2708do
2709  IFS=$as_save_IFS
2710  case $as_dir in #(((
2711    '') as_dir=./ ;;
2712    */) ;;
2713    *) as_dir=$as_dir/ ;;
2714  esac
2715    for ac_exec_ext in '' $ac_executable_extensions; do
2716  if as_fn_executable_p "$as_dir$ac_word$ac_exec_ext"; then
2717    ac_cv_prog_ac_ct_CC="$ac_prog"
2718    printf "%s\n" "$as_me:${as_lineno-$LINENO}: found $as_dir$ac_word$ac_exec_ext" >&5
2719    break 2
2720  fi
2721done
2722  done
2723IFS=$as_save_IFS
2724
2725fi
2726fi
2727ac_ct_CC=$ac_cv_prog_ac_ct_CC
2728if test -n "$ac_ct_CC"; then
2729  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_ct_CC" >&5
2730printf "%s\n" "$ac_ct_CC" >&6; }
2731else
2732  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
2733printf "%s\n" "no" >&6; }
2734fi
2735
2736
2737  test -n "$ac_ct_CC" && break
2738done
2739
2740  if test "x$ac_ct_CC" = x; then
2741    CC=""
2742  else
2743    case $cross_compiling:$ac_tool_warned in
2744yes:)
2745{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: WARNING: using cross tools not prefixed with host triplet" >&5
2746printf "%s\n" "$as_me: WARNING: using cross tools not prefixed with host triplet" >&2;}
2747ac_tool_warned=yes ;;
2748esac
2749    CC=$ac_ct_CC
2750  fi
2751fi
2752
2753fi
2754if test -z "$CC"; then
2755  if test -n "$ac_tool_prefix"; then
2756  # Extract the first word of "${ac_tool_prefix}clang", so it can be a program name with args.
2757set dummy ${ac_tool_prefix}clang; ac_word=$2
2758{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2759printf %s "checking for $ac_word... " >&6; }
2760if test ${ac_cv_prog_CC+y}
2761then :
2762  printf %s "(cached) " >&6
2763else $as_nop
2764  if test -n "$CC"; then
2765  ac_cv_prog_CC="$CC" # Let the user override the test.
2766else
2767as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2768for as_dir in $PATH
2769do
2770  IFS=$as_save_IFS
2771  case $as_dir in #(((
2772    '') as_dir=./ ;;
2773    */) ;;
2774    *) as_dir=$as_dir/ ;;
2775  esac
2776    for ac_exec_ext in '' $ac_executable_extensions; do
2777  if as_fn_executable_p "$as_dir$ac_word$ac_exec_ext"; then
2778    ac_cv_prog_CC="${ac_tool_prefix}clang"
2779    printf "%s\n" "$as_me:${as_lineno-$LINENO}: found $as_dir$ac_word$ac_exec_ext" >&5
2780    break 2
2781  fi
2782done
2783  done
2784IFS=$as_save_IFS
2785
2786fi
2787fi
2788CC=$ac_cv_prog_CC
2789if test -n "$CC"; then
2790  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
2791printf "%s\n" "$CC" >&6; }
2792else
2793  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
2794printf "%s\n" "no" >&6; }
2795fi
2796
2797
2798fi
2799if test -z "$ac_cv_prog_CC"; then
2800  ac_ct_CC=$CC
2801  # Extract the first word of "clang", so it can be a program name with args.
2802set dummy clang; ac_word=$2
2803{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2804printf %s "checking for $ac_word... " >&6; }
2805if test ${ac_cv_prog_ac_ct_CC+y}
2806then :
2807  printf %s "(cached) " >&6
2808else $as_nop
2809  if test -n "$ac_ct_CC"; then
2810  ac_cv_prog_ac_ct_CC="$ac_ct_CC" # Let the user override the test.
2811else
2812as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2813for as_dir in $PATH
2814do
2815  IFS=$as_save_IFS
2816  case $as_dir in #(((
2817    '') as_dir=./ ;;
2818    */) ;;
2819    *) as_dir=$as_dir/ ;;
2820  esac
2821    for ac_exec_ext in '' $ac_executable_extensions; do
2822  if as_fn_executable_p "$as_dir$ac_word$ac_exec_ext"; then
2823    ac_cv_prog_ac_ct_CC="clang"
2824    printf "%s\n" "$as_me:${as_lineno-$LINENO}: found $as_dir$ac_word$ac_exec_ext" >&5
2825    break 2
2826  fi
2827done
2828  done
2829IFS=$as_save_IFS
2830
2831fi
2832fi
2833ac_ct_CC=$ac_cv_prog_ac_ct_CC
2834if test -n "$ac_ct_CC"; then
2835  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_ct_CC" >&5
2836printf "%s\n" "$ac_ct_CC" >&6; }
2837else
2838  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
2839printf "%s\n" "no" >&6; }
2840fi
2841
2842  if test "x$ac_ct_CC" = x; then
2843    CC=""
2844  else
2845    case $cross_compiling:$ac_tool_warned in
2846yes:)
2847{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: WARNING: using cross tools not prefixed with host triplet" >&5
2848printf "%s\n" "$as_me: WARNING: using cross tools not prefixed with host triplet" >&2;}
2849ac_tool_warned=yes ;;
2850esac
2851    CC=$ac_ct_CC
2852  fi
2853else
2854  CC="$ac_cv_prog_CC"
2855fi
2856
2857fi
2858
2859
2860test -z "$CC" && { { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
2861printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
2862as_fn_error $? "no acceptable C compiler found in \$PATH
2863See \`config.log' for more details" "$LINENO" 5; }
2864
2865# Provide some information about the compiler.
2866printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for C compiler version" >&5
2867set X $ac_compile
2868ac_compiler=$2
2869for ac_option in --version -v -V -qversion -version; do
2870  { { ac_try="$ac_compiler $ac_option >&5"
2871case "(($ac_try" in
2872  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
2873  *) ac_try_echo=$ac_try;;
2874esac
2875eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
2876printf "%s\n" "$ac_try_echo"; } >&5
2877  (eval "$ac_compiler $ac_option >&5") 2>conftest.err
2878  ac_status=$?
2879  if test -s conftest.err; then
2880    sed '10a\
2881... rest of stderr output deleted ...
2882         10q' conftest.err >conftest.er1
2883    cat conftest.er1 >&5
2884  fi
2885  rm -f conftest.er1 conftest.err
2886  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
2887  test $ac_status = 0; }
2888done
2889
2890cat confdefs.h - <<_ACEOF >conftest.$ac_ext
2891/* end confdefs.h.  */
2892
2893int
2894main (void)
2895{
2896
2897  ;
2898  return 0;
2899}
2900_ACEOF
2901ac_clean_files_save=$ac_clean_files
2902ac_clean_files="$ac_clean_files a.out a.out.dSYM a.exe b.out"
2903# Try to create an executable without -o first, disregard a.out.
2904# It will help us diagnose broken compilers, and finding out an intuition
2905# of exeext.
2906{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking whether the C compiler works" >&5
2907printf %s "checking whether the C compiler works... " >&6; }
2908ac_link_default=`printf "%s\n" "$ac_link" | sed 's/ -o *conftest[^ ]*//'`
2909
2910# The possible output files:
2911ac_files="a.out conftest.exe conftest a.exe a_out.exe b.out conftest.*"
2912
2913ac_rmfiles=
2914for ac_file in $ac_files
2915do
2916  case $ac_file in
2917    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.map | *.inf | *.dSYM | *.o | *.obj ) ;;
2918    * ) ac_rmfiles="$ac_rmfiles $ac_file";;
2919  esac
2920done
2921rm -f $ac_rmfiles
2922
2923if { { ac_try="$ac_link_default"
2924case "(($ac_try" in
2925  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
2926  *) ac_try_echo=$ac_try;;
2927esac
2928eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
2929printf "%s\n" "$ac_try_echo"; } >&5
2930  (eval "$ac_link_default") 2>&5
2931  ac_status=$?
2932  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
2933  test $ac_status = 0; }
2934then :
2935  # Autoconf-2.13 could set the ac_cv_exeext variable to `no'.
2936# So ignore a value of `no', otherwise this would lead to `EXEEXT = no'
2937# in a Makefile.  We should not override ac_cv_exeext if it was cached,
2938# so that the user can short-circuit this test for compilers unknown to
2939# Autoconf.
2940for ac_file in $ac_files ''
2941do
2942  test -f "$ac_file" || continue
2943  case $ac_file in
2944    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.map | *.inf | *.dSYM | *.o | *.obj )
2945	;;
2946    [ab].out )
2947	# We found the default executable, but exeext='' is most
2948	# certainly right.
2949	break;;
2950    *.* )
2951	if test ${ac_cv_exeext+y} && test "$ac_cv_exeext" != no;
2952	then :; else
2953	   ac_cv_exeext=`expr "$ac_file" : '[^.]*\(\..*\)'`
2954	fi
2955	# We set ac_cv_exeext here because the later test for it is not
2956	# safe: cross compilers may not add the suffix if given an `-o'
2957	# argument, so we may need to know it at that point already.
2958	# Even if this section looks crufty: it has the advantage of
2959	# actually working.
2960	break;;
2961    * )
2962	break;;
2963  esac
2964done
2965test "$ac_cv_exeext" = no && ac_cv_exeext=
2966
2967else $as_nop
2968  ac_file=''
2969fi
2970if test -z "$ac_file"
2971then :
2972  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: no" >&5
2973printf "%s\n" "no" >&6; }
2974printf "%s\n" "$as_me: failed program was:" >&5
2975sed 's/^/| /' conftest.$ac_ext >&5
2976
2977{ { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
2978printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
2979as_fn_error 77 "C compiler cannot create executables
2980See \`config.log' for more details" "$LINENO" 5; }
2981else $as_nop
2982  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: yes" >&5
2983printf "%s\n" "yes" >&6; }
2984fi
2985{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for C compiler default output file name" >&5
2986printf %s "checking for C compiler default output file name... " >&6; }
2987{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_file" >&5
2988printf "%s\n" "$ac_file" >&6; }
2989ac_exeext=$ac_cv_exeext
2990
2991rm -f -r a.out a.out.dSYM a.exe conftest$ac_cv_exeext b.out
2992ac_clean_files=$ac_clean_files_save
2993{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for suffix of executables" >&5
2994printf %s "checking for suffix of executables... " >&6; }
2995if { { ac_try="$ac_link"
2996case "(($ac_try" in
2997  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
2998  *) ac_try_echo=$ac_try;;
2999esac
3000eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
3001printf "%s\n" "$ac_try_echo"; } >&5
3002  (eval "$ac_link") 2>&5
3003  ac_status=$?
3004  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
3005  test $ac_status = 0; }
3006then :
3007  # If both `conftest.exe' and `conftest' are `present' (well, observable)
3008# catch `conftest.exe'.  For instance with Cygwin, `ls conftest' will
3009# work properly (i.e., refer to `conftest.exe'), while it won't with
3010# `rm'.
3011for ac_file in conftest.exe conftest conftest.*; do
3012  test -f "$ac_file" || continue
3013  case $ac_file in
3014    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.map | *.inf | *.dSYM | *.o | *.obj ) ;;
3015    *.* ) ac_cv_exeext=`expr "$ac_file" : '[^.]*\(\..*\)'`
3016	  break;;
3017    * ) break;;
3018  esac
3019done
3020else $as_nop
3021  { { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
3022printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
3023as_fn_error $? "cannot compute suffix of executables: cannot compile and link
3024See \`config.log' for more details" "$LINENO" 5; }
3025fi
3026rm -f conftest conftest$ac_cv_exeext
3027{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_exeext" >&5
3028printf "%s\n" "$ac_cv_exeext" >&6; }
3029
3030rm -f conftest.$ac_ext
3031EXEEXT=$ac_cv_exeext
3032ac_exeext=$EXEEXT
3033cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3034/* end confdefs.h.  */
3035#include <stdio.h>
3036int
3037main (void)
3038{
3039FILE *f = fopen ("conftest.out", "w");
3040 return ferror (f) || fclose (f) != 0;
3041
3042  ;
3043  return 0;
3044}
3045_ACEOF
3046ac_clean_files="$ac_clean_files conftest.out"
3047# Check that the compiler produces executables we can run.  If not, either
3048# the compiler is broken, or we cross compile.
3049{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking whether we are cross compiling" >&5
3050printf %s "checking whether we are cross compiling... " >&6; }
3051if test "$cross_compiling" != yes; then
3052  { { ac_try="$ac_link"
3053case "(($ac_try" in
3054  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
3055  *) ac_try_echo=$ac_try;;
3056esac
3057eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
3058printf "%s\n" "$ac_try_echo"; } >&5
3059  (eval "$ac_link") 2>&5
3060  ac_status=$?
3061  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
3062  test $ac_status = 0; }
3063  if { ac_try='./conftest$ac_cv_exeext'
3064  { { case "(($ac_try" in
3065  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
3066  *) ac_try_echo=$ac_try;;
3067esac
3068eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
3069printf "%s\n" "$ac_try_echo"; } >&5
3070  (eval "$ac_try") 2>&5
3071  ac_status=$?
3072  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
3073  test $ac_status = 0; }; }; then
3074    cross_compiling=no
3075  else
3076    if test "$cross_compiling" = maybe; then
3077	cross_compiling=yes
3078    else
3079	{ { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
3080printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
3081as_fn_error 77 "cannot run C compiled programs.
3082If you meant to cross compile, use \`--host'.
3083See \`config.log' for more details" "$LINENO" 5; }
3084    fi
3085  fi
3086fi
3087{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $cross_compiling" >&5
3088printf "%s\n" "$cross_compiling" >&6; }
3089
3090rm -f conftest.$ac_ext conftest$ac_cv_exeext conftest.out
3091ac_clean_files=$ac_clean_files_save
3092{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for suffix of object files" >&5
3093printf %s "checking for suffix of object files... " >&6; }
3094if test ${ac_cv_objext+y}
3095then :
3096  printf %s "(cached) " >&6
3097else $as_nop
3098  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3099/* end confdefs.h.  */
3100
3101int
3102main (void)
3103{
3104
3105  ;
3106  return 0;
3107}
3108_ACEOF
3109rm -f conftest.o conftest.obj
3110if { { ac_try="$ac_compile"
3111case "(($ac_try" in
3112  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
3113  *) ac_try_echo=$ac_try;;
3114esac
3115eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
3116printf "%s\n" "$ac_try_echo"; } >&5
3117  (eval "$ac_compile") 2>&5
3118  ac_status=$?
3119  printf "%s\n" "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
3120  test $ac_status = 0; }
3121then :
3122  for ac_file in conftest.o conftest.obj conftest.*; do
3123  test -f "$ac_file" || continue;
3124  case $ac_file in
3125    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.map | *.inf | *.dSYM ) ;;
3126    *) ac_cv_objext=`expr "$ac_file" : '.*\.\(.*\)'`
3127       break;;
3128  esac
3129done
3130else $as_nop
3131  printf "%s\n" "$as_me: failed program was:" >&5
3132sed 's/^/| /' conftest.$ac_ext >&5
3133
3134{ { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
3135printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
3136as_fn_error $? "cannot compute suffix of object files: cannot compile
3137See \`config.log' for more details" "$LINENO" 5; }
3138fi
3139rm -f conftest.$ac_cv_objext conftest.$ac_ext
3140fi
3141{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_objext" >&5
3142printf "%s\n" "$ac_cv_objext" >&6; }
3143OBJEXT=$ac_cv_objext
3144ac_objext=$OBJEXT
3145{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking whether the compiler supports GNU C" >&5
3146printf %s "checking whether the compiler supports GNU C... " >&6; }
3147if test ${ac_cv_c_compiler_gnu+y}
3148then :
3149  printf %s "(cached) " >&6
3150else $as_nop
3151  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3152/* end confdefs.h.  */
3153
3154int
3155main (void)
3156{
3157#ifndef __GNUC__
3158       choke me
3159#endif
3160
3161  ;
3162  return 0;
3163}
3164_ACEOF
3165if ac_fn_c_try_compile "$LINENO"
3166then :
3167  ac_compiler_gnu=yes
3168else $as_nop
3169  ac_compiler_gnu=no
3170fi
3171rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3172ac_cv_c_compiler_gnu=$ac_compiler_gnu
3173
3174fi
3175{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_c_compiler_gnu" >&5
3176printf "%s\n" "$ac_cv_c_compiler_gnu" >&6; }
3177ac_compiler_gnu=$ac_cv_c_compiler_gnu
3178
3179if test $ac_compiler_gnu = yes; then
3180  GCC=yes
3181else
3182  GCC=
3183fi
3184ac_test_CFLAGS=${CFLAGS+y}
3185ac_save_CFLAGS=$CFLAGS
3186{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking whether $CC accepts -g" >&5
3187printf %s "checking whether $CC accepts -g... " >&6; }
3188if test ${ac_cv_prog_cc_g+y}
3189then :
3190  printf %s "(cached) " >&6
3191else $as_nop
3192  ac_save_c_werror_flag=$ac_c_werror_flag
3193   ac_c_werror_flag=yes
3194   ac_cv_prog_cc_g=no
3195   CFLAGS="-g"
3196   cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3197/* end confdefs.h.  */
3198
3199int
3200main (void)
3201{
3202
3203  ;
3204  return 0;
3205}
3206_ACEOF
3207if ac_fn_c_try_compile "$LINENO"
3208then :
3209  ac_cv_prog_cc_g=yes
3210else $as_nop
3211  CFLAGS=""
3212      cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3213/* end confdefs.h.  */
3214
3215int
3216main (void)
3217{
3218
3219  ;
3220  return 0;
3221}
3222_ACEOF
3223if ac_fn_c_try_compile "$LINENO"
3224then :
3225
3226else $as_nop
3227  ac_c_werror_flag=$ac_save_c_werror_flag
3228	 CFLAGS="-g"
3229	 cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3230/* end confdefs.h.  */
3231
3232int
3233main (void)
3234{
3235
3236  ;
3237  return 0;
3238}
3239_ACEOF
3240if ac_fn_c_try_compile "$LINENO"
3241then :
3242  ac_cv_prog_cc_g=yes
3243fi
3244rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3245fi
3246rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3247fi
3248rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3249   ac_c_werror_flag=$ac_save_c_werror_flag
3250fi
3251{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_prog_cc_g" >&5
3252printf "%s\n" "$ac_cv_prog_cc_g" >&6; }
3253if test $ac_test_CFLAGS; then
3254  CFLAGS=$ac_save_CFLAGS
3255elif test $ac_cv_prog_cc_g = yes; then
3256  if test "$GCC" = yes; then
3257    CFLAGS="-g -O2"
3258  else
3259    CFLAGS="-g"
3260  fi
3261else
3262  if test "$GCC" = yes; then
3263    CFLAGS="-O2"
3264  else
3265    CFLAGS=
3266  fi
3267fi
3268ac_prog_cc_stdc=no
3269if test x$ac_prog_cc_stdc = xno
3270then :
3271  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $CC option to enable C11 features" >&5
3272printf %s "checking for $CC option to enable C11 features... " >&6; }
3273if test ${ac_cv_prog_cc_c11+y}
3274then :
3275  printf %s "(cached) " >&6
3276else $as_nop
3277  ac_cv_prog_cc_c11=no
3278ac_save_CC=$CC
3279cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3280/* end confdefs.h.  */
3281$ac_c_conftest_c11_program
3282_ACEOF
3283for ac_arg in '' -std=gnu11
3284do
3285  CC="$ac_save_CC $ac_arg"
3286  if ac_fn_c_try_compile "$LINENO"
3287then :
3288  ac_cv_prog_cc_c11=$ac_arg
3289fi
3290rm -f core conftest.err conftest.$ac_objext conftest.beam
3291  test "x$ac_cv_prog_cc_c11" != "xno" && break
3292done
3293rm -f conftest.$ac_ext
3294CC=$ac_save_CC
3295fi
3296
3297if test "x$ac_cv_prog_cc_c11" = xno
3298then :
3299  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: unsupported" >&5
3300printf "%s\n" "unsupported" >&6; }
3301else $as_nop
3302  if test "x$ac_cv_prog_cc_c11" = x
3303then :
3304  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: none needed" >&5
3305printf "%s\n" "none needed" >&6; }
3306else $as_nop
3307  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_prog_cc_c11" >&5
3308printf "%s\n" "$ac_cv_prog_cc_c11" >&6; }
3309     CC="$CC $ac_cv_prog_cc_c11"
3310fi
3311  ac_cv_prog_cc_stdc=$ac_cv_prog_cc_c11
3312  ac_prog_cc_stdc=c11
3313fi
3314fi
3315if test x$ac_prog_cc_stdc = xno
3316then :
3317  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $CC option to enable C99 features" >&5
3318printf %s "checking for $CC option to enable C99 features... " >&6; }
3319if test ${ac_cv_prog_cc_c99+y}
3320then :
3321  printf %s "(cached) " >&6
3322else $as_nop
3323  ac_cv_prog_cc_c99=no
3324ac_save_CC=$CC
3325cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3326/* end confdefs.h.  */
3327$ac_c_conftest_c99_program
3328_ACEOF
3329for ac_arg in '' -std=gnu99 -std=c99 -c99 -qlanglvl=extc1x -qlanglvl=extc99 -AC99 -D_STDC_C99=
3330do
3331  CC="$ac_save_CC $ac_arg"
3332  if ac_fn_c_try_compile "$LINENO"
3333then :
3334  ac_cv_prog_cc_c99=$ac_arg
3335fi
3336rm -f core conftest.err conftest.$ac_objext conftest.beam
3337  test "x$ac_cv_prog_cc_c99" != "xno" && break
3338done
3339rm -f conftest.$ac_ext
3340CC=$ac_save_CC
3341fi
3342
3343if test "x$ac_cv_prog_cc_c99" = xno
3344then :
3345  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: unsupported" >&5
3346printf "%s\n" "unsupported" >&6; }
3347else $as_nop
3348  if test "x$ac_cv_prog_cc_c99" = x
3349then :
3350  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: none needed" >&5
3351printf "%s\n" "none needed" >&6; }
3352else $as_nop
3353  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_prog_cc_c99" >&5
3354printf "%s\n" "$ac_cv_prog_cc_c99" >&6; }
3355     CC="$CC $ac_cv_prog_cc_c99"
3356fi
3357  ac_cv_prog_cc_stdc=$ac_cv_prog_cc_c99
3358  ac_prog_cc_stdc=c99
3359fi
3360fi
3361if test x$ac_prog_cc_stdc = xno
3362then :
3363  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $CC option to enable C89 features" >&5
3364printf %s "checking for $CC option to enable C89 features... " >&6; }
3365if test ${ac_cv_prog_cc_c89+y}
3366then :
3367  printf %s "(cached) " >&6
3368else $as_nop
3369  ac_cv_prog_cc_c89=no
3370ac_save_CC=$CC
3371cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3372/* end confdefs.h.  */
3373$ac_c_conftest_c89_program
3374_ACEOF
3375for ac_arg in '' -qlanglvl=extc89 -qlanglvl=ansi -std -Ae "-Aa -D_HPUX_SOURCE" "-Xc -D__EXTENSIONS__"
3376do
3377  CC="$ac_save_CC $ac_arg"
3378  if ac_fn_c_try_compile "$LINENO"
3379then :
3380  ac_cv_prog_cc_c89=$ac_arg
3381fi
3382rm -f core conftest.err conftest.$ac_objext conftest.beam
3383  test "x$ac_cv_prog_cc_c89" != "xno" && break
3384done
3385rm -f conftest.$ac_ext
3386CC=$ac_save_CC
3387fi
3388
3389if test "x$ac_cv_prog_cc_c89" = xno
3390then :
3391  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: unsupported" >&5
3392printf "%s\n" "unsupported" >&6; }
3393else $as_nop
3394  if test "x$ac_cv_prog_cc_c89" = x
3395then :
3396  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: none needed" >&5
3397printf "%s\n" "none needed" >&6; }
3398else $as_nop
3399  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_prog_cc_c89" >&5
3400printf "%s\n" "$ac_cv_prog_cc_c89" >&6; }
3401     CC="$CC $ac_cv_prog_cc_c89"
3402fi
3403  ac_cv_prog_cc_stdc=$ac_cv_prog_cc_c89
3404  ac_prog_cc_stdc=c89
3405fi
3406fi
3407
3408ac_ext=c
3409ac_cpp='$CPP $CPPFLAGS'
3410ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
3411ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
3412ac_compiler_gnu=$ac_cv_c_compiler_gnu
3413
3414
3415
3416ac_header= ac_cache=
3417for ac_item in $ac_header_c_list
3418do
3419  if test $ac_cache; then
3420    ac_fn_c_check_header_compile "$LINENO" $ac_header ac_cv_header_$ac_cache "$ac_includes_default"
3421    if eval test \"x\$ac_cv_header_$ac_cache\" = xyes; then
3422      printf "%s\n" "#define $ac_item 1" >> confdefs.h
3423    fi
3424    ac_header= ac_cache=
3425  elif test $ac_header; then
3426    ac_cache=$ac_item
3427  else
3428    ac_header=$ac_item
3429  fi
3430done
3431
3432
3433
3434
3435
3436
3437
3438
3439if test $ac_cv_header_stdlib_h = yes && test $ac_cv_header_string_h = yes
3440then :
3441
3442printf "%s\n" "#define STDC_HEADERS 1" >>confdefs.h
3443
3444fi
3445
3446
3447
3448
3449
3450
3451  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking whether it is safe to define __EXTENSIONS__" >&5
3452printf %s "checking whether it is safe to define __EXTENSIONS__... " >&6; }
3453if test ${ac_cv_safe_to_define___extensions__+y}
3454then :
3455  printf %s "(cached) " >&6
3456else $as_nop
3457  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3458/* end confdefs.h.  */
3459
3460#         define __EXTENSIONS__ 1
3461          $ac_includes_default
3462int
3463main (void)
3464{
3465
3466  ;
3467  return 0;
3468}
3469_ACEOF
3470if ac_fn_c_try_compile "$LINENO"
3471then :
3472  ac_cv_safe_to_define___extensions__=yes
3473else $as_nop
3474  ac_cv_safe_to_define___extensions__=no
3475fi
3476rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3477fi
3478{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_safe_to_define___extensions__" >&5
3479printf "%s\n" "$ac_cv_safe_to_define___extensions__" >&6; }
3480
3481  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking whether _XOPEN_SOURCE should be defined" >&5
3482printf %s "checking whether _XOPEN_SOURCE should be defined... " >&6; }
3483if test ${ac_cv_should_define__xopen_source+y}
3484then :
3485  printf %s "(cached) " >&6
3486else $as_nop
3487  ac_cv_should_define__xopen_source=no
3488    if test $ac_cv_header_wchar_h = yes
3489then :
3490  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3491/* end confdefs.h.  */
3492
3493          #include <wchar.h>
3494          mbstate_t x;
3495int
3496main (void)
3497{
3498
3499  ;
3500  return 0;
3501}
3502_ACEOF
3503if ac_fn_c_try_compile "$LINENO"
3504then :
3505
3506else $as_nop
3507  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3508/* end confdefs.h.  */
3509
3510            #define _XOPEN_SOURCE 500
3511            #include <wchar.h>
3512            mbstate_t x;
3513int
3514main (void)
3515{
3516
3517  ;
3518  return 0;
3519}
3520_ACEOF
3521if ac_fn_c_try_compile "$LINENO"
3522then :
3523  ac_cv_should_define__xopen_source=yes
3524fi
3525rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3526fi
3527rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3528fi
3529fi
3530{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_should_define__xopen_source" >&5
3531printf "%s\n" "$ac_cv_should_define__xopen_source" >&6; }
3532
3533  printf "%s\n" "#define _ALL_SOURCE 1" >>confdefs.h
3534
3535  printf "%s\n" "#define _DARWIN_C_SOURCE 1" >>confdefs.h
3536
3537  printf "%s\n" "#define _GNU_SOURCE 1" >>confdefs.h
3538
3539  printf "%s\n" "#define _HPUX_ALT_XOPEN_SOCKET_API 1" >>confdefs.h
3540
3541  printf "%s\n" "#define _NETBSD_SOURCE 1" >>confdefs.h
3542
3543  printf "%s\n" "#define _OPENBSD_SOURCE 1" >>confdefs.h
3544
3545  printf "%s\n" "#define _POSIX_PTHREAD_SEMANTICS 1" >>confdefs.h
3546
3547  printf "%s\n" "#define __STDC_WANT_IEC_60559_ATTRIBS_EXT__ 1" >>confdefs.h
3548
3549  printf "%s\n" "#define __STDC_WANT_IEC_60559_BFP_EXT__ 1" >>confdefs.h
3550
3551  printf "%s\n" "#define __STDC_WANT_IEC_60559_DFP_EXT__ 1" >>confdefs.h
3552
3553  printf "%s\n" "#define __STDC_WANT_IEC_60559_FUNCS_EXT__ 1" >>confdefs.h
3554
3555  printf "%s\n" "#define __STDC_WANT_IEC_60559_TYPES_EXT__ 1" >>confdefs.h
3556
3557  printf "%s\n" "#define __STDC_WANT_LIB_EXT2__ 1" >>confdefs.h
3558
3559  printf "%s\n" "#define __STDC_WANT_MATH_SPEC_FUNCS__ 1" >>confdefs.h
3560
3561  printf "%s\n" "#define _TANDEM_SOURCE 1" >>confdefs.h
3562
3563  if test $ac_cv_header_minix_config_h = yes
3564then :
3565  MINIX=yes
3566    printf "%s\n" "#define _MINIX 1" >>confdefs.h
3567
3568    printf "%s\n" "#define _POSIX_SOURCE 1" >>confdefs.h
3569
3570    printf "%s\n" "#define _POSIX_1_SOURCE 2" >>confdefs.h
3571
3572else $as_nop
3573  MINIX=
3574fi
3575  if test $ac_cv_safe_to_define___extensions__ = yes
3576then :
3577  printf "%s\n" "#define __EXTENSIONS__ 1" >>confdefs.h
3578
3579fi
3580  if test $ac_cv_should_define__xopen_source = yes
3581then :
3582  printf "%s\n" "#define _XOPEN_SOURCE 500" >>confdefs.h
3583
3584fi
3585
3586
3587ac_config_headers="$ac_config_headers lib/include/HsTimeConfig.h"
3588
3589
3590ac_fn_c_check_header_compile "$LINENO" "time.h" "ac_cv_header_time_h" "$ac_includes_default"
3591if test "x$ac_cv_header_time_h" = xyes
3592then :
3593  printf "%s\n" "#define HAVE_TIME_H 1" >>confdefs.h
3594
3595fi
3596
3597ac_fn_c_check_func "$LINENO" "gmtime_r" "ac_cv_func_gmtime_r"
3598if test "x$ac_cv_func_gmtime_r" = xyes
3599then :
3600  printf "%s\n" "#define HAVE_GMTIME_R 1" >>confdefs.h
3601
3602fi
3603ac_fn_c_check_func "$LINENO" "localtime_r" "ac_cv_func_localtime_r"
3604if test "x$ac_cv_func_localtime_r" = xyes
3605then :
3606  printf "%s\n" "#define HAVE_LOCALTIME_R 1" >>confdefs.h
3607
3608fi
3609
3610
3611ac_fn_c_check_func "$LINENO" "clock_gettime" "ac_cv_func_clock_gettime"
3612if test "x$ac_cv_func_clock_gettime" = xyes
3613then :
3614  printf "%s\n" "#define HAVE_CLOCK_GETTIME 1" >>confdefs.h
3615
3616fi
3617
3618
3619{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking whether struct tm is in sys/time.h or time.h" >&5
3620printf %s "checking whether struct tm is in sys/time.h or time.h... " >&6; }
3621if test ${ac_cv_struct_tm+y}
3622then :
3623  printf %s "(cached) " >&6
3624else $as_nop
3625  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3626/* end confdefs.h.  */
3627#include <sys/types.h>
3628#include <time.h>
3629
3630int
3631main (void)
3632{
3633struct tm tm;
3634				     int *p = &tm.tm_sec;
3635				     return !p;
3636  ;
3637  return 0;
3638}
3639_ACEOF
3640if ac_fn_c_try_compile "$LINENO"
3641then :
3642  ac_cv_struct_tm=time.h
3643else $as_nop
3644  ac_cv_struct_tm=sys/time.h
3645fi
3646rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3647fi
3648{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_struct_tm" >&5
3649printf "%s\n" "$ac_cv_struct_tm" >&6; }
3650if test $ac_cv_struct_tm = sys/time.h; then
3651
3652printf "%s\n" "#define TM_IN_SYS_TIME 1" >>confdefs.h
3653
3654fi
3655
3656{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for $CC options needed to detect all undeclared functions" >&5
3657printf %s "checking for $CC options needed to detect all undeclared functions... " >&6; }
3658if test ${ac_cv_c_undeclared_builtin_options+y}
3659then :
3660  printf %s "(cached) " >&6
3661else $as_nop
3662  ac_save_CFLAGS=$CFLAGS
3663   ac_cv_c_undeclared_builtin_options='cannot detect'
3664   for ac_arg in '' -fno-builtin; do
3665     CFLAGS="$ac_save_CFLAGS $ac_arg"
3666     # This test program should *not* compile successfully.
3667     cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3668/* end confdefs.h.  */
3669
3670int
3671main (void)
3672{
3673(void) strchr;
3674  ;
3675  return 0;
3676}
3677_ACEOF
3678if ac_fn_c_try_compile "$LINENO"
3679then :
3680
3681else $as_nop
3682  # This test program should compile successfully.
3683        # No library function is consistently available on
3684        # freestanding implementations, so test against a dummy
3685        # declaration.  Include always-available headers on the
3686        # off chance that they somehow elicit warnings.
3687        cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3688/* end confdefs.h.  */
3689#include <float.h>
3690#include <limits.h>
3691#include <stdarg.h>
3692#include <stddef.h>
3693extern void ac_decl (int, char *);
3694
3695int
3696main (void)
3697{
3698(void) ac_decl (0, (char *) 0);
3699  (void) ac_decl;
3700
3701  ;
3702  return 0;
3703}
3704_ACEOF
3705if ac_fn_c_try_compile "$LINENO"
3706then :
3707  if test x"$ac_arg" = x
3708then :
3709  ac_cv_c_undeclared_builtin_options='none needed'
3710else $as_nop
3711  ac_cv_c_undeclared_builtin_options=$ac_arg
3712fi
3713          break
3714fi
3715rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3716fi
3717rm -f core conftest.err conftest.$ac_objext conftest.beam conftest.$ac_ext
3718    done
3719    CFLAGS=$ac_save_CFLAGS
3720
3721fi
3722{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_c_undeclared_builtin_options" >&5
3723printf "%s\n" "$ac_cv_c_undeclared_builtin_options" >&6; }
3724  case $ac_cv_c_undeclared_builtin_options in #(
3725  'cannot detect') :
3726    { { printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
3727printf "%s\n" "$as_me: error: in \`$ac_pwd':" >&2;}
3728as_fn_error $? "cannot make $CC report undeclared builtins
3729See \`config.log' for more details" "$LINENO" 5; } ;; #(
3730  'none needed') :
3731    ac_c_undeclared_builtin_options='' ;; #(
3732  *) :
3733    ac_c_undeclared_builtin_options=$ac_cv_c_undeclared_builtin_options ;;
3734esac
3735
3736ac_fn_c_check_member "$LINENO" "struct tm" "tm_zone" "ac_cv_member_struct_tm_tm_zone" "#include <sys/types.h>
3737#include <$ac_cv_struct_tm>
3738
3739"
3740if test "x$ac_cv_member_struct_tm_tm_zone" = xyes
3741then :
3742
3743printf "%s\n" "#define HAVE_STRUCT_TM_TM_ZONE 1" >>confdefs.h
3744
3745
3746fi
3747
3748if test "$ac_cv_member_struct_tm_tm_zone" = yes; then
3749
3750printf "%s\n" "#define HAVE_TM_ZONE 1" >>confdefs.h
3751
3752else
3753  ac_fn_check_decl "$LINENO" "tzname" "ac_cv_have_decl_tzname" "#include <time.h>
3754" "$ac_c_undeclared_builtin_options" "CFLAGS"
3755if test "x$ac_cv_have_decl_tzname" = xyes
3756then :
3757  ac_have_decl=1
3758else $as_nop
3759  ac_have_decl=0
3760fi
3761printf "%s\n" "#define HAVE_DECL_TZNAME $ac_have_decl" >>confdefs.h
3762
3763  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: checking for tzname" >&5
3764printf %s "checking for tzname... " >&6; }
3765if test ${ac_cv_var_tzname+y}
3766then :
3767  printf %s "(cached) " >&6
3768else $as_nop
3769  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3770/* end confdefs.h.  */
3771#include <time.h>
3772#if !HAVE_DECL_TZNAME
3773extern char *tzname[];
3774#endif
3775
3776int
3777main (void)
3778{
3779return tzname[0][0];
3780  ;
3781  return 0;
3782}
3783_ACEOF
3784if ac_fn_c_try_link "$LINENO"
3785then :
3786  ac_cv_var_tzname=yes
3787else $as_nop
3788  ac_cv_var_tzname=no
3789fi
3790rm -f core conftest.err conftest.$ac_objext conftest.beam \
3791    conftest$ac_exeext conftest.$ac_ext
3792fi
3793{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: result: $ac_cv_var_tzname" >&5
3794printf "%s\n" "$ac_cv_var_tzname" >&6; }
3795  if test $ac_cv_var_tzname = yes; then
3796
3797printf "%s\n" "#define HAVE_TZNAME 1" >>confdefs.h
3798
3799  fi
3800fi
3801
3802
3803
3804
3805# Obsolete code to be removed.
3806if test $ac_cv_header_sys_time_h = yes; then
3807
3808printf "%s\n" "#define TIME_WITH_SYS_TIME 1" >>confdefs.h
3809
3810fi
3811# End of obsolete code.
3812
3813ac_fn_c_check_header_compile "$LINENO" "sys/time.h" "ac_cv_header_sys_time_h" "$ac_includes_default"
3814if test "x$ac_cv_header_sys_time_h" = xyes
3815then :
3816  printf "%s\n" "#define HAVE_SYS_TIME_H 1" >>confdefs.h
3817
3818fi
3819
3820ac_fn_check_decl "$LINENO" "altzone" "ac_cv_have_decl_altzone" "#if TIME_WITH_SYS_TIME
3821# include <sys/time.h>
3822# include <time.h>
3823#else
3824# if HAVE_SYS_TIME_H
3825#  include <sys/time.h>
3826# else
3827#  include <time.h>
3828# endif
3829#endif
3830" "$ac_c_undeclared_builtin_options" "CFLAGS"
3831if test "x$ac_cv_have_decl_altzone" = xyes
3832then :
3833  ac_have_decl=1
3834else $as_nop
3835  ac_have_decl=0
3836fi
3837printf "%s\n" "#define HAVE_DECL_ALTZONE $ac_have_decl" >>confdefs.h
3838
3839
3840
3841cat >confcache <<\_ACEOF
3842# This file is a shell script that caches the results of configure
3843# tests run on this system so they can be shared between configure
3844# scripts and configure runs, see configure's option --config-cache.
3845# It is not useful on other systems.  If it contains results you don't
3846# want to keep, you may remove or edit it.
3847#
3848# config.status only pays attention to the cache file if you give it
3849# the --recheck option to rerun configure.
3850#
3851# `ac_cv_env_foo' variables (set or unset) will be overridden when
3852# loading this file, other *unset* `ac_cv_foo' will be assigned the
3853# following values.
3854
3855_ACEOF
3856
3857# The following way of writing the cache mishandles newlines in values,
3858# but we know of no workaround that is simple, portable, and efficient.
3859# So, we kill variables containing newlines.
3860# Ultrix sh set writes to stderr and can't be redirected directly,
3861# and sets the high bit in the cache file unless we assign to the vars.
3862(
3863  for ac_var in `(set) 2>&1 | sed -n 's/^\([a-zA-Z_][a-zA-Z0-9_]*\)=.*/\1/p'`; do
3864    eval ac_val=\$$ac_var
3865    case $ac_val in #(
3866    *${as_nl}*)
3867      case $ac_var in #(
3868      *_cv_*) { printf "%s\n" "$as_me:${as_lineno-$LINENO}: WARNING: cache variable $ac_var contains a newline" >&5
3869printf "%s\n" "$as_me: WARNING: cache variable $ac_var contains a newline" >&2;} ;;
3870      esac
3871      case $ac_var in #(
3872      _ | IFS | as_nl) ;; #(
3873      BASH_ARGV | BASH_SOURCE) eval $ac_var= ;; #(
3874      *) { eval $ac_var=; unset $ac_var;} ;;
3875      esac ;;
3876    esac
3877  done
3878
3879  (set) 2>&1 |
3880    case $as_nl`(ac_space=' '; set) 2>&1` in #(
3881    *${as_nl}ac_space=\ *)
3882      # `set' does not quote correctly, so add quotes: double-quote
3883      # substitution turns \\\\ into \\, and sed turns \\ into \.
3884      sed -n \
3885	"s/'/'\\\\''/g;
3886	  s/^\\([_$as_cr_alnum]*_cv_[_$as_cr_alnum]*\\)=\\(.*\\)/\\1='\\2'/p"
3887      ;; #(
3888    *)
3889      # `set' quotes correctly as required by POSIX, so do not add quotes.
3890      sed -n "/^[_$as_cr_alnum]*_cv_[_$as_cr_alnum]*=/p"
3891      ;;
3892    esac |
3893    sort
3894) |
3895  sed '
3896     /^ac_cv_env_/b end
3897     t clear
3898     :clear
3899     s/^\([^=]*\)=\(.*[{}].*\)$/test ${\1+y} || &/
3900     t end
3901     s/^\([^=]*\)=\(.*\)$/\1=${\1=\2}/
3902     :end' >>confcache
3903if diff "$cache_file" confcache >/dev/null 2>&1; then :; else
3904  if test -w "$cache_file"; then
3905    if test "x$cache_file" != "x/dev/null"; then
3906      { printf "%s\n" "$as_me:${as_lineno-$LINENO}: updating cache $cache_file" >&5
3907printf "%s\n" "$as_me: updating cache $cache_file" >&6;}
3908      if test ! -f "$cache_file" || test -h "$cache_file"; then
3909	cat confcache >"$cache_file"
3910      else
3911        case $cache_file in #(
3912        */* | ?:*)
3913	  mv -f confcache "$cache_file"$$ &&
3914	  mv -f "$cache_file"$$ "$cache_file" ;; #(
3915        *)
3916	  mv -f confcache "$cache_file" ;;
3917	esac
3918      fi
3919    fi
3920  else
3921    { printf "%s\n" "$as_me:${as_lineno-$LINENO}: not updating unwritable cache $cache_file" >&5
3922printf "%s\n" "$as_me: not updating unwritable cache $cache_file" >&6;}
3923  fi
3924fi
3925rm -f confcache
3926
3927test "x$prefix" = xNONE && prefix=$ac_default_prefix
3928# Let make expand exec_prefix.
3929test "x$exec_prefix" = xNONE && exec_prefix='${prefix}'
3930
3931DEFS=-DHAVE_CONFIG_H
3932
3933ac_libobjs=
3934ac_ltlibobjs=
3935U=
3936for ac_i in : $LIBOBJS; do test "x$ac_i" = x: && continue
3937  # 1. Remove the extension, and $U if already installed.
3938  ac_script='s/\$U\././;s/\.o$//;s/\.obj$//'
3939  ac_i=`printf "%s\n" "$ac_i" | sed "$ac_script"`
3940  # 2. Prepend LIBOBJDIR.  When used with automake>=1.10 LIBOBJDIR
3941  #    will be set to the directory where LIBOBJS objects are built.
3942  as_fn_append ac_libobjs " \${LIBOBJDIR}$ac_i\$U.$ac_objext"
3943  as_fn_append ac_ltlibobjs " \${LIBOBJDIR}$ac_i"'$U.lo'
3944done
3945LIBOBJS=$ac_libobjs
3946
3947LTLIBOBJS=$ac_ltlibobjs
3948
3949
3950
3951: "${CONFIG_STATUS=./config.status}"
3952ac_write_fail=0
3953ac_clean_files_save=$ac_clean_files
3954ac_clean_files="$ac_clean_files $CONFIG_STATUS"
3955{ printf "%s\n" "$as_me:${as_lineno-$LINENO}: creating $CONFIG_STATUS" >&5
3956printf "%s\n" "$as_me: creating $CONFIG_STATUS" >&6;}
3957as_write_fail=0
3958cat >$CONFIG_STATUS <<_ASEOF || as_write_fail=1
3959#! $SHELL
3960# Generated by $as_me.
3961# Run this file to recreate the current configuration.
3962# Compiler output produced by configure, useful for debugging
3963# configure, is in config.log if it exists.
3964
3965debug=false
3966ac_cs_recheck=false
3967ac_cs_silent=false
3968
3969SHELL=\${CONFIG_SHELL-$SHELL}
3970export SHELL
3971_ASEOF
3972cat >>$CONFIG_STATUS <<\_ASEOF || as_write_fail=1
3973## -------------------- ##
3974## M4sh Initialization. ##
3975## -------------------- ##
3976
3977# Be more Bourne compatible
3978DUALCASE=1; export DUALCASE # for MKS sh
3979as_nop=:
3980if test ${ZSH_VERSION+y} && (emulate sh) >/dev/null 2>&1
3981then :
3982  emulate sh
3983  NULLCMD=:
3984  # Pre-4.2 versions of Zsh do word splitting on ${1+"$@"}, which
3985  # is contrary to our usage.  Disable this feature.
3986  alias -g '${1+"$@"}'='"$@"'
3987  setopt NO_GLOB_SUBST
3988else $as_nop
3989  case `(set -o) 2>/dev/null` in #(
3990  *posix*) :
3991    set -o posix ;; #(
3992  *) :
3993     ;;
3994esac
3995fi
3996
3997
3998
3999# Reset variables that may have inherited troublesome values from
4000# the environment.
4001
4002# IFS needs to be set, to space, tab, and newline, in precisely that order.
4003# (If _AS_PATH_WALK were called with IFS unset, it would have the
4004# side effect of setting IFS to empty, thus disabling word splitting.)
4005# Quoting is to prevent editors from complaining about space-tab.
4006as_nl='
4007'
4008export as_nl
4009IFS=" ""	$as_nl"
4010
4011PS1='$ '
4012PS2='> '
4013PS4='+ '
4014
4015# Ensure predictable behavior from utilities with locale-dependent output.
4016LC_ALL=C
4017export LC_ALL
4018LANGUAGE=C
4019export LANGUAGE
4020
4021# We cannot yet rely on "unset" to work, but we need these variables
4022# to be unset--not just set to an empty or harmless value--now, to
4023# avoid bugs in old shells (e.g. pre-3.0 UWIN ksh).  This construct
4024# also avoids known problems related to "unset" and subshell syntax
4025# in other old shells (e.g. bash 2.01 and pdksh 5.2.14).
4026for as_var in BASH_ENV ENV MAIL MAILPATH CDPATH
4027do eval test \${$as_var+y} \
4028  && ( (unset $as_var) || exit 1) >/dev/null 2>&1 && unset $as_var || :
4029done
4030
4031# Ensure that fds 0, 1, and 2 are open.
4032if (exec 3>&0) 2>/dev/null; then :; else exec 0</dev/null; fi
4033if (exec 3>&1) 2>/dev/null; then :; else exec 1>/dev/null; fi
4034if (exec 3>&2)            ; then :; else exec 2>/dev/null; fi
4035
4036# The user is always right.
4037if ${PATH_SEPARATOR+false} :; then
4038  PATH_SEPARATOR=:
4039  (PATH='/bin;/bin'; FPATH=$PATH; sh -c :) >/dev/null 2>&1 && {
4040    (PATH='/bin:/bin'; FPATH=$PATH; sh -c :) >/dev/null 2>&1 ||
4041      PATH_SEPARATOR=';'
4042  }
4043fi
4044
4045
4046# Find who we are.  Look in the path if we contain no directory separator.
4047as_myself=
4048case $0 in #((
4049  *[\\/]* ) as_myself=$0 ;;
4050  *) as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
4051for as_dir in $PATH
4052do
4053  IFS=$as_save_IFS
4054  case $as_dir in #(((
4055    '') as_dir=./ ;;
4056    */) ;;
4057    *) as_dir=$as_dir/ ;;
4058  esac
4059    test -r "$as_dir$0" && as_myself=$as_dir$0 && break
4060  done
4061IFS=$as_save_IFS
4062
4063     ;;
4064esac
4065# We did not find ourselves, most probably we were run as `sh COMMAND'
4066# in which case we are not to be found in the path.
4067if test "x$as_myself" = x; then
4068  as_myself=$0
4069fi
4070if test ! -f "$as_myself"; then
4071  printf "%s\n" "$as_myself: error: cannot find myself; rerun with an absolute file name" >&2
4072  exit 1
4073fi
4074
4075
4076
4077# as_fn_error STATUS ERROR [LINENO LOG_FD]
4078# ----------------------------------------
4079# Output "`basename $0`: error: ERROR" to stderr. If LINENO and LOG_FD are
4080# provided, also output the error to LOG_FD, referencing LINENO. Then exit the
4081# script with STATUS, using 1 if that was 0.
4082as_fn_error ()
4083{
4084  as_status=$1; test $as_status -eq 0 && as_status=1
4085  if test "$4"; then
4086    as_lineno=${as_lineno-"$3"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
4087    printf "%s\n" "$as_me:${as_lineno-$LINENO}: error: $2" >&$4
4088  fi
4089  printf "%s\n" "$as_me: error: $2" >&2
4090  as_fn_exit $as_status
4091} # as_fn_error
4092
4093
4094
4095# as_fn_set_status STATUS
4096# -----------------------
4097# Set $? to STATUS, without forking.
4098as_fn_set_status ()
4099{
4100  return $1
4101} # as_fn_set_status
4102
4103# as_fn_exit STATUS
4104# -----------------
4105# Exit the shell with STATUS, even in a "trap 0" or "set -e" context.
4106as_fn_exit ()
4107{
4108  set +e
4109  as_fn_set_status $1
4110  exit $1
4111} # as_fn_exit
4112
4113# as_fn_unset VAR
4114# ---------------
4115# Portably unset VAR.
4116as_fn_unset ()
4117{
4118  { eval $1=; unset $1;}
4119}
4120as_unset=as_fn_unset
4121
4122# as_fn_append VAR VALUE
4123# ----------------------
4124# Append the text in VALUE to the end of the definition contained in VAR. Take
4125# advantage of any shell optimizations that allow amortized linear growth over
4126# repeated appends, instead of the typical quadratic growth present in naive
4127# implementations.
4128if (eval "as_var=1; as_var+=2; test x\$as_var = x12") 2>/dev/null
4129then :
4130  eval 'as_fn_append ()
4131  {
4132    eval $1+=\$2
4133  }'
4134else $as_nop
4135  as_fn_append ()
4136  {
4137    eval $1=\$$1\$2
4138  }
4139fi # as_fn_append
4140
4141# as_fn_arith ARG...
4142# ------------------
4143# Perform arithmetic evaluation on the ARGs, and store the result in the
4144# global $as_val. Take advantage of shells that can avoid forks. The arguments
4145# must be portable across $(()) and expr.
4146if (eval "test \$(( 1 + 1 )) = 2") 2>/dev/null
4147then :
4148  eval 'as_fn_arith ()
4149  {
4150    as_val=$(( $* ))
4151  }'
4152else $as_nop
4153  as_fn_arith ()
4154  {
4155    as_val=`expr "$@" || test $? -eq 1`
4156  }
4157fi # as_fn_arith
4158
4159
4160if expr a : '\(a\)' >/dev/null 2>&1 &&
4161   test "X`expr 00001 : '.*\(...\)'`" = X001; then
4162  as_expr=expr
4163else
4164  as_expr=false
4165fi
4166
4167if (basename -- /) >/dev/null 2>&1 && test "X`basename -- / 2>&1`" = "X/"; then
4168  as_basename=basename
4169else
4170  as_basename=false
4171fi
4172
4173if (as_dir=`dirname -- /` && test "X$as_dir" = X/) >/dev/null 2>&1; then
4174  as_dirname=dirname
4175else
4176  as_dirname=false
4177fi
4178
4179as_me=`$as_basename -- "$0" ||
4180$as_expr X/"$0" : '.*/\([^/][^/]*\)/*$' \| \
4181	 X"$0" : 'X\(//\)$' \| \
4182	 X"$0" : 'X\(/\)' \| . 2>/dev/null ||
4183printf "%s\n" X/"$0" |
4184    sed '/^.*\/\([^/][^/]*\)\/*$/{
4185	    s//\1/
4186	    q
4187	  }
4188	  /^X\/\(\/\/\)$/{
4189	    s//\1/
4190	    q
4191	  }
4192	  /^X\/\(\/\).*/{
4193	    s//\1/
4194	    q
4195	  }
4196	  s/.*/./; q'`
4197
4198# Avoid depending upon Character Ranges.
4199as_cr_letters='abcdefghijklmnopqrstuvwxyz'
4200as_cr_LETTERS='ABCDEFGHIJKLMNOPQRSTUVWXYZ'
4201as_cr_Letters=$as_cr_letters$as_cr_LETTERS
4202as_cr_digits='0123456789'
4203as_cr_alnum=$as_cr_Letters$as_cr_digits
4204
4205
4206# Determine whether it's possible to make 'echo' print without a newline.
4207# These variables are no longer used directly by Autoconf, but are AC_SUBSTed
4208# for compatibility with existing Makefiles.
4209ECHO_C= ECHO_N= ECHO_T=
4210case `echo -n x` in #(((((
4211-n*)
4212  case `echo 'xy\c'` in
4213  *c*) ECHO_T='	';;	# ECHO_T is single tab character.
4214  xy)  ECHO_C='\c';;
4215  *)   echo `echo ksh88 bug on AIX 6.1` > /dev/null
4216       ECHO_T='	';;
4217  esac;;
4218*)
4219  ECHO_N='-n';;
4220esac
4221
4222# For backward compatibility with old third-party macros, we provide
4223# the shell variables $as_echo and $as_echo_n.  New code should use
4224# AS_ECHO(["message"]) and AS_ECHO_N(["message"]), respectively.
4225as_echo='printf %s\n'
4226as_echo_n='printf %s'
4227
4228rm -f conf$$ conf$$.exe conf$$.file
4229if test -d conf$$.dir; then
4230  rm -f conf$$.dir/conf$$.file
4231else
4232  rm -f conf$$.dir
4233  mkdir conf$$.dir 2>/dev/null
4234fi
4235if (echo >conf$$.file) 2>/dev/null; then
4236  if ln -s conf$$.file conf$$ 2>/dev/null; then
4237    as_ln_s='ln -s'
4238    # ... but there are two gotchas:
4239    # 1) On MSYS, both `ln -s file dir' and `ln file dir' fail.
4240    # 2) DJGPP < 2.04 has no symlinks; `ln -s' creates a wrapper executable.
4241    # In both cases, we have to default to `cp -pR'.
4242    ln -s conf$$.file conf$$.dir 2>/dev/null && test ! -f conf$$.exe ||
4243      as_ln_s='cp -pR'
4244  elif ln conf$$.file conf$$ 2>/dev/null; then
4245    as_ln_s=ln
4246  else
4247    as_ln_s='cp -pR'
4248  fi
4249else
4250  as_ln_s='cp -pR'
4251fi
4252rm -f conf$$ conf$$.exe conf$$.dir/conf$$.file conf$$.file
4253rmdir conf$$.dir 2>/dev/null
4254
4255
4256# as_fn_mkdir_p
4257# -------------
4258# Create "$as_dir" as a directory, including parents if necessary.
4259as_fn_mkdir_p ()
4260{
4261
4262  case $as_dir in #(
4263  -*) as_dir=./$as_dir;;
4264  esac
4265  test -d "$as_dir" || eval $as_mkdir_p || {
4266    as_dirs=
4267    while :; do
4268      case $as_dir in #(
4269      *\'*) as_qdir=`printf "%s\n" "$as_dir" | sed "s/'/'\\\\\\\\''/g"`;; #'(
4270      *) as_qdir=$as_dir;;
4271      esac
4272      as_dirs="'$as_qdir' $as_dirs"
4273      as_dir=`$as_dirname -- "$as_dir" ||
4274$as_expr X"$as_dir" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
4275	 X"$as_dir" : 'X\(//\)[^/]' \| \
4276	 X"$as_dir" : 'X\(//\)$' \| \
4277	 X"$as_dir" : 'X\(/\)' \| . 2>/dev/null ||
4278printf "%s\n" X"$as_dir" |
4279    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
4280	    s//\1/
4281	    q
4282	  }
4283	  /^X\(\/\/\)[^/].*/{
4284	    s//\1/
4285	    q
4286	  }
4287	  /^X\(\/\/\)$/{
4288	    s//\1/
4289	    q
4290	  }
4291	  /^X\(\/\).*/{
4292	    s//\1/
4293	    q
4294	  }
4295	  s/.*/./; q'`
4296      test -d "$as_dir" && break
4297    done
4298    test -z "$as_dirs" || eval "mkdir $as_dirs"
4299  } || test -d "$as_dir" || as_fn_error $? "cannot create directory $as_dir"
4300
4301
4302} # as_fn_mkdir_p
4303if mkdir -p . 2>/dev/null; then
4304  as_mkdir_p='mkdir -p "$as_dir"'
4305else
4306  test -d ./-p && rmdir ./-p
4307  as_mkdir_p=false
4308fi
4309
4310
4311# as_fn_executable_p FILE
4312# -----------------------
4313# Test if FILE is an executable regular file.
4314as_fn_executable_p ()
4315{
4316  test -f "$1" && test -x "$1"
4317} # as_fn_executable_p
4318as_test_x='test -x'
4319as_executable_p=as_fn_executable_p
4320
4321# Sed expression to map a string onto a valid CPP name.
4322as_tr_cpp="eval sed 'y%*$as_cr_letters%P$as_cr_LETTERS%;s%[^_$as_cr_alnum]%_%g'"
4323
4324# Sed expression to map a string onto a valid variable name.
4325as_tr_sh="eval sed 'y%*+%pp%;s%[^_$as_cr_alnum]%_%g'"
4326
4327
4328exec 6>&1
4329## ----------------------------------- ##
4330## Main body of $CONFIG_STATUS script. ##
4331## ----------------------------------- ##
4332_ASEOF
4333test $as_write_fail = 0 && chmod +x $CONFIG_STATUS || ac_write_fail=1
4334
4335cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
4336# Save the log message, to keep $0 and so on meaningful, and to
4337# report actual input values of CONFIG_FILES etc. instead of their
4338# values after options handling.
4339ac_log="
4340This file was extended by Haskell time package $as_me 1.9.3, which was
4341generated by GNU Autoconf 2.71.  Invocation command line was
4342
4343  CONFIG_FILES    = $CONFIG_FILES
4344  CONFIG_HEADERS  = $CONFIG_HEADERS
4345  CONFIG_LINKS    = $CONFIG_LINKS
4346  CONFIG_COMMANDS = $CONFIG_COMMANDS
4347  $ $0 $@
4348
4349on `(hostname || uname -n) 2>/dev/null | sed 1q`
4350"
4351
4352_ACEOF
4353
4354
4355case $ac_config_headers in *"
4356"*) set x $ac_config_headers; shift; ac_config_headers=$*;;
4357esac
4358
4359
4360cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
4361# Files that config.status was made for.
4362config_headers="$ac_config_headers"
4363
4364_ACEOF
4365
4366cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
4367ac_cs_usage="\
4368\`$as_me' instantiates files and other configuration actions
4369from templates according to the current configuration.  Unless the files
4370and actions are specified as TAGs, all are instantiated by default.
4371
4372Usage: $0 [OPTION]... [TAG]...
4373
4374  -h, --help       print this help, then exit
4375  -V, --version    print version number and configuration settings, then exit
4376      --config     print configuration, then exit
4377  -q, --quiet, --silent
4378                   do not print progress messages
4379  -d, --debug      don't remove temporary files
4380      --recheck    update $as_me by reconfiguring in the same conditions
4381      --header=FILE[:TEMPLATE]
4382                   instantiate the configuration header FILE
4383
4384Configuration headers:
4385$config_headers
4386
4387Report bugs to <ashley@semantic.org>."
4388
4389_ACEOF
4390ac_cs_config=`printf "%s\n" "$ac_configure_args" | sed "$ac_safe_unquote"`
4391ac_cs_config_escaped=`printf "%s\n" "$ac_cs_config" | sed "s/^ //; s/'/'\\\\\\\\''/g"`
4392cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
4393ac_cs_config='$ac_cs_config_escaped'
4394ac_cs_version="\\
4395Haskell time package config.status 1.9.3
4396configured by $0, generated by GNU Autoconf 2.71,
4397  with options \\"\$ac_cs_config\\"
4398
4399Copyright (C) 2021 Free Software Foundation, Inc.
4400This config.status script is free software; the Free Software Foundation
4401gives unlimited permission to copy, distribute and modify it."
4402
4403ac_pwd='$ac_pwd'
4404srcdir='$srcdir'
4405test -n "\$AWK" || AWK=awk
4406_ACEOF
4407
4408cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
4409# The default lists apply if the user does not specify any file.
4410ac_need_defaults=:
4411while test $# != 0
4412do
4413  case $1 in
4414  --*=?*)
4415    ac_option=`expr "X$1" : 'X\([^=]*\)='`
4416    ac_optarg=`expr "X$1" : 'X[^=]*=\(.*\)'`
4417    ac_shift=:
4418    ;;
4419  --*=)
4420    ac_option=`expr "X$1" : 'X\([^=]*\)='`
4421    ac_optarg=
4422    ac_shift=:
4423    ;;
4424  *)
4425    ac_option=$1
4426    ac_optarg=$2
4427    ac_shift=shift
4428    ;;
4429  esac
4430
4431  case $ac_option in
4432  # Handling of the options.
4433  -recheck | --recheck | --rechec | --reche | --rech | --rec | --re | --r)
4434    ac_cs_recheck=: ;;
4435  --version | --versio | --versi | --vers | --ver | --ve | --v | -V )
4436    printf "%s\n" "$ac_cs_version"; exit ;;
4437  --config | --confi | --conf | --con | --co | --c )
4438    printf "%s\n" "$ac_cs_config"; exit ;;
4439  --debug | --debu | --deb | --de | --d | -d )
4440    debug=: ;;
4441  --header | --heade | --head | --hea )
4442    $ac_shift
4443    case $ac_optarg in
4444    *\'*) ac_optarg=`printf "%s\n" "$ac_optarg" | sed "s/'/'\\\\\\\\''/g"` ;;
4445    esac
4446    as_fn_append CONFIG_HEADERS " '$ac_optarg'"
4447    ac_need_defaults=false;;
4448  --he | --h)
4449    # Conflict between --help and --header
4450    as_fn_error $? "ambiguous option: \`$1'
4451Try \`$0 --help' for more information.";;
4452  --help | --hel | -h )
4453    printf "%s\n" "$ac_cs_usage"; exit ;;
4454  -q | -quiet | --quiet | --quie | --qui | --qu | --q \
4455  | -silent | --silent | --silen | --sile | --sil | --si | --s)
4456    ac_cs_silent=: ;;
4457
4458  # This is an error.
4459  -*) as_fn_error $? "unrecognized option: \`$1'
4460Try \`$0 --help' for more information." ;;
4461
4462  *) as_fn_append ac_config_targets " $1"
4463     ac_need_defaults=false ;;
4464
4465  esac
4466  shift
4467done
4468
4469ac_configure_extra_args=
4470
4471if $ac_cs_silent; then
4472  exec 6>/dev/null
4473  ac_configure_extra_args="$ac_configure_extra_args --silent"
4474fi
4475
4476_ACEOF
4477cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
4478if \$ac_cs_recheck; then
4479  set X $SHELL '$0' $ac_configure_args \$ac_configure_extra_args --no-create --no-recursion
4480  shift
4481  \printf "%s\n" "running CONFIG_SHELL=$SHELL \$*" >&6
4482  CONFIG_SHELL='$SHELL'
4483  export CONFIG_SHELL
4484  exec "\$@"
4485fi
4486
4487_ACEOF
4488cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
4489exec 5>>config.log
4490{
4491  echo
4492  sed 'h;s/./-/g;s/^.../## /;s/...$/ ##/;p;x;p;x' <<_ASBOX
4493## Running $as_me. ##
4494_ASBOX
4495  printf "%s\n" "$ac_log"
4496} >&5
4497
4498_ACEOF
4499cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
4500_ACEOF
4501
4502cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
4503
4504# Handling of arguments.
4505for ac_config_target in $ac_config_targets
4506do
4507  case $ac_config_target in
4508    "lib/include/HsTimeConfig.h") CONFIG_HEADERS="$CONFIG_HEADERS lib/include/HsTimeConfig.h" ;;
4509
4510  *) as_fn_error $? "invalid argument: \`$ac_config_target'" "$LINENO" 5;;
4511  esac
4512done
4513
4514
4515# If the user did not use the arguments to specify the items to instantiate,
4516# then the envvar interface is used.  Set only those that are not.
4517# We use the long form for the default assignment because of an extremely
4518# bizarre bug on SunOS 4.1.3.
4519if $ac_need_defaults; then
4520  test ${CONFIG_HEADERS+y} || CONFIG_HEADERS=$config_headers
4521fi
4522
4523# Have a temporary directory for convenience.  Make it in the build tree
4524# simply because there is no reason against having it here, and in addition,
4525# creating and moving files from /tmp can sometimes cause problems.
4526# Hook for its removal unless debugging.
4527# Note that there is a small window in which the directory will not be cleaned:
4528# after its creation but before its name has been assigned to `$tmp'.
4529$debug ||
4530{
4531  tmp= ac_tmp=
4532  trap 'exit_status=$?
4533  : "${ac_tmp:=$tmp}"
4534  { test ! -d "$ac_tmp" || rm -fr "$ac_tmp"; } && exit $exit_status
4535' 0
4536  trap 'as_fn_exit 1' 1 2 13 15
4537}
4538# Create a (secure) tmp directory for tmp files.
4539
4540{
4541  tmp=`(umask 077 && mktemp -d "./confXXXXXX") 2>/dev/null` &&
4542  test -d "$tmp"
4543}  ||
4544{
4545  tmp=./conf$$-$RANDOM
4546  (umask 077 && mkdir "$tmp")
4547} || as_fn_error $? "cannot create a temporary directory in ." "$LINENO" 5
4548ac_tmp=$tmp
4549
4550# Set up the scripts for CONFIG_HEADERS section.
4551# No need to generate them if there are no CONFIG_HEADERS.
4552# This happens for instance with `./config.status Makefile'.
4553if test -n "$CONFIG_HEADERS"; then
4554cat >"$ac_tmp/defines.awk" <<\_ACAWK ||
4555BEGIN {
4556_ACEOF
4557
4558# Transform confdefs.h into an awk script `defines.awk', embedded as
4559# here-document in config.status, that substitutes the proper values into
4560# config.h.in to produce config.h.
4561
4562# Create a delimiter string that does not exist in confdefs.h, to ease
4563# handling of long lines.
4564ac_delim='%!_!# '
4565for ac_last_try in false false :; do
4566  ac_tt=`sed -n "/$ac_delim/p" confdefs.h`
4567  if test -z "$ac_tt"; then
4568    break
4569  elif $ac_last_try; then
4570    as_fn_error $? "could not make $CONFIG_HEADERS" "$LINENO" 5
4571  else
4572    ac_delim="$ac_delim!$ac_delim _$ac_delim!! "
4573  fi
4574done
4575
4576# For the awk script, D is an array of macro values keyed by name,
4577# likewise P contains macro parameters if any.  Preserve backslash
4578# newline sequences.
4579
4580ac_word_re=[_$as_cr_Letters][_$as_cr_alnum]*
4581sed -n '
4582s/.\{148\}/&'"$ac_delim"'/g
4583t rset
4584:rset
4585s/^[	 ]*#[	 ]*define[	 ][	 ]*/ /
4586t def
4587d
4588:def
4589s/\\$//
4590t bsnl
4591s/["\\]/\\&/g
4592s/^ \('"$ac_word_re"'\)\(([^()]*)\)[	 ]*\(.*\)/P["\1"]="\2"\
4593D["\1"]=" \3"/p
4594s/^ \('"$ac_word_re"'\)[	 ]*\(.*\)/D["\1"]=" \2"/p
4595d
4596:bsnl
4597s/["\\]/\\&/g
4598s/^ \('"$ac_word_re"'\)\(([^()]*)\)[	 ]*\(.*\)/P["\1"]="\2"\
4599D["\1"]=" \3\\\\\\n"\\/p
4600t cont
4601s/^ \('"$ac_word_re"'\)[	 ]*\(.*\)/D["\1"]=" \2\\\\\\n"\\/p
4602t cont
4603d
4604:cont
4605n
4606s/.\{148\}/&'"$ac_delim"'/g
4607t clear
4608:clear
4609s/\\$//
4610t bsnlc
4611s/["\\]/\\&/g; s/^/"/; s/$/"/p
4612d
4613:bsnlc
4614s/["\\]/\\&/g; s/^/"/; s/$/\\\\\\n"\\/p
4615b cont
4616' <confdefs.h | sed '
4617s/'"$ac_delim"'/"\\\
4618"/g' >>$CONFIG_STATUS || ac_write_fail=1
4619
4620cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
4621  for (key in D) D_is_set[key] = 1
4622  FS = ""
4623}
4624/^[\t ]*#[\t ]*(define|undef)[\t ]+$ac_word_re([\t (]|\$)/ {
4625  line = \$ 0
4626  split(line, arg, " ")
4627  if (arg[1] == "#") {
4628    defundef = arg[2]
4629    mac1 = arg[3]
4630  } else {
4631    defundef = substr(arg[1], 2)
4632    mac1 = arg[2]
4633  }
4634  split(mac1, mac2, "(") #)
4635  macro = mac2[1]
4636  prefix = substr(line, 1, index(line, defundef) - 1)
4637  if (D_is_set[macro]) {
4638    # Preserve the white space surrounding the "#".
4639    print prefix "define", macro P[macro] D[macro]
4640    next
4641  } else {
4642    # Replace #undef with comments.  This is necessary, for example,
4643    # in the case of _POSIX_SOURCE, which is predefined and required
4644    # on some systems where configure will not decide to define it.
4645    if (defundef == "undef") {
4646      print "/*", prefix defundef, macro, "*/"
4647      next
4648    }
4649  }
4650}
4651{ print }
4652_ACAWK
4653_ACEOF
4654cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
4655  as_fn_error $? "could not setup config headers machinery" "$LINENO" 5
4656fi # test -n "$CONFIG_HEADERS"
4657
4658
4659eval set X "    :H $CONFIG_HEADERS    "
4660shift
4661for ac_tag
4662do
4663  case $ac_tag in
4664  :[FHLC]) ac_mode=$ac_tag; continue;;
4665  esac
4666  case $ac_mode$ac_tag in
4667  :[FHL]*:*);;
4668  :L* | :C*:*) as_fn_error $? "invalid tag \`$ac_tag'" "$LINENO" 5;;
4669  :[FH]-) ac_tag=-:-;;
4670  :[FH]*) ac_tag=$ac_tag:$ac_tag.in;;
4671  esac
4672  ac_save_IFS=$IFS
4673  IFS=:
4674  set x $ac_tag
4675  IFS=$ac_save_IFS
4676  shift
4677  ac_file=$1
4678  shift
4679
4680  case $ac_mode in
4681  :L) ac_source=$1;;
4682  :[FH])
4683    ac_file_inputs=
4684    for ac_f
4685    do
4686      case $ac_f in
4687      -) ac_f="$ac_tmp/stdin";;
4688      *) # Look for the file first in the build tree, then in the source tree
4689	 # (if the path is not absolute).  The absolute path cannot be DOS-style,
4690	 # because $ac_f cannot contain `:'.
4691	 test -f "$ac_f" ||
4692	   case $ac_f in
4693	   [\\/$]*) false;;
4694	   *) test -f "$srcdir/$ac_f" && ac_f="$srcdir/$ac_f";;
4695	   esac ||
4696	   as_fn_error 1 "cannot find input file: \`$ac_f'" "$LINENO" 5;;
4697      esac
4698      case $ac_f in *\'*) ac_f=`printf "%s\n" "$ac_f" | sed "s/'/'\\\\\\\\''/g"`;; esac
4699      as_fn_append ac_file_inputs " '$ac_f'"
4700    done
4701
4702    # Let's still pretend it is `configure' which instantiates (i.e., don't
4703    # use $as_me), people would be surprised to read:
4704    #    /* config.h.  Generated by config.status.  */
4705    configure_input='Generated from '`
4706	  printf "%s\n" "$*" | sed 's|^[^:]*/||;s|:[^:]*/|, |g'
4707	`' by configure.'
4708    if test x"$ac_file" != x-; then
4709      configure_input="$ac_file.  $configure_input"
4710      { printf "%s\n" "$as_me:${as_lineno-$LINENO}: creating $ac_file" >&5
4711printf "%s\n" "$as_me: creating $ac_file" >&6;}
4712    fi
4713    # Neutralize special characters interpreted by sed in replacement strings.
4714    case $configure_input in #(
4715    *\&* | *\|* | *\\* )
4716       ac_sed_conf_input=`printf "%s\n" "$configure_input" |
4717       sed 's/[\\\\&|]/\\\\&/g'`;; #(
4718    *) ac_sed_conf_input=$configure_input;;
4719    esac
4720
4721    case $ac_tag in
4722    *:-:* | *:-) cat >"$ac_tmp/stdin" \
4723      || as_fn_error $? "could not create $ac_file" "$LINENO" 5 ;;
4724    esac
4725    ;;
4726  esac
4727
4728  ac_dir=`$as_dirname -- "$ac_file" ||
4729$as_expr X"$ac_file" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
4730	 X"$ac_file" : 'X\(//\)[^/]' \| \
4731	 X"$ac_file" : 'X\(//\)$' \| \
4732	 X"$ac_file" : 'X\(/\)' \| . 2>/dev/null ||
4733printf "%s\n" X"$ac_file" |
4734    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
4735	    s//\1/
4736	    q
4737	  }
4738	  /^X\(\/\/\)[^/].*/{
4739	    s//\1/
4740	    q
4741	  }
4742	  /^X\(\/\/\)$/{
4743	    s//\1/
4744	    q
4745	  }
4746	  /^X\(\/\).*/{
4747	    s//\1/
4748	    q
4749	  }
4750	  s/.*/./; q'`
4751  as_dir="$ac_dir"; as_fn_mkdir_p
4752  ac_builddir=.
4753
4754case "$ac_dir" in
4755.) ac_dir_suffix= ac_top_builddir_sub=. ac_top_build_prefix= ;;
4756*)
4757  ac_dir_suffix=/`printf "%s\n" "$ac_dir" | sed 's|^\.[\\/]||'`
4758  # A ".." for each directory in $ac_dir_suffix.
4759  ac_top_builddir_sub=`printf "%s\n" "$ac_dir_suffix" | sed 's|/[^\\/]*|/..|g;s|/||'`
4760  case $ac_top_builddir_sub in
4761  "") ac_top_builddir_sub=. ac_top_build_prefix= ;;
4762  *)  ac_top_build_prefix=$ac_top_builddir_sub/ ;;
4763  esac ;;
4764esac
4765ac_abs_top_builddir=$ac_pwd
4766ac_abs_builddir=$ac_pwd$ac_dir_suffix
4767# for backward compatibility:
4768ac_top_builddir=$ac_top_build_prefix
4769
4770case $srcdir in
4771  .)  # We are building in place.
4772    ac_srcdir=.
4773    ac_top_srcdir=$ac_top_builddir_sub
4774    ac_abs_top_srcdir=$ac_pwd ;;
4775  [\\/]* | ?:[\\/]* )  # Absolute name.
4776    ac_srcdir=$srcdir$ac_dir_suffix;
4777    ac_top_srcdir=$srcdir
4778    ac_abs_top_srcdir=$srcdir ;;
4779  *) # Relative name.
4780    ac_srcdir=$ac_top_build_prefix$srcdir$ac_dir_suffix
4781    ac_top_srcdir=$ac_top_build_prefix$srcdir
4782    ac_abs_top_srcdir=$ac_pwd/$srcdir ;;
4783esac
4784ac_abs_srcdir=$ac_abs_top_srcdir$ac_dir_suffix
4785
4786
4787  case $ac_mode in
4788
4789  :H)
4790  #
4791  # CONFIG_HEADER
4792  #
4793  if test x"$ac_file" != x-; then
4794    {
4795      printf "%s\n" "/* $configure_input  */" >&1 \
4796      && eval '$AWK -f "$ac_tmp/defines.awk"' "$ac_file_inputs"
4797    } >"$ac_tmp/config.h" \
4798      || as_fn_error $? "could not create $ac_file" "$LINENO" 5
4799    if diff "$ac_file" "$ac_tmp/config.h" >/dev/null 2>&1; then
4800      { printf "%s\n" "$as_me:${as_lineno-$LINENO}: $ac_file is unchanged" >&5
4801printf "%s\n" "$as_me: $ac_file is unchanged" >&6;}
4802    else
4803      rm -f "$ac_file"
4804      mv "$ac_tmp/config.h" "$ac_file" \
4805	|| as_fn_error $? "could not create $ac_file" "$LINENO" 5
4806    fi
4807  else
4808    printf "%s\n" "/* $configure_input  */" >&1 \
4809      && eval '$AWK -f "$ac_tmp/defines.awk"' "$ac_file_inputs" \
4810      || as_fn_error $? "could not create -" "$LINENO" 5
4811  fi
4812 ;;
4813
4814
4815  esac
4816
4817done # for ac_tag
4818
4819
4820as_fn_exit 0
4821_ACEOF
4822ac_clean_files=$ac_clean_files_save
4823
4824test $ac_write_fail = 0 ||
4825  as_fn_error $? "write failure creating $CONFIG_STATUS" "$LINENO" 5
4826
4827
4828# configure is writing to config.log, and then calls config.status.
4829# config.status does its own redirection, appending to config.log.
4830# Unfortunately, on DOS this fails, as config.log is still kept open
4831# by configure, so config.status won't be able to write to it; its
4832# output is simply discarded.  So we exec the FD to /dev/null,
4833# effectively closing config.log, so it can be properly (re)opened and
4834# appended to by config.status.  When coming back to configure, we
4835# need to make the FD available again.
4836if test "$no_create" != yes; then
4837  ac_cs_success=:
4838  ac_config_status_args=
4839  test "$silent" = yes &&
4840    ac_config_status_args="$ac_config_status_args --quiet"
4841  exec 5>/dev/null
4842  $SHELL $CONFIG_STATUS $ac_config_status_args || ac_cs_success=false
4843  exec 5>>config.log
4844  # Use ||, not &&, to avoid exiting from the if with $? = 1, which
4845  # would make configure fail if this is the last instruction.
4846  $ac_cs_success || as_fn_exit 1
4847fi
4848if test -n "$ac_unrecognized_opts" && test "$enable_option_checking" != no; then
4849  { printf "%s\n" "$as_me:${as_lineno-$LINENO}: WARNING: unrecognized options: $ac_unrecognized_opts" >&5
4850printf "%s\n" "$as_me: WARNING: unrecognized options: $ac_unrecognized_opts" >&2;}
4851fi
4852
4853
4854