1#! /bin/sh
2# Guess values for system-dependent variables and create Makefiles.
3# Generated by GNU Autoconf 2.69.
4#
5#
6# Copyright (C) 1992-1996, 1998-2012 Free Software Foundation, Inc.
7#
8#
9# This configure script is free software; the Free Software Foundation
10# gives unlimited permission to copy, distribute and modify it.
11## -------------------- ##
12## M4sh Initialization. ##
13## -------------------- ##
14
15# Be more Bourne compatible
16DUALCASE=1; export DUALCASE # for MKS sh
17if test -n "${ZSH_VERSION+set}" && (emulate sh) >/dev/null 2>&1; then :
18  emulate sh
19  NULLCMD=:
20  # Pre-4.2 versions of Zsh do word splitting on ${1+"$@"}, which
21  # is contrary to our usage.  Disable this feature.
22  alias -g '${1+"$@"}'='"$@"'
23  setopt NO_GLOB_SUBST
24else
25  case `(set -o) 2>/dev/null` in #(
26  *posix*) :
27    set -o posix ;; #(
28  *) :
29     ;;
30esac
31fi
32
33
34as_nl='
35'
36export as_nl
37# Printing a long string crashes Solaris 7 /usr/bin/printf.
38as_echo='\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\'
39as_echo=$as_echo$as_echo$as_echo$as_echo$as_echo
40as_echo=$as_echo$as_echo$as_echo$as_echo$as_echo$as_echo
41# Prefer a ksh shell builtin over an external printf program on Solaris,
42# but without wasting forks for bash or zsh.
43if test -z "$BASH_VERSION$ZSH_VERSION" \
44    && (test "X`print -r -- $as_echo`" = "X$as_echo") 2>/dev/null; then
45  as_echo='print -r --'
46  as_echo_n='print -rn --'
47elif (test "X`printf %s $as_echo`" = "X$as_echo") 2>/dev/null; then
48  as_echo='printf %s\n'
49  as_echo_n='printf %s'
50else
51  if test "X`(/usr/ucb/echo -n -n $as_echo) 2>/dev/null`" = "X-n $as_echo"; then
52    as_echo_body='eval /usr/ucb/echo -n "$1$as_nl"'
53    as_echo_n='/usr/ucb/echo -n'
54  else
55    as_echo_body='eval expr "X$1" : "X\\(.*\\)"'
56    as_echo_n_body='eval
57      arg=$1;
58      case $arg in #(
59      *"$as_nl"*)
60	expr "X$arg" : "X\\(.*\\)$as_nl";
61	arg=`expr "X$arg" : ".*$as_nl\\(.*\\)"`;;
62      esac;
63      expr "X$arg" : "X\\(.*\\)" | tr -d "$as_nl"
64    '
65    export as_echo_n_body
66    as_echo_n='sh -c $as_echo_n_body as_echo'
67  fi
68  export as_echo_body
69  as_echo='sh -c $as_echo_body as_echo'
70fi
71
72# The user is always right.
73if test "${PATH_SEPARATOR+set}" != set; then
74  PATH_SEPARATOR=:
75  (PATH='/bin;/bin'; FPATH=$PATH; sh -c :) >/dev/null 2>&1 && {
76    (PATH='/bin:/bin'; FPATH=$PATH; sh -c :) >/dev/null 2>&1 ||
77      PATH_SEPARATOR=';'
78  }
79fi
80
81
82# IFS
83# We need space, tab and new line, in precisely that order.  Quoting is
84# there to prevent editors from complaining about space-tab.
85# (If _AS_PATH_WALK were called with IFS unset, it would disable word
86# splitting by setting IFS to empty value.)
87IFS=" ""	$as_nl"
88
89# Find who we are.  Look in the path if we contain no directory separator.
90as_myself=
91case $0 in #((
92  *[\\/]* ) as_myself=$0 ;;
93  *) as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
94for as_dir in $PATH
95do
96  IFS=$as_save_IFS
97  test -z "$as_dir" && as_dir=.
98    test -r "$as_dir/$0" && as_myself=$as_dir/$0 && break
99  done
100IFS=$as_save_IFS
101
102     ;;
103esac
104# We did not find ourselves, most probably we were run as `sh COMMAND'
105# in which case we are not to be found in the path.
106if test "x$as_myself" = x; then
107  as_myself=$0
108fi
109if test ! -f "$as_myself"; then
110  $as_echo "$as_myself: error: cannot find myself; rerun with an absolute file name" >&2
111  exit 1
112fi
113
114# Unset variables that we do not need and which cause bugs (e.g. in
115# pre-3.0 UWIN ksh).  But do not cause bugs in bash 2.01; the "|| exit 1"
116# suppresses any "Segmentation fault" message there.  '((' could
117# trigger a bug in pdksh 5.2.14.
118for as_var in BASH_ENV ENV MAIL MAILPATH
119do eval test x\${$as_var+set} = xset \
120  && ( (unset $as_var) || exit 1) >/dev/null 2>&1 && unset $as_var || :
121done
122PS1='$ '
123PS2='> '
124PS4='+ '
125
126# NLS nuisances.
127LC_ALL=C
128export LC_ALL
129LANGUAGE=C
130export LANGUAGE
131
132# CDPATH.
133(unset CDPATH) >/dev/null 2>&1 && unset CDPATH
134
135# Use a proper internal environment variable to ensure we don't fall
136  # into an infinite loop, continuously re-executing ourselves.
137  if test x"${_as_can_reexec}" != xno && test "x$CONFIG_SHELL" != x; then
138    _as_can_reexec=no; export _as_can_reexec;
139    # We cannot yet assume a decent shell, so we have to provide a
140# neutralization value for shells without unset; and this also
141# works around shells that cannot unset nonexistent variables.
142# Preserve -v and -x to the replacement shell.
143BASH_ENV=/dev/null
144ENV=/dev/null
145(unset BASH_ENV) >/dev/null 2>&1 && unset BASH_ENV ENV
146case $- in # ((((
147  *v*x* | *x*v* ) as_opts=-vx ;;
148  *v* ) as_opts=-v ;;
149  *x* ) as_opts=-x ;;
150  * ) as_opts= ;;
151esac
152exec $CONFIG_SHELL $as_opts "$as_myself" ${1+"$@"}
153# Admittedly, this is quite paranoid, since all the known shells bail
154# out after a failed `exec'.
155$as_echo "$0: could not re-execute with $CONFIG_SHELL" >&2
156as_fn_exit 255
157  fi
158  # We don't want this to propagate to other subprocesses.
159          { _as_can_reexec=; unset _as_can_reexec;}
160if test "x$CONFIG_SHELL" = x; then
161  as_bourne_compatible="if test -n \"\${ZSH_VERSION+set}\" && (emulate sh) >/dev/null 2>&1; then :
162  emulate sh
163  NULLCMD=:
164  # Pre-4.2 versions of Zsh do word splitting on \${1+\"\$@\"}, which
165  # is contrary to our usage.  Disable this feature.
166  alias -g '\${1+\"\$@\"}'='\"\$@\"'
167  setopt NO_GLOB_SUBST
168else
169  case \`(set -o) 2>/dev/null\` in #(
170  *posix*) :
171    set -o posix ;; #(
172  *) :
173     ;;
174esac
175fi
176"
177  as_required="as_fn_return () { (exit \$1); }
178as_fn_success () { as_fn_return 0; }
179as_fn_failure () { as_fn_return 1; }
180as_fn_ret_success () { return 0; }
181as_fn_ret_failure () { return 1; }
182
183exitcode=0
184as_fn_success || { exitcode=1; echo as_fn_success failed.; }
185as_fn_failure && { exitcode=1; echo as_fn_failure succeeded.; }
186as_fn_ret_success || { exitcode=1; echo as_fn_ret_success failed.; }
187as_fn_ret_failure && { exitcode=1; echo as_fn_ret_failure succeeded.; }
188if ( set x; as_fn_ret_success y && test x = \"\$1\" ); then :
189
190else
191  exitcode=1; echo positional parameters were not saved.
192fi
193test x\$exitcode = x0 || exit 1
194test -x / || exit 1"
195  as_suggested="  as_lineno_1=";as_suggested=$as_suggested$LINENO;as_suggested=$as_suggested" as_lineno_1a=\$LINENO
196  as_lineno_2=";as_suggested=$as_suggested$LINENO;as_suggested=$as_suggested" as_lineno_2a=\$LINENO
197  eval 'test \"x\$as_lineno_1'\$as_run'\" != \"x\$as_lineno_2'\$as_run'\" &&
198  test \"x\`expr \$as_lineno_1'\$as_run' + 1\`\" = \"x\$as_lineno_2'\$as_run'\"' || exit 1
199test \$(( 1 + 1 )) = 2 || exit 1"
200  if (eval "$as_required") 2>/dev/null; then :
201  as_have_required=yes
202else
203  as_have_required=no
204fi
205  if test x$as_have_required = xyes && (eval "$as_suggested") 2>/dev/null; then :
206
207else
208  as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
209as_found=false
210for as_dir in /bin$PATH_SEPARATOR/usr/bin$PATH_SEPARATOR$PATH
211do
212  IFS=$as_save_IFS
213  test -z "$as_dir" && as_dir=.
214  as_found=:
215  case $as_dir in #(
216	 /*)
217	   for as_base in sh bash ksh sh5; do
218	     # Try only shells that exist, to save several forks.
219	     as_shell=$as_dir/$as_base
220	     if { test -f "$as_shell" || test -f "$as_shell.exe"; } &&
221		    { $as_echo "$as_bourne_compatible""$as_required" | as_run=a "$as_shell"; } 2>/dev/null; then :
222  CONFIG_SHELL=$as_shell as_have_required=yes
223		   if { $as_echo "$as_bourne_compatible""$as_suggested" | as_run=a "$as_shell"; } 2>/dev/null; then :
224  break 2
225fi
226fi
227	   done;;
228       esac
229  as_found=false
230done
231$as_found || { if { test -f "$SHELL" || test -f "$SHELL.exe"; } &&
232	      { $as_echo "$as_bourne_compatible""$as_required" | as_run=a "$SHELL"; } 2>/dev/null; then :
233  CONFIG_SHELL=$SHELL as_have_required=yes
234fi; }
235IFS=$as_save_IFS
236
237
238      if test "x$CONFIG_SHELL" != x; then :
239  export CONFIG_SHELL
240             # We cannot yet assume a decent shell, so we have to provide a
241# neutralization value for shells without unset; and this also
242# works around shells that cannot unset nonexistent variables.
243# Preserve -v and -x to the replacement shell.
244BASH_ENV=/dev/null
245ENV=/dev/null
246(unset BASH_ENV) >/dev/null 2>&1 && unset BASH_ENV ENV
247case $- in # ((((
248  *v*x* | *x*v* ) as_opts=-vx ;;
249  *v* ) as_opts=-v ;;
250  *x* ) as_opts=-x ;;
251  * ) as_opts= ;;
252esac
253exec $CONFIG_SHELL $as_opts "$as_myself" ${1+"$@"}
254# Admittedly, this is quite paranoid, since all the known shells bail
255# out after a failed `exec'.
256$as_echo "$0: could not re-execute with $CONFIG_SHELL" >&2
257exit 255
258fi
259
260    if test x$as_have_required = xno; then :
261  $as_echo "$0: This script requires a shell more modern than all"
262  $as_echo "$0: the shells that I found on your system."
263  if test x${ZSH_VERSION+set} = xset ; then
264    $as_echo "$0: In particular, zsh $ZSH_VERSION has bugs and should"
265    $as_echo "$0: be upgraded to zsh 4.3.4 or later."
266  else
267    $as_echo "$0: Please tell bug-autoconf@gnu.org about your system,
268$0: including any error possibly output before this
269$0: message. Then install a modern shell, or manually run
270$0: the script under such a shell if you do have one."
271  fi
272  exit 1
273fi
274fi
275fi
276SHELL=${CONFIG_SHELL-/bin/sh}
277export SHELL
278# Unset more variables known to interfere with behavior of common tools.
279CLICOLOR_FORCE= GREP_OPTIONS=
280unset CLICOLOR_FORCE GREP_OPTIONS
281
282## --------------------- ##
283## M4sh Shell Functions. ##
284## --------------------- ##
285# as_fn_unset VAR
286# ---------------
287# Portably unset VAR.
288as_fn_unset ()
289{
290  { eval $1=; unset $1;}
291}
292as_unset=as_fn_unset
293
294# as_fn_set_status STATUS
295# -----------------------
296# Set $? to STATUS, without forking.
297as_fn_set_status ()
298{
299  return $1
300} # as_fn_set_status
301
302# as_fn_exit STATUS
303# -----------------
304# Exit the shell with STATUS, even in a "trap 0" or "set -e" context.
305as_fn_exit ()
306{
307  set +e
308  as_fn_set_status $1
309  exit $1
310} # as_fn_exit
311
312# as_fn_mkdir_p
313# -------------
314# Create "$as_dir" as a directory, including parents if necessary.
315as_fn_mkdir_p ()
316{
317
318  case $as_dir in #(
319  -*) as_dir=./$as_dir;;
320  esac
321  test -d "$as_dir" || eval $as_mkdir_p || {
322    as_dirs=
323    while :; do
324      case $as_dir in #(
325      *\'*) as_qdir=`$as_echo "$as_dir" | sed "s/'/'\\\\\\\\''/g"`;; #'(
326      *) as_qdir=$as_dir;;
327      esac
328      as_dirs="'$as_qdir' $as_dirs"
329      as_dir=`$as_dirname -- "$as_dir" ||
330$as_expr X"$as_dir" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
331	 X"$as_dir" : 'X\(//\)[^/]' \| \
332	 X"$as_dir" : 'X\(//\)$' \| \
333	 X"$as_dir" : 'X\(/\)' \| . 2>/dev/null ||
334$as_echo X"$as_dir" |
335    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
336	    s//\1/
337	    q
338	  }
339	  /^X\(\/\/\)[^/].*/{
340	    s//\1/
341	    q
342	  }
343	  /^X\(\/\/\)$/{
344	    s//\1/
345	    q
346	  }
347	  /^X\(\/\).*/{
348	    s//\1/
349	    q
350	  }
351	  s/.*/./; q'`
352      test -d "$as_dir" && break
353    done
354    test -z "$as_dirs" || eval "mkdir $as_dirs"
355  } || test -d "$as_dir" || as_fn_error $? "cannot create directory $as_dir"
356
357
358} # as_fn_mkdir_p
359
360# as_fn_executable_p FILE
361# -----------------------
362# Test if FILE is an executable regular file.
363as_fn_executable_p ()
364{
365  test -f "$1" && test -x "$1"
366} # as_fn_executable_p
367# as_fn_append VAR VALUE
368# ----------------------
369# Append the text in VALUE to the end of the definition contained in VAR. Take
370# advantage of any shell optimizations that allow amortized linear growth over
371# repeated appends, instead of the typical quadratic growth present in naive
372# implementations.
373if (eval "as_var=1; as_var+=2; test x\$as_var = x12") 2>/dev/null; then :
374  eval 'as_fn_append ()
375  {
376    eval $1+=\$2
377  }'
378else
379  as_fn_append ()
380  {
381    eval $1=\$$1\$2
382  }
383fi # as_fn_append
384
385# as_fn_arith ARG...
386# ------------------
387# Perform arithmetic evaluation on the ARGs, and store the result in the
388# global $as_val. Take advantage of shells that can avoid forks. The arguments
389# must be portable across $(()) and expr.
390if (eval "test \$(( 1 + 1 )) = 2") 2>/dev/null; then :
391  eval 'as_fn_arith ()
392  {
393    as_val=$(( $* ))
394  }'
395else
396  as_fn_arith ()
397  {
398    as_val=`expr "$@" || test $? -eq 1`
399  }
400fi # as_fn_arith
401
402
403# as_fn_error STATUS ERROR [LINENO LOG_FD]
404# ----------------------------------------
405# Output "`basename $0`: error: ERROR" to stderr. If LINENO and LOG_FD are
406# provided, also output the error to LOG_FD, referencing LINENO. Then exit the
407# script with STATUS, using 1 if that was 0.
408as_fn_error ()
409{
410  as_status=$1; test $as_status -eq 0 && as_status=1
411  if test "$4"; then
412    as_lineno=${as_lineno-"$3"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
413    $as_echo "$as_me:${as_lineno-$LINENO}: error: $2" >&$4
414  fi
415  $as_echo "$as_me: error: $2" >&2
416  as_fn_exit $as_status
417} # as_fn_error
418
419if expr a : '\(a\)' >/dev/null 2>&1 &&
420   test "X`expr 00001 : '.*\(...\)'`" = X001; then
421  as_expr=expr
422else
423  as_expr=false
424fi
425
426if (basename -- /) >/dev/null 2>&1 && test "X`basename -- / 2>&1`" = "X/"; then
427  as_basename=basename
428else
429  as_basename=false
430fi
431
432if (as_dir=`dirname -- /` && test "X$as_dir" = X/) >/dev/null 2>&1; then
433  as_dirname=dirname
434else
435  as_dirname=false
436fi
437
438as_me=`$as_basename -- "$0" ||
439$as_expr X/"$0" : '.*/\([^/][^/]*\)/*$' \| \
440	 X"$0" : 'X\(//\)$' \| \
441	 X"$0" : 'X\(/\)' \| . 2>/dev/null ||
442$as_echo X/"$0" |
443    sed '/^.*\/\([^/][^/]*\)\/*$/{
444	    s//\1/
445	    q
446	  }
447	  /^X\/\(\/\/\)$/{
448	    s//\1/
449	    q
450	  }
451	  /^X\/\(\/\).*/{
452	    s//\1/
453	    q
454	  }
455	  s/.*/./; q'`
456
457# Avoid depending upon Character Ranges.
458as_cr_letters='abcdefghijklmnopqrstuvwxyz'
459as_cr_LETTERS='ABCDEFGHIJKLMNOPQRSTUVWXYZ'
460as_cr_Letters=$as_cr_letters$as_cr_LETTERS
461as_cr_digits='0123456789'
462as_cr_alnum=$as_cr_Letters$as_cr_digits
463
464
465  as_lineno_1=$LINENO as_lineno_1a=$LINENO
466  as_lineno_2=$LINENO as_lineno_2a=$LINENO
467  eval 'test "x$as_lineno_1'$as_run'" != "x$as_lineno_2'$as_run'" &&
468  test "x`expr $as_lineno_1'$as_run' + 1`" = "x$as_lineno_2'$as_run'"' || {
469  # Blame Lee E. McMahon (1931-1989) for sed's syntax.  :-)
470  sed -n '
471    p
472    /[$]LINENO/=
473  ' <$as_myself |
474    sed '
475      s/[$]LINENO.*/&-/
476      t lineno
477      b
478      :lineno
479      N
480      :loop
481      s/[$]LINENO\([^'$as_cr_alnum'_].*\n\)\(.*\)/\2\1\2/
482      t loop
483      s/-\n.*//
484    ' >$as_me.lineno &&
485  chmod +x "$as_me.lineno" ||
486    { $as_echo "$as_me: error: cannot create $as_me.lineno; rerun with a POSIX shell" >&2; as_fn_exit 1; }
487
488  # If we had to re-execute with $CONFIG_SHELL, we're ensured to have
489  # already done that, so ensure we don't try to do so again and fall
490  # in an infinite loop.  This has already happened in practice.
491  _as_can_reexec=no; export _as_can_reexec
492  # Don't try to exec as it changes $[0], causing all sort of problems
493  # (the dirname of $[0] is not the place where we might find the
494  # original and so on.  Autoconf is especially sensitive to this).
495  . "./$as_me.lineno"
496  # Exit status is that of the last command.
497  exit
498}
499
500ECHO_C= ECHO_N= ECHO_T=
501case `echo -n x` in #(((((
502-n*)
503  case `echo 'xy\c'` in
504  *c*) ECHO_T='	';;	# ECHO_T is single tab character.
505  xy)  ECHO_C='\c';;
506  *)   echo `echo ksh88 bug on AIX 6.1` > /dev/null
507       ECHO_T='	';;
508  esac;;
509*)
510  ECHO_N='-n';;
511esac
512
513rm -f conf$$ conf$$.exe conf$$.file
514if test -d conf$$.dir; then
515  rm -f conf$$.dir/conf$$.file
516else
517  rm -f conf$$.dir
518  mkdir conf$$.dir 2>/dev/null
519fi
520if (echo >conf$$.file) 2>/dev/null; then
521  if ln -s conf$$.file conf$$ 2>/dev/null; then
522    as_ln_s='ln -s'
523    # ... but there are two gotchas:
524    # 1) On MSYS, both `ln -s file dir' and `ln file dir' fail.
525    # 2) DJGPP < 2.04 has no symlinks; `ln -s' creates a wrapper executable.
526    # In both cases, we have to default to `cp -pR'.
527    ln -s conf$$.file conf$$.dir 2>/dev/null && test ! -f conf$$.exe ||
528      as_ln_s='cp -pR'
529  elif ln conf$$.file conf$$ 2>/dev/null; then
530    as_ln_s=ln
531  else
532    as_ln_s='cp -pR'
533  fi
534else
535  as_ln_s='cp -pR'
536fi
537rm -f conf$$ conf$$.exe conf$$.dir/conf$$.file conf$$.file
538rmdir conf$$.dir 2>/dev/null
539
540if mkdir -p . 2>/dev/null; then
541  as_mkdir_p='mkdir -p "$as_dir"'
542else
543  test -d ./-p && rmdir ./-p
544  as_mkdir_p=false
545fi
546
547as_test_x='test -x'
548as_executable_p=as_fn_executable_p
549
550# Sed expression to map a string onto a valid CPP name.
551as_tr_cpp="eval sed 'y%*$as_cr_letters%P$as_cr_LETTERS%;s%[^_$as_cr_alnum]%_%g'"
552
553# Sed expression to map a string onto a valid variable name.
554as_tr_sh="eval sed 'y%*+%pp%;s%[^_$as_cr_alnum]%_%g'"
555
556
557test -n "$DJDIR" || exec 7<&0 </dev/null
558exec 6>&1
559
560# Name of the host.
561# hostname on some systems (SVR3.2, old GNU/Linux) returns a bogus exit status,
562# so uname gets run too.
563ac_hostname=`(hostname || uname -n) 2>/dev/null | sed 1q`
564
565#
566# Initializations.
567#
568ac_default_prefix=/usr/local
569ac_clean_files=
570ac_config_libobj_dir=.
571LIBOBJS=
572cross_compiling=no
573subdirs=
574MFLAGS=
575MAKEFLAGS=
576
577# Identity of this package.
578PACKAGE_NAME=
579PACKAGE_TARNAME=
580PACKAGE_VERSION=
581PACKAGE_STRING=
582PACKAGE_BUGREPORT=
583PACKAGE_URL=
584
585ac_unique_file="conf_vars.in"
586# Factoring default headers for most tests.
587ac_includes_default="\
588#include <stdio.h>
589#ifdef HAVE_SYS_TYPES_H
590# include <sys/types.h>
591#endif
592#ifdef HAVE_SYS_STAT_H
593# include <sys/stat.h>
594#endif
595#ifdef STDC_HEADERS
596# include <stdlib.h>
597# include <stddef.h>
598#else
599# ifdef HAVE_STDLIB_H
600#  include <stdlib.h>
601# endif
602#endif
603#ifdef HAVE_STRING_H
604# if !defined STDC_HEADERS && defined HAVE_MEMORY_H
605#  include <memory.h>
606# endif
607# include <string.h>
608#endif
609#ifdef HAVE_STRINGS_H
610# include <strings.h>
611#endif
612#ifdef HAVE_INTTYPES_H
613# include <inttypes.h>
614#endif
615#ifdef HAVE_STDINT_H
616# include <stdint.h>
617#endif
618#ifdef HAVE_UNISTD_H
619# include <unistd.h>
620#endif"
621
622ac_subst_vars='LTLIBOBJS
623LIBOBJS
624test_c_compiler
625make_command
626JAVAC
627SSLEAY_ROOT
628CROSSLDFLAGS
629wsl
630exe
631obj
632LD
633HCC
634ERTS_LIBS
635ERTS_CFLAGS
636EI_CFLAGS
637SHLIB_EXTRACT_ALL
638SHLIB_SUFFIX
639SHLIB_CFLAGS
640SHLIB_LDLIBS
641SHLIB_LDFLAGS
642SHLIB_LD
643EGREP
644GREP
645CPP
646DEBUG_FLAGS
647OBJEXT
648EXEEXT
649ac_ct_CC
650CPPFLAGS
651LDFLAGS
652CFLAGS
653CC
654host_os
655host_vendor
656host_cpu
657host
658build_os
659build_vendor
660build_cpu
661build
662target_alias
663host_alias
664build_alias
665LIBS
666ECHO_T
667ECHO_N
668ECHO_C
669DEFS
670mandir
671localedir
672libdir
673psdir
674pdfdir
675dvidir
676htmldir
677infodir
678docdir
679oldincludedir
680includedir
681runstatedir
682localstatedir
683sharedstatedir
684sysconfdir
685datadir
686datarootdir
687libexecdir
688sbindir
689bindir
690program_transform_name
691prefix
692exec_prefix
693PACKAGE_URL
694PACKAGE_BUGREPORT
695PACKAGE_STRING
696PACKAGE_VERSION
697PACKAGE_TARNAME
698PACKAGE_NAME
699PATH_SEPARATOR
700SHELL'
701ac_subst_files=''
702ac_user_opts='
703enable_option_checking
704enable_debug_mode
705enable_m64_build
706enable_m32_build
707enable_shlib_thread_safety
708'
709      ac_precious_vars='build_alias
710host_alias
711target_alias
712CC
713CFLAGS
714LDFLAGS
715LIBS
716CPPFLAGS
717CPP'
718
719
720# Initialize some variables set by options.
721ac_init_help=
722ac_init_version=false
723ac_unrecognized_opts=
724ac_unrecognized_sep=
725# The variables have the same names as the options, with
726# dashes changed to underlines.
727cache_file=/dev/null
728exec_prefix=NONE
729no_create=
730no_recursion=
731prefix=NONE
732program_prefix=NONE
733program_suffix=NONE
734program_transform_name=s,x,x,
735silent=
736site=
737srcdir=
738verbose=
739x_includes=NONE
740x_libraries=NONE
741
742# Installation directory options.
743# These are left unexpanded so users can "make install exec_prefix=/foo"
744# and all the variables that are supposed to be based on exec_prefix
745# by default will actually change.
746# Use braces instead of parens because sh, perl, etc. also accept them.
747# (The list follows the same order as the GNU Coding Standards.)
748bindir='${exec_prefix}/bin'
749sbindir='${exec_prefix}/sbin'
750libexecdir='${exec_prefix}/libexec'
751datarootdir='${prefix}/share'
752datadir='${datarootdir}'
753sysconfdir='${prefix}/etc'
754sharedstatedir='${prefix}/com'
755localstatedir='${prefix}/var'
756runstatedir='${localstatedir}/run'
757includedir='${prefix}/include'
758oldincludedir='/usr/include'
759docdir='${datarootdir}/doc/${PACKAGE}'
760infodir='${datarootdir}/info'
761htmldir='${docdir}'
762dvidir='${docdir}'
763pdfdir='${docdir}'
764psdir='${docdir}'
765libdir='${exec_prefix}/lib'
766localedir='${datarootdir}/locale'
767mandir='${datarootdir}/man'
768
769ac_prev=
770ac_dashdash=
771for ac_option
772do
773  # If the previous option needs an argument, assign it.
774  if test -n "$ac_prev"; then
775    eval $ac_prev=\$ac_option
776    ac_prev=
777    continue
778  fi
779
780  case $ac_option in
781  *=?*) ac_optarg=`expr "X$ac_option" : '[^=]*=\(.*\)'` ;;
782  *=)   ac_optarg= ;;
783  *)    ac_optarg=yes ;;
784  esac
785
786  # Accept the important Cygnus configure options, so we can diagnose typos.
787
788  case $ac_dashdash$ac_option in
789  --)
790    ac_dashdash=yes ;;
791
792  -bindir | --bindir | --bindi | --bind | --bin | --bi)
793    ac_prev=bindir ;;
794  -bindir=* | --bindir=* | --bindi=* | --bind=* | --bin=* | --bi=*)
795    bindir=$ac_optarg ;;
796
797  -build | --build | --buil | --bui | --bu)
798    ac_prev=build_alias ;;
799  -build=* | --build=* | --buil=* | --bui=* | --bu=*)
800    build_alias=$ac_optarg ;;
801
802  -cache-file | --cache-file | --cache-fil | --cache-fi \
803  | --cache-f | --cache- | --cache | --cach | --cac | --ca | --c)
804    ac_prev=cache_file ;;
805  -cache-file=* | --cache-file=* | --cache-fil=* | --cache-fi=* \
806  | --cache-f=* | --cache-=* | --cache=* | --cach=* | --cac=* | --ca=* | --c=*)
807    cache_file=$ac_optarg ;;
808
809  --config-cache | -C)
810    cache_file=config.cache ;;
811
812  -datadir | --datadir | --datadi | --datad)
813    ac_prev=datadir ;;
814  -datadir=* | --datadir=* | --datadi=* | --datad=*)
815    datadir=$ac_optarg ;;
816
817  -datarootdir | --datarootdir | --datarootdi | --datarootd | --dataroot \
818  | --dataroo | --dataro | --datar)
819    ac_prev=datarootdir ;;
820  -datarootdir=* | --datarootdir=* | --datarootdi=* | --datarootd=* \
821  | --dataroot=* | --dataroo=* | --dataro=* | --datar=*)
822    datarootdir=$ac_optarg ;;
823
824  -disable-* | --disable-*)
825    ac_useropt=`expr "x$ac_option" : 'x-*disable-\(.*\)'`
826    # Reject names that are not valid shell variable names.
827    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
828      as_fn_error $? "invalid feature name: $ac_useropt"
829    ac_useropt_orig=$ac_useropt
830    ac_useropt=`$as_echo "$ac_useropt" | sed 's/[-+.]/_/g'`
831    case $ac_user_opts in
832      *"
833"enable_$ac_useropt"
834"*) ;;
835      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--disable-$ac_useropt_orig"
836	 ac_unrecognized_sep=', ';;
837    esac
838    eval enable_$ac_useropt=no ;;
839
840  -docdir | --docdir | --docdi | --doc | --do)
841    ac_prev=docdir ;;
842  -docdir=* | --docdir=* | --docdi=* | --doc=* | --do=*)
843    docdir=$ac_optarg ;;
844
845  -dvidir | --dvidir | --dvidi | --dvid | --dvi | --dv)
846    ac_prev=dvidir ;;
847  -dvidir=* | --dvidir=* | --dvidi=* | --dvid=* | --dvi=* | --dv=*)
848    dvidir=$ac_optarg ;;
849
850  -enable-* | --enable-*)
851    ac_useropt=`expr "x$ac_option" : 'x-*enable-\([^=]*\)'`
852    # Reject names that are not valid shell variable names.
853    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
854      as_fn_error $? "invalid feature name: $ac_useropt"
855    ac_useropt_orig=$ac_useropt
856    ac_useropt=`$as_echo "$ac_useropt" | sed 's/[-+.]/_/g'`
857    case $ac_user_opts in
858      *"
859"enable_$ac_useropt"
860"*) ;;
861      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--enable-$ac_useropt_orig"
862	 ac_unrecognized_sep=', ';;
863    esac
864    eval enable_$ac_useropt=\$ac_optarg ;;
865
866  -exec-prefix | --exec_prefix | --exec-prefix | --exec-prefi \
867  | --exec-pref | --exec-pre | --exec-pr | --exec-p | --exec- \
868  | --exec | --exe | --ex)
869    ac_prev=exec_prefix ;;
870  -exec-prefix=* | --exec_prefix=* | --exec-prefix=* | --exec-prefi=* \
871  | --exec-pref=* | --exec-pre=* | --exec-pr=* | --exec-p=* | --exec-=* \
872  | --exec=* | --exe=* | --ex=*)
873    exec_prefix=$ac_optarg ;;
874
875  -gas | --gas | --ga | --g)
876    # Obsolete; use --with-gas.
877    with_gas=yes ;;
878
879  -help | --help | --hel | --he | -h)
880    ac_init_help=long ;;
881  -help=r* | --help=r* | --hel=r* | --he=r* | -hr*)
882    ac_init_help=recursive ;;
883  -help=s* | --help=s* | --hel=s* | --he=s* | -hs*)
884    ac_init_help=short ;;
885
886  -host | --host | --hos | --ho)
887    ac_prev=host_alias ;;
888  -host=* | --host=* | --hos=* | --ho=*)
889    host_alias=$ac_optarg ;;
890
891  -htmldir | --htmldir | --htmldi | --htmld | --html | --htm | --ht)
892    ac_prev=htmldir ;;
893  -htmldir=* | --htmldir=* | --htmldi=* | --htmld=* | --html=* | --htm=* \
894  | --ht=*)
895    htmldir=$ac_optarg ;;
896
897  -includedir | --includedir | --includedi | --included | --include \
898  | --includ | --inclu | --incl | --inc)
899    ac_prev=includedir ;;
900  -includedir=* | --includedir=* | --includedi=* | --included=* | --include=* \
901  | --includ=* | --inclu=* | --incl=* | --inc=*)
902    includedir=$ac_optarg ;;
903
904  -infodir | --infodir | --infodi | --infod | --info | --inf)
905    ac_prev=infodir ;;
906  -infodir=* | --infodir=* | --infodi=* | --infod=* | --info=* | --inf=*)
907    infodir=$ac_optarg ;;
908
909  -libdir | --libdir | --libdi | --libd)
910    ac_prev=libdir ;;
911  -libdir=* | --libdir=* | --libdi=* | --libd=*)
912    libdir=$ac_optarg ;;
913
914  -libexecdir | --libexecdir | --libexecdi | --libexecd | --libexec \
915  | --libexe | --libex | --libe)
916    ac_prev=libexecdir ;;
917  -libexecdir=* | --libexecdir=* | --libexecdi=* | --libexecd=* | --libexec=* \
918  | --libexe=* | --libex=* | --libe=*)
919    libexecdir=$ac_optarg ;;
920
921  -localedir | --localedir | --localedi | --localed | --locale)
922    ac_prev=localedir ;;
923  -localedir=* | --localedir=* | --localedi=* | --localed=* | --locale=*)
924    localedir=$ac_optarg ;;
925
926  -localstatedir | --localstatedir | --localstatedi | --localstated \
927  | --localstate | --localstat | --localsta | --localst | --locals)
928    ac_prev=localstatedir ;;
929  -localstatedir=* | --localstatedir=* | --localstatedi=* | --localstated=* \
930  | --localstate=* | --localstat=* | --localsta=* | --localst=* | --locals=*)
931    localstatedir=$ac_optarg ;;
932
933  -mandir | --mandir | --mandi | --mand | --man | --ma | --m)
934    ac_prev=mandir ;;
935  -mandir=* | --mandir=* | --mandi=* | --mand=* | --man=* | --ma=* | --m=*)
936    mandir=$ac_optarg ;;
937
938  -nfp | --nfp | --nf)
939    # Obsolete; use --without-fp.
940    with_fp=no ;;
941
942  -no-create | --no-create | --no-creat | --no-crea | --no-cre \
943  | --no-cr | --no-c | -n)
944    no_create=yes ;;
945
946  -no-recursion | --no-recursion | --no-recursio | --no-recursi \
947  | --no-recurs | --no-recur | --no-recu | --no-rec | --no-re | --no-r)
948    no_recursion=yes ;;
949
950  -oldincludedir | --oldincludedir | --oldincludedi | --oldincluded \
951  | --oldinclude | --oldinclud | --oldinclu | --oldincl | --oldinc \
952  | --oldin | --oldi | --old | --ol | --o)
953    ac_prev=oldincludedir ;;
954  -oldincludedir=* | --oldincludedir=* | --oldincludedi=* | --oldincluded=* \
955  | --oldinclude=* | --oldinclud=* | --oldinclu=* | --oldincl=* | --oldinc=* \
956  | --oldin=* | --oldi=* | --old=* | --ol=* | --o=*)
957    oldincludedir=$ac_optarg ;;
958
959  -prefix | --prefix | --prefi | --pref | --pre | --pr | --p)
960    ac_prev=prefix ;;
961  -prefix=* | --prefix=* | --prefi=* | --pref=* | --pre=* | --pr=* | --p=*)
962    prefix=$ac_optarg ;;
963
964  -program-prefix | --program-prefix | --program-prefi | --program-pref \
965  | --program-pre | --program-pr | --program-p)
966    ac_prev=program_prefix ;;
967  -program-prefix=* | --program-prefix=* | --program-prefi=* \
968  | --program-pref=* | --program-pre=* | --program-pr=* | --program-p=*)
969    program_prefix=$ac_optarg ;;
970
971  -program-suffix | --program-suffix | --program-suffi | --program-suff \
972  | --program-suf | --program-su | --program-s)
973    ac_prev=program_suffix ;;
974  -program-suffix=* | --program-suffix=* | --program-suffi=* \
975  | --program-suff=* | --program-suf=* | --program-su=* | --program-s=*)
976    program_suffix=$ac_optarg ;;
977
978  -program-transform-name | --program-transform-name \
979  | --program-transform-nam | --program-transform-na \
980  | --program-transform-n | --program-transform- \
981  | --program-transform | --program-transfor \
982  | --program-transfo | --program-transf \
983  | --program-trans | --program-tran \
984  | --progr-tra | --program-tr | --program-t)
985    ac_prev=program_transform_name ;;
986  -program-transform-name=* | --program-transform-name=* \
987  | --program-transform-nam=* | --program-transform-na=* \
988  | --program-transform-n=* | --program-transform-=* \
989  | --program-transform=* | --program-transfor=* \
990  | --program-transfo=* | --program-transf=* \
991  | --program-trans=* | --program-tran=* \
992  | --progr-tra=* | --program-tr=* | --program-t=*)
993    program_transform_name=$ac_optarg ;;
994
995  -pdfdir | --pdfdir | --pdfdi | --pdfd | --pdf | --pd)
996    ac_prev=pdfdir ;;
997  -pdfdir=* | --pdfdir=* | --pdfdi=* | --pdfd=* | --pdf=* | --pd=*)
998    pdfdir=$ac_optarg ;;
999
1000  -psdir | --psdir | --psdi | --psd | --ps)
1001    ac_prev=psdir ;;
1002  -psdir=* | --psdir=* | --psdi=* | --psd=* | --ps=*)
1003    psdir=$ac_optarg ;;
1004
1005  -q | -quiet | --quiet | --quie | --qui | --qu | --q \
1006  | -silent | --silent | --silen | --sile | --sil)
1007    silent=yes ;;
1008
1009  -runstatedir | --runstatedir | --runstatedi | --runstated \
1010  | --runstate | --runstat | --runsta | --runst | --runs \
1011  | --run | --ru | --r)
1012    ac_prev=runstatedir ;;
1013  -runstatedir=* | --runstatedir=* | --runstatedi=* | --runstated=* \
1014  | --runstate=* | --runstat=* | --runsta=* | --runst=* | --runs=* \
1015  | --run=* | --ru=* | --r=*)
1016    runstatedir=$ac_optarg ;;
1017
1018  -sbindir | --sbindir | --sbindi | --sbind | --sbin | --sbi | --sb)
1019    ac_prev=sbindir ;;
1020  -sbindir=* | --sbindir=* | --sbindi=* | --sbind=* | --sbin=* \
1021  | --sbi=* | --sb=*)
1022    sbindir=$ac_optarg ;;
1023
1024  -sharedstatedir | --sharedstatedir | --sharedstatedi \
1025  | --sharedstated | --sharedstate | --sharedstat | --sharedsta \
1026  | --sharedst | --shareds | --shared | --share | --shar \
1027  | --sha | --sh)
1028    ac_prev=sharedstatedir ;;
1029  -sharedstatedir=* | --sharedstatedir=* | --sharedstatedi=* \
1030  | --sharedstated=* | --sharedstate=* | --sharedstat=* | --sharedsta=* \
1031  | --sharedst=* | --shareds=* | --shared=* | --share=* | --shar=* \
1032  | --sha=* | --sh=*)
1033    sharedstatedir=$ac_optarg ;;
1034
1035  -site | --site | --sit)
1036    ac_prev=site ;;
1037  -site=* | --site=* | --sit=*)
1038    site=$ac_optarg ;;
1039
1040  -srcdir | --srcdir | --srcdi | --srcd | --src | --sr)
1041    ac_prev=srcdir ;;
1042  -srcdir=* | --srcdir=* | --srcdi=* | --srcd=* | --src=* | --sr=*)
1043    srcdir=$ac_optarg ;;
1044
1045  -sysconfdir | --sysconfdir | --sysconfdi | --sysconfd | --sysconf \
1046  | --syscon | --sysco | --sysc | --sys | --sy)
1047    ac_prev=sysconfdir ;;
1048  -sysconfdir=* | --sysconfdir=* | --sysconfdi=* | --sysconfd=* | --sysconf=* \
1049  | --syscon=* | --sysco=* | --sysc=* | --sys=* | --sy=*)
1050    sysconfdir=$ac_optarg ;;
1051
1052  -target | --target | --targe | --targ | --tar | --ta | --t)
1053    ac_prev=target_alias ;;
1054  -target=* | --target=* | --targe=* | --targ=* | --tar=* | --ta=* | --t=*)
1055    target_alias=$ac_optarg ;;
1056
1057  -v | -verbose | --verbose | --verbos | --verbo | --verb)
1058    verbose=yes ;;
1059
1060  -version | --version | --versio | --versi | --vers | -V)
1061    ac_init_version=: ;;
1062
1063  -with-* | --with-*)
1064    ac_useropt=`expr "x$ac_option" : 'x-*with-\([^=]*\)'`
1065    # Reject names that are not valid shell variable names.
1066    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
1067      as_fn_error $? "invalid package name: $ac_useropt"
1068    ac_useropt_orig=$ac_useropt
1069    ac_useropt=`$as_echo "$ac_useropt" | sed 's/[-+.]/_/g'`
1070    case $ac_user_opts in
1071      *"
1072"with_$ac_useropt"
1073"*) ;;
1074      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--with-$ac_useropt_orig"
1075	 ac_unrecognized_sep=', ';;
1076    esac
1077    eval with_$ac_useropt=\$ac_optarg ;;
1078
1079  -without-* | --without-*)
1080    ac_useropt=`expr "x$ac_option" : 'x-*without-\(.*\)'`
1081    # Reject names that are not valid shell variable names.
1082    expr "x$ac_useropt" : ".*[^-+._$as_cr_alnum]" >/dev/null &&
1083      as_fn_error $? "invalid package name: $ac_useropt"
1084    ac_useropt_orig=$ac_useropt
1085    ac_useropt=`$as_echo "$ac_useropt" | sed 's/[-+.]/_/g'`
1086    case $ac_user_opts in
1087      *"
1088"with_$ac_useropt"
1089"*) ;;
1090      *) ac_unrecognized_opts="$ac_unrecognized_opts$ac_unrecognized_sep--without-$ac_useropt_orig"
1091	 ac_unrecognized_sep=', ';;
1092    esac
1093    eval with_$ac_useropt=no ;;
1094
1095  --x)
1096    # Obsolete; use --with-x.
1097    with_x=yes ;;
1098
1099  -x-includes | --x-includes | --x-include | --x-includ | --x-inclu \
1100  | --x-incl | --x-inc | --x-in | --x-i)
1101    ac_prev=x_includes ;;
1102  -x-includes=* | --x-includes=* | --x-include=* | --x-includ=* | --x-inclu=* \
1103  | --x-incl=* | --x-inc=* | --x-in=* | --x-i=*)
1104    x_includes=$ac_optarg ;;
1105
1106  -x-libraries | --x-libraries | --x-librarie | --x-librari \
1107  | --x-librar | --x-libra | --x-libr | --x-lib | --x-li | --x-l)
1108    ac_prev=x_libraries ;;
1109  -x-libraries=* | --x-libraries=* | --x-librarie=* | --x-librari=* \
1110  | --x-librar=* | --x-libra=* | --x-libr=* | --x-lib=* | --x-li=* | --x-l=*)
1111    x_libraries=$ac_optarg ;;
1112
1113  -*) as_fn_error $? "unrecognized option: \`$ac_option'
1114Try \`$0 --help' for more information"
1115    ;;
1116
1117  *=*)
1118    ac_envvar=`expr "x$ac_option" : 'x\([^=]*\)='`
1119    # Reject names that are not valid shell variable names.
1120    case $ac_envvar in #(
1121      '' | [0-9]* | *[!_$as_cr_alnum]* )
1122      as_fn_error $? "invalid variable name: \`$ac_envvar'" ;;
1123    esac
1124    eval $ac_envvar=\$ac_optarg
1125    export $ac_envvar ;;
1126
1127  *)
1128    # FIXME: should be removed in autoconf 3.0.
1129    $as_echo "$as_me: WARNING: you should use --build, --host, --target" >&2
1130    expr "x$ac_option" : ".*[^-._$as_cr_alnum]" >/dev/null &&
1131      $as_echo "$as_me: WARNING: invalid host type: $ac_option" >&2
1132    : "${build_alias=$ac_option} ${host_alias=$ac_option} ${target_alias=$ac_option}"
1133    ;;
1134
1135  esac
1136done
1137
1138if test -n "$ac_prev"; then
1139  ac_option=--`echo $ac_prev | sed 's/_/-/g'`
1140  as_fn_error $? "missing argument to $ac_option"
1141fi
1142
1143if test -n "$ac_unrecognized_opts"; then
1144  case $enable_option_checking in
1145    no) ;;
1146    fatal) as_fn_error $? "unrecognized options: $ac_unrecognized_opts" ;;
1147    *)     $as_echo "$as_me: WARNING: unrecognized options: $ac_unrecognized_opts" >&2 ;;
1148  esac
1149fi
1150
1151# Check all directory arguments for consistency.
1152for ac_var in	exec_prefix prefix bindir sbindir libexecdir datarootdir \
1153		datadir sysconfdir sharedstatedir localstatedir includedir \
1154		oldincludedir docdir infodir htmldir dvidir pdfdir psdir \
1155		libdir localedir mandir runstatedir
1156do
1157  eval ac_val=\$$ac_var
1158  # Remove trailing slashes.
1159  case $ac_val in
1160    */ )
1161      ac_val=`expr "X$ac_val" : 'X\(.*[^/]\)' \| "X$ac_val" : 'X\(.*\)'`
1162      eval $ac_var=\$ac_val;;
1163  esac
1164  # Be sure to have absolute directory names.
1165  case $ac_val in
1166    [\\/$]* | ?:[\\/]* )  continue;;
1167    NONE | '' ) case $ac_var in *prefix ) continue;; esac;;
1168  esac
1169  as_fn_error $? "expected an absolute directory name for --$ac_var: $ac_val"
1170done
1171
1172# There might be people who depend on the old broken behavior: `$host'
1173# used to hold the argument of --host etc.
1174# FIXME: To remove some day.
1175build=$build_alias
1176host=$host_alias
1177target=$target_alias
1178
1179# FIXME: To remove some day.
1180if test "x$host_alias" != x; then
1181  if test "x$build_alias" = x; then
1182    cross_compiling=maybe
1183  elif test "x$build_alias" != "x$host_alias"; then
1184    cross_compiling=yes
1185  fi
1186fi
1187
1188ac_tool_prefix=
1189test -n "$host_alias" && ac_tool_prefix=$host_alias-
1190
1191test "$silent" = yes && exec 6>/dev/null
1192
1193
1194ac_pwd=`pwd` && test -n "$ac_pwd" &&
1195ac_ls_di=`ls -di .` &&
1196ac_pwd_ls_di=`cd "$ac_pwd" && ls -di .` ||
1197  as_fn_error $? "working directory cannot be determined"
1198test "X$ac_ls_di" = "X$ac_pwd_ls_di" ||
1199  as_fn_error $? "pwd does not report name of working directory"
1200
1201
1202# Find the source files, if location was not specified.
1203if test -z "$srcdir"; then
1204  ac_srcdir_defaulted=yes
1205  # Try the directory containing this script, then the parent directory.
1206  ac_confdir=`$as_dirname -- "$as_myself" ||
1207$as_expr X"$as_myself" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
1208	 X"$as_myself" : 'X\(//\)[^/]' \| \
1209	 X"$as_myself" : 'X\(//\)$' \| \
1210	 X"$as_myself" : 'X\(/\)' \| . 2>/dev/null ||
1211$as_echo X"$as_myself" |
1212    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
1213	    s//\1/
1214	    q
1215	  }
1216	  /^X\(\/\/\)[^/].*/{
1217	    s//\1/
1218	    q
1219	  }
1220	  /^X\(\/\/\)$/{
1221	    s//\1/
1222	    q
1223	  }
1224	  /^X\(\/\).*/{
1225	    s//\1/
1226	    q
1227	  }
1228	  s/.*/./; q'`
1229  srcdir=$ac_confdir
1230  if test ! -r "$srcdir/$ac_unique_file"; then
1231    srcdir=..
1232  fi
1233else
1234  ac_srcdir_defaulted=no
1235fi
1236if test ! -r "$srcdir/$ac_unique_file"; then
1237  test "$ac_srcdir_defaulted" = yes && srcdir="$ac_confdir or .."
1238  as_fn_error $? "cannot find sources ($ac_unique_file) in $srcdir"
1239fi
1240ac_msg="sources are in $srcdir, but \`cd $srcdir' does not work"
1241ac_abs_confdir=`(
1242	cd "$srcdir" && test -r "./$ac_unique_file" || as_fn_error $? "$ac_msg"
1243	pwd)`
1244# When building in place, set srcdir=.
1245if test "$ac_abs_confdir" = "$ac_pwd"; then
1246  srcdir=.
1247fi
1248# Remove unnecessary trailing slashes from srcdir.
1249# Double slashes in file names in object file debugging info
1250# mess up M-x gdb in Emacs.
1251case $srcdir in
1252*/) srcdir=`expr "X$srcdir" : 'X\(.*[^/]\)' \| "X$srcdir" : 'X\(.*\)'`;;
1253esac
1254for ac_var in $ac_precious_vars; do
1255  eval ac_env_${ac_var}_set=\${${ac_var}+set}
1256  eval ac_env_${ac_var}_value=\$${ac_var}
1257  eval ac_cv_env_${ac_var}_set=\${${ac_var}+set}
1258  eval ac_cv_env_${ac_var}_value=\$${ac_var}
1259done
1260
1261#
1262# Report the --help message.
1263#
1264if test "$ac_init_help" = "long"; then
1265  # Omit some internal or obsolete options to make the list less imposing.
1266  # This message is too long to be a string in the A/UX 3.1 sh.
1267  cat <<_ACEOF
1268\`configure' configures this package to adapt to many kinds of systems.
1269
1270Usage: $0 [OPTION]... [VAR=VALUE]...
1271
1272To assign environment variables (e.g., CC, CFLAGS...), specify them as
1273VAR=VALUE.  See below for descriptions of some of the useful variables.
1274
1275Defaults for the options are specified in brackets.
1276
1277Configuration:
1278  -h, --help              display this help and exit
1279      --help=short        display options specific to this package
1280      --help=recursive    display the short help of all the included packages
1281  -V, --version           display version information and exit
1282  -q, --quiet, --silent   do not print \`checking ...' messages
1283      --cache-file=FILE   cache test results in FILE [disabled]
1284  -C, --config-cache      alias for \`--cache-file=config.cache'
1285  -n, --no-create         do not create output files
1286      --srcdir=DIR        find the sources in DIR [configure dir or \`..']
1287
1288Installation directories:
1289  --prefix=PREFIX         install architecture-independent files in PREFIX
1290                          [$ac_default_prefix]
1291  --exec-prefix=EPREFIX   install architecture-dependent files in EPREFIX
1292                          [PREFIX]
1293
1294By default, \`make install' will install all the files in
1295\`$ac_default_prefix/bin', \`$ac_default_prefix/lib' etc.  You can specify
1296an installation prefix other than \`$ac_default_prefix' using \`--prefix',
1297for instance \`--prefix=\$HOME'.
1298
1299For better control, use the options below.
1300
1301Fine tuning of the installation directories:
1302  --bindir=DIR            user executables [EPREFIX/bin]
1303  --sbindir=DIR           system admin executables [EPREFIX/sbin]
1304  --libexecdir=DIR        program executables [EPREFIX/libexec]
1305  --sysconfdir=DIR        read-only single-machine data [PREFIX/etc]
1306  --sharedstatedir=DIR    modifiable architecture-independent data [PREFIX/com]
1307  --localstatedir=DIR     modifiable single-machine data [PREFIX/var]
1308  --runstatedir=DIR       modifiable per-process data [LOCALSTATEDIR/run]
1309  --libdir=DIR            object code libraries [EPREFIX/lib]
1310  --includedir=DIR        C header files [PREFIX/include]
1311  --oldincludedir=DIR     C header files for non-gcc [/usr/include]
1312  --datarootdir=DIR       read-only arch.-independent data root [PREFIX/share]
1313  --datadir=DIR           read-only architecture-independent data [DATAROOTDIR]
1314  --infodir=DIR           info documentation [DATAROOTDIR/info]
1315  --localedir=DIR         locale-dependent data [DATAROOTDIR/locale]
1316  --mandir=DIR            man documentation [DATAROOTDIR/man]
1317  --docdir=DIR            documentation root [DATAROOTDIR/doc/PACKAGE]
1318  --htmldir=DIR           html documentation [DOCDIR]
1319  --dvidir=DIR            dvi documentation [DOCDIR]
1320  --pdfdir=DIR            pdf documentation [DOCDIR]
1321  --psdir=DIR             ps documentation [DOCDIR]
1322_ACEOF
1323
1324  cat <<\_ACEOF
1325
1326System types:
1327  --build=BUILD     configure for building on BUILD [guessed]
1328  --host=HOST       cross-compile to build programs to run on HOST [BUILD]
1329_ACEOF
1330fi
1331
1332if test -n "$ac_init_help"; then
1333
1334  cat <<\_ACEOF
1335
1336Optional Features:
1337  --disable-option-checking  ignore unrecognized --enable/--with options
1338  --disable-FEATURE       do not include FEATURE (same as --enable-FEATURE=no)
1339  --enable-FEATURE[=ARG]  include FEATURE [ARG=yes]
1340  --enable-debug-mode           enable debug mode
1341  --enable-m64-build      build 64-bit binaries using the -m64 flag to (g)cc
1342  --enable-m32-build      build 32-bit binaries using the -m32 flag to (g)cc
1343  --enable-shlib-thread-safety  enable thread safety for build shared libraries
1344
1345Some influential environment variables:
1346  CC          C compiler command
1347  CFLAGS      C compiler flags
1348  LDFLAGS     linker flags, e.g. -L<lib dir> if you have libraries in a
1349              nonstandard directory <lib dir>
1350  LIBS        libraries to pass to the linker, e.g. -l<library>
1351  CPPFLAGS    (Objective) C/C++ preprocessor flags, e.g. -I<include dir> if
1352              you have headers in a nonstandard directory <include dir>
1353  CPP         C preprocessor
1354
1355Use these variables to override the choices made by `configure' or to help
1356it to find libraries and programs with nonstandard names/locations.
1357
1358Report bugs to the package provider.
1359_ACEOF
1360ac_status=$?
1361fi
1362
1363if test "$ac_init_help" = "recursive"; then
1364  # If there are subdirs, report their specific --help.
1365  for ac_dir in : $ac_subdirs_all; do test "x$ac_dir" = x: && continue
1366    test -d "$ac_dir" ||
1367      { cd "$srcdir" && ac_pwd=`pwd` && srcdir=. && test -d "$ac_dir"; } ||
1368      continue
1369    ac_builddir=.
1370
1371case "$ac_dir" in
1372.) ac_dir_suffix= ac_top_builddir_sub=. ac_top_build_prefix= ;;
1373*)
1374  ac_dir_suffix=/`$as_echo "$ac_dir" | sed 's|^\.[\\/]||'`
1375  # A ".." for each directory in $ac_dir_suffix.
1376  ac_top_builddir_sub=`$as_echo "$ac_dir_suffix" | sed 's|/[^\\/]*|/..|g;s|/||'`
1377  case $ac_top_builddir_sub in
1378  "") ac_top_builddir_sub=. ac_top_build_prefix= ;;
1379  *)  ac_top_build_prefix=$ac_top_builddir_sub/ ;;
1380  esac ;;
1381esac
1382ac_abs_top_builddir=$ac_pwd
1383ac_abs_builddir=$ac_pwd$ac_dir_suffix
1384# for backward compatibility:
1385ac_top_builddir=$ac_top_build_prefix
1386
1387case $srcdir in
1388  .)  # We are building in place.
1389    ac_srcdir=.
1390    ac_top_srcdir=$ac_top_builddir_sub
1391    ac_abs_top_srcdir=$ac_pwd ;;
1392  [\\/]* | ?:[\\/]* )  # Absolute name.
1393    ac_srcdir=$srcdir$ac_dir_suffix;
1394    ac_top_srcdir=$srcdir
1395    ac_abs_top_srcdir=$srcdir ;;
1396  *) # Relative name.
1397    ac_srcdir=$ac_top_build_prefix$srcdir$ac_dir_suffix
1398    ac_top_srcdir=$ac_top_build_prefix$srcdir
1399    ac_abs_top_srcdir=$ac_pwd/$srcdir ;;
1400esac
1401ac_abs_srcdir=$ac_abs_top_srcdir$ac_dir_suffix
1402
1403    cd "$ac_dir" || { ac_status=$?; continue; }
1404    # Check for guested configure.
1405    if test -f "$ac_srcdir/configure.gnu"; then
1406      echo &&
1407      $SHELL "$ac_srcdir/configure.gnu" --help=recursive
1408    elif test -f "$ac_srcdir/configure"; then
1409      echo &&
1410      $SHELL "$ac_srcdir/configure" --help=recursive
1411    else
1412      $as_echo "$as_me: WARNING: no configuration information is in $ac_dir" >&2
1413    fi || ac_status=$?
1414    cd "$ac_pwd" || { ac_status=$?; break; }
1415  done
1416fi
1417
1418test -n "$ac_init_help" && exit $ac_status
1419if $ac_init_version; then
1420  cat <<\_ACEOF
1421configure
1422generated by GNU Autoconf 2.69
1423
1424Copyright (C) 2012 Free Software Foundation, Inc.
1425This configure script is free software; the Free Software Foundation
1426gives unlimited permission to copy, distribute and modify it.
1427_ACEOF
1428  exit
1429fi
1430
1431## ------------------------ ##
1432## Autoconf initialization. ##
1433## ------------------------ ##
1434
1435# ac_fn_c_try_compile LINENO
1436# --------------------------
1437# Try to compile conftest.$ac_ext, and return whether this succeeded.
1438ac_fn_c_try_compile ()
1439{
1440  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1441  rm -f conftest.$ac_objext
1442  if { { ac_try="$ac_compile"
1443case "(($ac_try" in
1444  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
1445  *) ac_try_echo=$ac_try;;
1446esac
1447eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
1448$as_echo "$ac_try_echo"; } >&5
1449  (eval "$ac_compile") 2>conftest.err
1450  ac_status=$?
1451  if test -s conftest.err; then
1452    grep -v '^ *+' conftest.err >conftest.er1
1453    cat conftest.er1 >&5
1454    mv -f conftest.er1 conftest.err
1455  fi
1456  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
1457  test $ac_status = 0; } && {
1458	 test -z "$ac_c_werror_flag" ||
1459	 test ! -s conftest.err
1460       } && test -s conftest.$ac_objext; then :
1461  ac_retval=0
1462else
1463  $as_echo "$as_me: failed program was:" >&5
1464sed 's/^/| /' conftest.$ac_ext >&5
1465
1466	ac_retval=1
1467fi
1468  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1469  as_fn_set_status $ac_retval
1470
1471} # ac_fn_c_try_compile
1472
1473# ac_fn_c_try_link LINENO
1474# -----------------------
1475# Try to link conftest.$ac_ext, and return whether this succeeded.
1476ac_fn_c_try_link ()
1477{
1478  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1479  rm -f conftest.$ac_objext conftest$ac_exeext
1480  if { { ac_try="$ac_link"
1481case "(($ac_try" in
1482  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
1483  *) ac_try_echo=$ac_try;;
1484esac
1485eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
1486$as_echo "$ac_try_echo"; } >&5
1487  (eval "$ac_link") 2>conftest.err
1488  ac_status=$?
1489  if test -s conftest.err; then
1490    grep -v '^ *+' conftest.err >conftest.er1
1491    cat conftest.er1 >&5
1492    mv -f conftest.er1 conftest.err
1493  fi
1494  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
1495  test $ac_status = 0; } && {
1496	 test -z "$ac_c_werror_flag" ||
1497	 test ! -s conftest.err
1498       } && test -s conftest$ac_exeext && {
1499	 test "$cross_compiling" = yes ||
1500	 test -x conftest$ac_exeext
1501       }; then :
1502  ac_retval=0
1503else
1504  $as_echo "$as_me: failed program was:" >&5
1505sed 's/^/| /' conftest.$ac_ext >&5
1506
1507	ac_retval=1
1508fi
1509  # Delete the IPA/IPO (Inter Procedural Analysis/Optimization) information
1510  # created by the PGI compiler (conftest_ipa8_conftest.oo), as it would
1511  # interfere with the next link command; also delete a directory that is
1512  # left behind by Apple's compiler.  We do this before executing the actions.
1513  rm -rf conftest.dSYM conftest_ipa8_conftest.oo
1514  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1515  as_fn_set_status $ac_retval
1516
1517} # ac_fn_c_try_link
1518
1519# ac_fn_c_try_cpp LINENO
1520# ----------------------
1521# Try to preprocess conftest.$ac_ext, and return whether this succeeded.
1522ac_fn_c_try_cpp ()
1523{
1524  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1525  if { { ac_try="$ac_cpp conftest.$ac_ext"
1526case "(($ac_try" in
1527  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
1528  *) ac_try_echo=$ac_try;;
1529esac
1530eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
1531$as_echo "$ac_try_echo"; } >&5
1532  (eval "$ac_cpp conftest.$ac_ext") 2>conftest.err
1533  ac_status=$?
1534  if test -s conftest.err; then
1535    grep -v '^ *+' conftest.err >conftest.er1
1536    cat conftest.er1 >&5
1537    mv -f conftest.er1 conftest.err
1538  fi
1539  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
1540  test $ac_status = 0; } > conftest.i && {
1541	 test -z "$ac_c_preproc_warn_flag$ac_c_werror_flag" ||
1542	 test ! -s conftest.err
1543       }; then :
1544  ac_retval=0
1545else
1546  $as_echo "$as_me: failed program was:" >&5
1547sed 's/^/| /' conftest.$ac_ext >&5
1548
1549    ac_retval=1
1550fi
1551  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1552  as_fn_set_status $ac_retval
1553
1554} # ac_fn_c_try_cpp
1555
1556# ac_fn_c_check_header_mongrel LINENO HEADER VAR INCLUDES
1557# -------------------------------------------------------
1558# Tests whether HEADER exists, giving a warning if it cannot be compiled using
1559# the include files in INCLUDES and setting the cache variable VAR
1560# accordingly.
1561ac_fn_c_check_header_mongrel ()
1562{
1563  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1564  if eval \${$3+:} false; then :
1565  { $as_echo "$as_me:${as_lineno-$LINENO}: checking for $2" >&5
1566$as_echo_n "checking for $2... " >&6; }
1567if eval \${$3+:} false; then :
1568  $as_echo_n "(cached) " >&6
1569fi
1570eval ac_res=\$$3
1571	       { $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_res" >&5
1572$as_echo "$ac_res" >&6; }
1573else
1574  # Is the header compilable?
1575{ $as_echo "$as_me:${as_lineno-$LINENO}: checking $2 usability" >&5
1576$as_echo_n "checking $2 usability... " >&6; }
1577cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1578/* end confdefs.h.  */
1579$4
1580#include <$2>
1581_ACEOF
1582if ac_fn_c_try_compile "$LINENO"; then :
1583  ac_header_compiler=yes
1584else
1585  ac_header_compiler=no
1586fi
1587rm -f core conftest.err conftest.$ac_objext conftest.$ac_ext
1588{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_header_compiler" >&5
1589$as_echo "$ac_header_compiler" >&6; }
1590
1591# Is the header present?
1592{ $as_echo "$as_me:${as_lineno-$LINENO}: checking $2 presence" >&5
1593$as_echo_n "checking $2 presence... " >&6; }
1594cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1595/* end confdefs.h.  */
1596#include <$2>
1597_ACEOF
1598if ac_fn_c_try_cpp "$LINENO"; then :
1599  ac_header_preproc=yes
1600else
1601  ac_header_preproc=no
1602fi
1603rm -f conftest.err conftest.i conftest.$ac_ext
1604{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_header_preproc" >&5
1605$as_echo "$ac_header_preproc" >&6; }
1606
1607# So?  What about this header?
1608case $ac_header_compiler:$ac_header_preproc:$ac_c_preproc_warn_flag in #((
1609  yes:no: )
1610    { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: $2: accepted by the compiler, rejected by the preprocessor!" >&5
1611$as_echo "$as_me: WARNING: $2: accepted by the compiler, rejected by the preprocessor!" >&2;}
1612    { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: $2: proceeding with the compiler's result" >&5
1613$as_echo "$as_me: WARNING: $2: proceeding with the compiler's result" >&2;}
1614    ;;
1615  no:yes:* )
1616    { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: $2: present but cannot be compiled" >&5
1617$as_echo "$as_me: WARNING: $2: present but cannot be compiled" >&2;}
1618    { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: $2:     check for missing prerequisite headers?" >&5
1619$as_echo "$as_me: WARNING: $2:     check for missing prerequisite headers?" >&2;}
1620    { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: $2: see the Autoconf documentation" >&5
1621$as_echo "$as_me: WARNING: $2: see the Autoconf documentation" >&2;}
1622    { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: $2:     section \"Present But Cannot Be Compiled\"" >&5
1623$as_echo "$as_me: WARNING: $2:     section \"Present But Cannot Be Compiled\"" >&2;}
1624    { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: $2: proceeding with the compiler's result" >&5
1625$as_echo "$as_me: WARNING: $2: proceeding with the compiler's result" >&2;}
1626    ;;
1627esac
1628  { $as_echo "$as_me:${as_lineno-$LINENO}: checking for $2" >&5
1629$as_echo_n "checking for $2... " >&6; }
1630if eval \${$3+:} false; then :
1631  $as_echo_n "(cached) " >&6
1632else
1633  eval "$3=\$ac_header_compiler"
1634fi
1635eval ac_res=\$$3
1636	       { $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_res" >&5
1637$as_echo "$ac_res" >&6; }
1638fi
1639  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1640
1641} # ac_fn_c_check_header_mongrel
1642
1643# ac_fn_c_try_run LINENO
1644# ----------------------
1645# Try to link conftest.$ac_ext, and return whether this succeeded. Assumes
1646# that executables *can* be run.
1647ac_fn_c_try_run ()
1648{
1649  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1650  if { { ac_try="$ac_link"
1651case "(($ac_try" in
1652  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
1653  *) ac_try_echo=$ac_try;;
1654esac
1655eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
1656$as_echo "$ac_try_echo"; } >&5
1657  (eval "$ac_link") 2>&5
1658  ac_status=$?
1659  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
1660  test $ac_status = 0; } && { ac_try='./conftest$ac_exeext'
1661  { { case "(($ac_try" in
1662  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
1663  *) ac_try_echo=$ac_try;;
1664esac
1665eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
1666$as_echo "$ac_try_echo"; } >&5
1667  (eval "$ac_try") 2>&5
1668  ac_status=$?
1669  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
1670  test $ac_status = 0; }; }; then :
1671  ac_retval=0
1672else
1673  $as_echo "$as_me: program exited with status $ac_status" >&5
1674       $as_echo "$as_me: failed program was:" >&5
1675sed 's/^/| /' conftest.$ac_ext >&5
1676
1677       ac_retval=$ac_status
1678fi
1679  rm -rf conftest.dSYM conftest_ipa8_conftest.oo
1680  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1681  as_fn_set_status $ac_retval
1682
1683} # ac_fn_c_try_run
1684
1685# ac_fn_c_check_header_compile LINENO HEADER VAR INCLUDES
1686# -------------------------------------------------------
1687# Tests whether HEADER exists and can be compiled using the include files in
1688# INCLUDES, setting the cache variable VAR accordingly.
1689ac_fn_c_check_header_compile ()
1690{
1691  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1692  { $as_echo "$as_me:${as_lineno-$LINENO}: checking for $2" >&5
1693$as_echo_n "checking for $2... " >&6; }
1694if eval \${$3+:} false; then :
1695  $as_echo_n "(cached) " >&6
1696else
1697  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1698/* end confdefs.h.  */
1699$4
1700#include <$2>
1701_ACEOF
1702if ac_fn_c_try_compile "$LINENO"; then :
1703  eval "$3=yes"
1704else
1705  eval "$3=no"
1706fi
1707rm -f core conftest.err conftest.$ac_objext conftest.$ac_ext
1708fi
1709eval ac_res=\$$3
1710	       { $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_res" >&5
1711$as_echo "$ac_res" >&6; }
1712  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1713
1714} # ac_fn_c_check_header_compile
1715
1716# ac_fn_c_check_func LINENO FUNC VAR
1717# ----------------------------------
1718# Tests whether FUNC exists, setting the cache variable VAR accordingly
1719ac_fn_c_check_func ()
1720{
1721  as_lineno=${as_lineno-"$1"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
1722  { $as_echo "$as_me:${as_lineno-$LINENO}: checking for $2" >&5
1723$as_echo_n "checking for $2... " >&6; }
1724if eval \${$3+:} false; then :
1725  $as_echo_n "(cached) " >&6
1726else
1727  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
1728/* end confdefs.h.  */
1729/* Define $2 to an innocuous variant, in case <limits.h> declares $2.
1730   For example, HP-UX 11i <limits.h> declares gettimeofday.  */
1731#define $2 innocuous_$2
1732
1733/* System header to define __stub macros and hopefully few prototypes,
1734    which can conflict with char $2 (); below.
1735    Prefer <limits.h> to <assert.h> if __STDC__ is defined, since
1736    <limits.h> exists even on freestanding compilers.  */
1737
1738#ifdef __STDC__
1739# include <limits.h>
1740#else
1741# include <assert.h>
1742#endif
1743
1744#undef $2
1745
1746/* Override any GCC internal prototype to avoid an error.
1747   Use char because int might match the return type of a GCC
1748   builtin and then its argument prototype would still apply.  */
1749#ifdef __cplusplus
1750extern "C"
1751#endif
1752char $2 ();
1753/* The GNU C library defines this for functions which it implements
1754    to always fail with ENOSYS.  Some functions are actually named
1755    something starting with __ and the normal name is an alias.  */
1756#if defined __stub_$2 || defined __stub___$2
1757choke me
1758#endif
1759
1760int
1761main ()
1762{
1763return $2 ();
1764  ;
1765  return 0;
1766}
1767_ACEOF
1768if ac_fn_c_try_link "$LINENO"; then :
1769  eval "$3=yes"
1770else
1771  eval "$3=no"
1772fi
1773rm -f core conftest.err conftest.$ac_objext \
1774    conftest$ac_exeext conftest.$ac_ext
1775fi
1776eval ac_res=\$$3
1777	       { $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_res" >&5
1778$as_echo "$ac_res" >&6; }
1779  eval $as_lineno_stack; ${as_lineno_stack:+:} unset as_lineno
1780
1781} # ac_fn_c_check_func
1782cat >config.log <<_ACEOF
1783This file contains any messages produced by compilers while
1784running configure, to aid debugging if configure makes a mistake.
1785
1786It was created by $as_me, which was
1787generated by GNU Autoconf 2.69.  Invocation command line was
1788
1789  $ $0 $@
1790
1791_ACEOF
1792exec 5>>config.log
1793{
1794cat <<_ASUNAME
1795## --------- ##
1796## Platform. ##
1797## --------- ##
1798
1799hostname = `(hostname || uname -n) 2>/dev/null | sed 1q`
1800uname -m = `(uname -m) 2>/dev/null || echo unknown`
1801uname -r = `(uname -r) 2>/dev/null || echo unknown`
1802uname -s = `(uname -s) 2>/dev/null || echo unknown`
1803uname -v = `(uname -v) 2>/dev/null || echo unknown`
1804
1805/usr/bin/uname -p = `(/usr/bin/uname -p) 2>/dev/null || echo unknown`
1806/bin/uname -X     = `(/bin/uname -X) 2>/dev/null     || echo unknown`
1807
1808/bin/arch              = `(/bin/arch) 2>/dev/null              || echo unknown`
1809/usr/bin/arch -k       = `(/usr/bin/arch -k) 2>/dev/null       || echo unknown`
1810/usr/convex/getsysinfo = `(/usr/convex/getsysinfo) 2>/dev/null || echo unknown`
1811/usr/bin/hostinfo      = `(/usr/bin/hostinfo) 2>/dev/null      || echo unknown`
1812/bin/machine           = `(/bin/machine) 2>/dev/null           || echo unknown`
1813/usr/bin/oslevel       = `(/usr/bin/oslevel) 2>/dev/null       || echo unknown`
1814/bin/universe          = `(/bin/universe) 2>/dev/null          || echo unknown`
1815
1816_ASUNAME
1817
1818as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
1819for as_dir in $PATH
1820do
1821  IFS=$as_save_IFS
1822  test -z "$as_dir" && as_dir=.
1823    $as_echo "PATH: $as_dir"
1824  done
1825IFS=$as_save_IFS
1826
1827} >&5
1828
1829cat >&5 <<_ACEOF
1830
1831
1832## ----------- ##
1833## Core tests. ##
1834## ----------- ##
1835
1836_ACEOF
1837
1838
1839# Keep a trace of the command line.
1840# Strip out --no-create and --no-recursion so they do not pile up.
1841# Strip out --silent because we don't want to record it for future runs.
1842# Also quote any args containing shell meta-characters.
1843# Make two passes to allow for proper duplicate-argument suppression.
1844ac_configure_args=
1845ac_configure_args0=
1846ac_configure_args1=
1847ac_must_keep_next=false
1848for ac_pass in 1 2
1849do
1850  for ac_arg
1851  do
1852    case $ac_arg in
1853    -no-create | --no-c* | -n | -no-recursion | --no-r*) continue ;;
1854    -q | -quiet | --quiet | --quie | --qui | --qu | --q \
1855    | -silent | --silent | --silen | --sile | --sil)
1856      continue ;;
1857    *\'*)
1858      ac_arg=`$as_echo "$ac_arg" | sed "s/'/'\\\\\\\\''/g"` ;;
1859    esac
1860    case $ac_pass in
1861    1) as_fn_append ac_configure_args0 " '$ac_arg'" ;;
1862    2)
1863      as_fn_append ac_configure_args1 " '$ac_arg'"
1864      if test $ac_must_keep_next = true; then
1865	ac_must_keep_next=false # Got value, back to normal.
1866      else
1867	case $ac_arg in
1868	  *=* | --config-cache | -C | -disable-* | --disable-* \
1869	  | -enable-* | --enable-* | -gas | --g* | -nfp | --nf* \
1870	  | -q | -quiet | --q* | -silent | --sil* | -v | -verb* \
1871	  | -with-* | --with-* | -without-* | --without-* | --x)
1872	    case "$ac_configure_args0 " in
1873	      "$ac_configure_args1"*" '$ac_arg' "* ) continue ;;
1874	    esac
1875	    ;;
1876	  -* ) ac_must_keep_next=true ;;
1877	esac
1878      fi
1879      as_fn_append ac_configure_args " '$ac_arg'"
1880      ;;
1881    esac
1882  done
1883done
1884{ ac_configure_args0=; unset ac_configure_args0;}
1885{ ac_configure_args1=; unset ac_configure_args1;}
1886
1887# When interrupted or exit'd, cleanup temporary files, and complete
1888# config.log.  We remove comments because anyway the quotes in there
1889# would cause problems or look ugly.
1890# WARNING: Use '\'' to represent an apostrophe within the trap.
1891# WARNING: Do not start the trap code with a newline, due to a FreeBSD 4.0 bug.
1892trap 'exit_status=$?
1893  # Save into config.log some information that might help in debugging.
1894  {
1895    echo
1896
1897    $as_echo "## ---------------- ##
1898## Cache variables. ##
1899## ---------------- ##"
1900    echo
1901    # The following way of writing the cache mishandles newlines in values,
1902(
1903  for ac_var in `(set) 2>&1 | sed -n '\''s/^\([a-zA-Z_][a-zA-Z0-9_]*\)=.*/\1/p'\''`; do
1904    eval ac_val=\$$ac_var
1905    case $ac_val in #(
1906    *${as_nl}*)
1907      case $ac_var in #(
1908      *_cv_*) { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: cache variable $ac_var contains a newline" >&5
1909$as_echo "$as_me: WARNING: cache variable $ac_var contains a newline" >&2;} ;;
1910      esac
1911      case $ac_var in #(
1912      _ | IFS | as_nl) ;; #(
1913      BASH_ARGV | BASH_SOURCE) eval $ac_var= ;; #(
1914      *) { eval $ac_var=; unset $ac_var;} ;;
1915      esac ;;
1916    esac
1917  done
1918  (set) 2>&1 |
1919    case $as_nl`(ac_space='\'' '\''; set) 2>&1` in #(
1920    *${as_nl}ac_space=\ *)
1921      sed -n \
1922	"s/'\''/'\''\\\\'\'''\''/g;
1923	  s/^\\([_$as_cr_alnum]*_cv_[_$as_cr_alnum]*\\)=\\(.*\\)/\\1='\''\\2'\''/p"
1924      ;; #(
1925    *)
1926      sed -n "/^[_$as_cr_alnum]*_cv_[_$as_cr_alnum]*=/p"
1927      ;;
1928    esac |
1929    sort
1930)
1931    echo
1932
1933    $as_echo "## ----------------- ##
1934## Output variables. ##
1935## ----------------- ##"
1936    echo
1937    for ac_var in $ac_subst_vars
1938    do
1939      eval ac_val=\$$ac_var
1940      case $ac_val in
1941      *\'\''*) ac_val=`$as_echo "$ac_val" | sed "s/'\''/'\''\\\\\\\\'\'''\''/g"`;;
1942      esac
1943      $as_echo "$ac_var='\''$ac_val'\''"
1944    done | sort
1945    echo
1946
1947    if test -n "$ac_subst_files"; then
1948      $as_echo "## ------------------- ##
1949## File substitutions. ##
1950## ------------------- ##"
1951      echo
1952      for ac_var in $ac_subst_files
1953      do
1954	eval ac_val=\$$ac_var
1955	case $ac_val in
1956	*\'\''*) ac_val=`$as_echo "$ac_val" | sed "s/'\''/'\''\\\\\\\\'\'''\''/g"`;;
1957	esac
1958	$as_echo "$ac_var='\''$ac_val'\''"
1959      done | sort
1960      echo
1961    fi
1962
1963    if test -s confdefs.h; then
1964      $as_echo "## ----------- ##
1965## confdefs.h. ##
1966## ----------- ##"
1967      echo
1968      cat confdefs.h
1969      echo
1970    fi
1971    test "$ac_signal" != 0 &&
1972      $as_echo "$as_me: caught signal $ac_signal"
1973    $as_echo "$as_me: exit $exit_status"
1974  } >&5
1975  rm -f core *.core core.conftest.* &&
1976    rm -f -r conftest* confdefs* conf$$* $ac_clean_files &&
1977    exit $exit_status
1978' 0
1979for ac_signal in 1 2 13 15; do
1980  trap 'ac_signal='$ac_signal'; as_fn_exit 1' $ac_signal
1981done
1982ac_signal=0
1983
1984# confdefs.h avoids OS command line length limits that DEFS can exceed.
1985rm -f -r conftest* confdefs.h
1986
1987$as_echo "/* confdefs.h */" > confdefs.h
1988
1989# Predefined preprocessor variables.
1990
1991cat >>confdefs.h <<_ACEOF
1992#define PACKAGE_NAME "$PACKAGE_NAME"
1993_ACEOF
1994
1995cat >>confdefs.h <<_ACEOF
1996#define PACKAGE_TARNAME "$PACKAGE_TARNAME"
1997_ACEOF
1998
1999cat >>confdefs.h <<_ACEOF
2000#define PACKAGE_VERSION "$PACKAGE_VERSION"
2001_ACEOF
2002
2003cat >>confdefs.h <<_ACEOF
2004#define PACKAGE_STRING "$PACKAGE_STRING"
2005_ACEOF
2006
2007cat >>confdefs.h <<_ACEOF
2008#define PACKAGE_BUGREPORT "$PACKAGE_BUGREPORT"
2009_ACEOF
2010
2011cat >>confdefs.h <<_ACEOF
2012#define PACKAGE_URL "$PACKAGE_URL"
2013_ACEOF
2014
2015
2016# Let the site file select an alternate cache file if it wants to.
2017# Prefer an explicitly selected file to automatically selected ones.
2018ac_site_file1=NONE
2019ac_site_file2=NONE
2020if test -n "$CONFIG_SITE"; then
2021  # We do not want a PATH search for config.site.
2022  case $CONFIG_SITE in #((
2023    -*)  ac_site_file1=./$CONFIG_SITE;;
2024    */*) ac_site_file1=$CONFIG_SITE;;
2025    *)   ac_site_file1=./$CONFIG_SITE;;
2026  esac
2027elif test "x$prefix" != xNONE; then
2028  ac_site_file1=$prefix/share/config.site
2029  ac_site_file2=$prefix/etc/config.site
2030else
2031  ac_site_file1=$ac_default_prefix/share/config.site
2032  ac_site_file2=$ac_default_prefix/etc/config.site
2033fi
2034for ac_site_file in "$ac_site_file1" "$ac_site_file2"
2035do
2036  test "x$ac_site_file" = xNONE && continue
2037  if test /dev/null != "$ac_site_file" && test -r "$ac_site_file"; then
2038    { $as_echo "$as_me:${as_lineno-$LINENO}: loading site script $ac_site_file" >&5
2039$as_echo "$as_me: loading site script $ac_site_file" >&6;}
2040    sed 's/^/| /' "$ac_site_file" >&5
2041    . "$ac_site_file" \
2042      || { { $as_echo "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
2043$as_echo "$as_me: error: in \`$ac_pwd':" >&2;}
2044as_fn_error $? "failed to load site script $ac_site_file
2045See \`config.log' for more details" "$LINENO" 5; }
2046  fi
2047done
2048
2049if test -r "$cache_file"; then
2050  # Some versions of bash will fail to source /dev/null (special files
2051  # actually), so we avoid doing that.  DJGPP emulates it as a regular file.
2052  if test /dev/null != "$cache_file" && test -f "$cache_file"; then
2053    { $as_echo "$as_me:${as_lineno-$LINENO}: loading cache $cache_file" >&5
2054$as_echo "$as_me: loading cache $cache_file" >&6;}
2055    case $cache_file in
2056      [\\/]* | ?:[\\/]* ) . "$cache_file";;
2057      *)                      . "./$cache_file";;
2058    esac
2059  fi
2060else
2061  { $as_echo "$as_me:${as_lineno-$LINENO}: creating cache $cache_file" >&5
2062$as_echo "$as_me: creating cache $cache_file" >&6;}
2063  >$cache_file
2064fi
2065
2066# Check that the precious variables saved in the cache have kept the same
2067# value.
2068ac_cache_corrupted=false
2069for ac_var in $ac_precious_vars; do
2070  eval ac_old_set=\$ac_cv_env_${ac_var}_set
2071  eval ac_new_set=\$ac_env_${ac_var}_set
2072  eval ac_old_val=\$ac_cv_env_${ac_var}_value
2073  eval ac_new_val=\$ac_env_${ac_var}_value
2074  case $ac_old_set,$ac_new_set in
2075    set,)
2076      { $as_echo "$as_me:${as_lineno-$LINENO}: error: \`$ac_var' was set to \`$ac_old_val' in the previous run" >&5
2077$as_echo "$as_me: error: \`$ac_var' was set to \`$ac_old_val' in the previous run" >&2;}
2078      ac_cache_corrupted=: ;;
2079    ,set)
2080      { $as_echo "$as_me:${as_lineno-$LINENO}: error: \`$ac_var' was not set in the previous run" >&5
2081$as_echo "$as_me: error: \`$ac_var' was not set in the previous run" >&2;}
2082      ac_cache_corrupted=: ;;
2083    ,);;
2084    *)
2085      if test "x$ac_old_val" != "x$ac_new_val"; then
2086	# differences in whitespace do not lead to failure.
2087	ac_old_val_w=`echo x $ac_old_val`
2088	ac_new_val_w=`echo x $ac_new_val`
2089	if test "$ac_old_val_w" != "$ac_new_val_w"; then
2090	  { $as_echo "$as_me:${as_lineno-$LINENO}: error: \`$ac_var' has changed since the previous run:" >&5
2091$as_echo "$as_me: error: \`$ac_var' has changed since the previous run:" >&2;}
2092	  ac_cache_corrupted=:
2093	else
2094	  { $as_echo "$as_me:${as_lineno-$LINENO}: warning: ignoring whitespace changes in \`$ac_var' since the previous run:" >&5
2095$as_echo "$as_me: warning: ignoring whitespace changes in \`$ac_var' since the previous run:" >&2;}
2096	  eval $ac_var=\$ac_old_val
2097	fi
2098	{ $as_echo "$as_me:${as_lineno-$LINENO}:   former value:  \`$ac_old_val'" >&5
2099$as_echo "$as_me:   former value:  \`$ac_old_val'" >&2;}
2100	{ $as_echo "$as_me:${as_lineno-$LINENO}:   current value: \`$ac_new_val'" >&5
2101$as_echo "$as_me:   current value: \`$ac_new_val'" >&2;}
2102      fi;;
2103  esac
2104  # Pass precious variables to config.status.
2105  if test "$ac_new_set" = set; then
2106    case $ac_new_val in
2107    *\'*) ac_arg=$ac_var=`$as_echo "$ac_new_val" | sed "s/'/'\\\\\\\\''/g"` ;;
2108    *) ac_arg=$ac_var=$ac_new_val ;;
2109    esac
2110    case " $ac_configure_args " in
2111      *" '$ac_arg' "*) ;; # Avoid dups.  Use of quotes ensures accuracy.
2112      *) as_fn_append ac_configure_args " '$ac_arg'" ;;
2113    esac
2114  fi
2115done
2116if $ac_cache_corrupted; then
2117  { $as_echo "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
2118$as_echo "$as_me: error: in \`$ac_pwd':" >&2;}
2119  { $as_echo "$as_me:${as_lineno-$LINENO}: error: changes in the environment can compromise the build" >&5
2120$as_echo "$as_me: error: changes in the environment can compromise the build" >&2;}
2121  as_fn_error $? "run \`make distclean' and/or \`rm $cache_file' and start over" "$LINENO" 5
2122fi
2123## -------------------- ##
2124## Main body of script. ##
2125## -------------------- ##
2126
2127ac_ext=c
2128ac_cpp='$CPP $CPPFLAGS'
2129ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
2130ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
2131ac_compiler_gnu=$ac_cv_c_compiler_gnu
2132
2133
2134
2135ac_aux_dir=
2136for ac_dir in "$srcdir" "$srcdir/.." "$srcdir/../.."; do
2137  if test -f "$ac_dir/install-sh"; then
2138    ac_aux_dir=$ac_dir
2139    ac_install_sh="$ac_aux_dir/install-sh -c"
2140    break
2141  elif test -f "$ac_dir/install.sh"; then
2142    ac_aux_dir=$ac_dir
2143    ac_install_sh="$ac_aux_dir/install.sh -c"
2144    break
2145  elif test -f "$ac_dir/shtool"; then
2146    ac_aux_dir=$ac_dir
2147    ac_install_sh="$ac_aux_dir/shtool install -c"
2148    break
2149  fi
2150done
2151if test -z "$ac_aux_dir"; then
2152  as_fn_error $? "cannot find install-sh, install.sh, or shtool in \"$srcdir\" \"$srcdir/..\" \"$srcdir/../..\"" "$LINENO" 5
2153fi
2154
2155# These three variables are undocumented and unsupported,
2156# and are intended to be withdrawn in a future Autoconf release.
2157# They can cause serious problems if a builder's source tree is in a directory
2158# whose full name contains unusual characters.
2159ac_config_guess="$SHELL $ac_aux_dir/config.guess"  # Please don't use this var.
2160ac_config_sub="$SHELL $ac_aux_dir/config.sub"  # Please don't use this var.
2161ac_configure="$SHELL $ac_aux_dir/configure"  # Please don't use this var.
2162
2163
2164# Make sure we can run config.sub.
2165$SHELL "$ac_aux_dir/config.sub" sun4 >/dev/null 2>&1 ||
2166  as_fn_error $? "cannot run $SHELL $ac_aux_dir/config.sub" "$LINENO" 5
2167
2168{ $as_echo "$as_me:${as_lineno-$LINENO}: checking build system type" >&5
2169$as_echo_n "checking build system type... " >&6; }
2170if ${ac_cv_build+:} false; then :
2171  $as_echo_n "(cached) " >&6
2172else
2173  ac_build_alias=$build_alias
2174test "x$ac_build_alias" = x &&
2175  ac_build_alias=`$SHELL "$ac_aux_dir/config.guess"`
2176test "x$ac_build_alias" = x &&
2177  as_fn_error $? "cannot guess build type; you must specify one" "$LINENO" 5
2178ac_cv_build=`$SHELL "$ac_aux_dir/config.sub" $ac_build_alias` ||
2179  as_fn_error $? "$SHELL $ac_aux_dir/config.sub $ac_build_alias failed" "$LINENO" 5
2180
2181fi
2182{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_build" >&5
2183$as_echo "$ac_cv_build" >&6; }
2184case $ac_cv_build in
2185*-*-*) ;;
2186*) as_fn_error $? "invalid value of canonical build" "$LINENO" 5;;
2187esac
2188build=$ac_cv_build
2189ac_save_IFS=$IFS; IFS='-'
2190set x $ac_cv_build
2191shift
2192build_cpu=$1
2193build_vendor=$2
2194shift; shift
2195# Remember, the first character of IFS is used to create $*,
2196# except with old shells:
2197build_os=$*
2198IFS=$ac_save_IFS
2199case $build_os in *\ *) build_os=`echo "$build_os" | sed 's/ /-/g'`;; esac
2200
2201
2202{ $as_echo "$as_me:${as_lineno-$LINENO}: checking host system type" >&5
2203$as_echo_n "checking host system type... " >&6; }
2204if ${ac_cv_host+:} false; then :
2205  $as_echo_n "(cached) " >&6
2206else
2207  if test "x$host_alias" = x; then
2208  ac_cv_host=$ac_cv_build
2209else
2210  ac_cv_host=`$SHELL "$ac_aux_dir/config.sub" $host_alias` ||
2211    as_fn_error $? "$SHELL $ac_aux_dir/config.sub $host_alias failed" "$LINENO" 5
2212fi
2213
2214fi
2215{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_host" >&5
2216$as_echo "$ac_cv_host" >&6; }
2217case $ac_cv_host in
2218*-*-*) ;;
2219*) as_fn_error $? "invalid value of canonical host" "$LINENO" 5;;
2220esac
2221host=$ac_cv_host
2222ac_save_IFS=$IFS; IFS='-'
2223set x $ac_cv_host
2224shift
2225host_cpu=$1
2226host_vendor=$2
2227shift; shift
2228# Remember, the first character of IFS is used to create $*,
2229# except with old shells:
2230host_os=$*
2231IFS=$ac_save_IFS
2232case $host_os in *\ *) host_os=`echo "$host_os" | sed 's/ /-/g'`;; esac
2233
2234
2235
2236ac_ext=c
2237ac_cpp='$CPP $CPPFLAGS'
2238ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
2239ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
2240ac_compiler_gnu=$ac_cv_c_compiler_gnu
2241if test -n "$ac_tool_prefix"; then
2242  # Extract the first word of "${ac_tool_prefix}gcc", so it can be a program name with args.
2243set dummy ${ac_tool_prefix}gcc; ac_word=$2
2244{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2245$as_echo_n "checking for $ac_word... " >&6; }
2246if ${ac_cv_prog_CC+:} false; then :
2247  $as_echo_n "(cached) " >&6
2248else
2249  if test -n "$CC"; then
2250  ac_cv_prog_CC="$CC" # Let the user override the test.
2251else
2252as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2253for as_dir in $PATH
2254do
2255  IFS=$as_save_IFS
2256  test -z "$as_dir" && as_dir=.
2257    for ac_exec_ext in '' $ac_executable_extensions; do
2258  if as_fn_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
2259    ac_cv_prog_CC="${ac_tool_prefix}gcc"
2260    $as_echo "$as_me:${as_lineno-$LINENO}: found $as_dir/$ac_word$ac_exec_ext" >&5
2261    break 2
2262  fi
2263done
2264  done
2265IFS=$as_save_IFS
2266
2267fi
2268fi
2269CC=$ac_cv_prog_CC
2270if test -n "$CC"; then
2271  { $as_echo "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
2272$as_echo "$CC" >&6; }
2273else
2274  { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
2275$as_echo "no" >&6; }
2276fi
2277
2278
2279fi
2280if test -z "$ac_cv_prog_CC"; then
2281  ac_ct_CC=$CC
2282  # Extract the first word of "gcc", so it can be a program name with args.
2283set dummy gcc; ac_word=$2
2284{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2285$as_echo_n "checking for $ac_word... " >&6; }
2286if ${ac_cv_prog_ac_ct_CC+:} false; then :
2287  $as_echo_n "(cached) " >&6
2288else
2289  if test -n "$ac_ct_CC"; then
2290  ac_cv_prog_ac_ct_CC="$ac_ct_CC" # Let the user override the test.
2291else
2292as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2293for as_dir in $PATH
2294do
2295  IFS=$as_save_IFS
2296  test -z "$as_dir" && as_dir=.
2297    for ac_exec_ext in '' $ac_executable_extensions; do
2298  if as_fn_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
2299    ac_cv_prog_ac_ct_CC="gcc"
2300    $as_echo "$as_me:${as_lineno-$LINENO}: found $as_dir/$ac_word$ac_exec_ext" >&5
2301    break 2
2302  fi
2303done
2304  done
2305IFS=$as_save_IFS
2306
2307fi
2308fi
2309ac_ct_CC=$ac_cv_prog_ac_ct_CC
2310if test -n "$ac_ct_CC"; then
2311  { $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_ct_CC" >&5
2312$as_echo "$ac_ct_CC" >&6; }
2313else
2314  { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
2315$as_echo "no" >&6; }
2316fi
2317
2318  if test "x$ac_ct_CC" = x; then
2319    CC=""
2320  else
2321    case $cross_compiling:$ac_tool_warned in
2322yes:)
2323{ $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: using cross tools not prefixed with host triplet" >&5
2324$as_echo "$as_me: WARNING: using cross tools not prefixed with host triplet" >&2;}
2325ac_tool_warned=yes ;;
2326esac
2327    CC=$ac_ct_CC
2328  fi
2329else
2330  CC="$ac_cv_prog_CC"
2331fi
2332
2333if test -z "$CC"; then
2334          if test -n "$ac_tool_prefix"; then
2335    # Extract the first word of "${ac_tool_prefix}cc", so it can be a program name with args.
2336set dummy ${ac_tool_prefix}cc; ac_word=$2
2337{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2338$as_echo_n "checking for $ac_word... " >&6; }
2339if ${ac_cv_prog_CC+:} false; then :
2340  $as_echo_n "(cached) " >&6
2341else
2342  if test -n "$CC"; then
2343  ac_cv_prog_CC="$CC" # Let the user override the test.
2344else
2345as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2346for as_dir in $PATH
2347do
2348  IFS=$as_save_IFS
2349  test -z "$as_dir" && as_dir=.
2350    for ac_exec_ext in '' $ac_executable_extensions; do
2351  if as_fn_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
2352    ac_cv_prog_CC="${ac_tool_prefix}cc"
2353    $as_echo "$as_me:${as_lineno-$LINENO}: found $as_dir/$ac_word$ac_exec_ext" >&5
2354    break 2
2355  fi
2356done
2357  done
2358IFS=$as_save_IFS
2359
2360fi
2361fi
2362CC=$ac_cv_prog_CC
2363if test -n "$CC"; then
2364  { $as_echo "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
2365$as_echo "$CC" >&6; }
2366else
2367  { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
2368$as_echo "no" >&6; }
2369fi
2370
2371
2372  fi
2373fi
2374if test -z "$CC"; then
2375  # Extract the first word of "cc", so it can be a program name with args.
2376set dummy cc; ac_word=$2
2377{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2378$as_echo_n "checking for $ac_word... " >&6; }
2379if ${ac_cv_prog_CC+:} false; then :
2380  $as_echo_n "(cached) " >&6
2381else
2382  if test -n "$CC"; then
2383  ac_cv_prog_CC="$CC" # Let the user override the test.
2384else
2385  ac_prog_rejected=no
2386as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2387for as_dir in $PATH
2388do
2389  IFS=$as_save_IFS
2390  test -z "$as_dir" && as_dir=.
2391    for ac_exec_ext in '' $ac_executable_extensions; do
2392  if as_fn_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
2393    if test "$as_dir/$ac_word$ac_exec_ext" = "/usr/ucb/cc"; then
2394       ac_prog_rejected=yes
2395       continue
2396     fi
2397    ac_cv_prog_CC="cc"
2398    $as_echo "$as_me:${as_lineno-$LINENO}: found $as_dir/$ac_word$ac_exec_ext" >&5
2399    break 2
2400  fi
2401done
2402  done
2403IFS=$as_save_IFS
2404
2405if test $ac_prog_rejected = yes; then
2406  # We found a bogon in the path, so make sure we never use it.
2407  set dummy $ac_cv_prog_CC
2408  shift
2409  if test $# != 0; then
2410    # We chose a different compiler from the bogus one.
2411    # However, it has the same basename, so the bogon will be chosen
2412    # first if we set CC to just the basename; use the full file name.
2413    shift
2414    ac_cv_prog_CC="$as_dir/$ac_word${1+' '}$@"
2415  fi
2416fi
2417fi
2418fi
2419CC=$ac_cv_prog_CC
2420if test -n "$CC"; then
2421  { $as_echo "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
2422$as_echo "$CC" >&6; }
2423else
2424  { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
2425$as_echo "no" >&6; }
2426fi
2427
2428
2429fi
2430if test -z "$CC"; then
2431  if test -n "$ac_tool_prefix"; then
2432  for ac_prog in cl.exe
2433  do
2434    # Extract the first word of "$ac_tool_prefix$ac_prog", so it can be a program name with args.
2435set dummy $ac_tool_prefix$ac_prog; ac_word=$2
2436{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2437$as_echo_n "checking for $ac_word... " >&6; }
2438if ${ac_cv_prog_CC+:} false; then :
2439  $as_echo_n "(cached) " >&6
2440else
2441  if test -n "$CC"; then
2442  ac_cv_prog_CC="$CC" # Let the user override the test.
2443else
2444as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2445for as_dir in $PATH
2446do
2447  IFS=$as_save_IFS
2448  test -z "$as_dir" && as_dir=.
2449    for ac_exec_ext in '' $ac_executable_extensions; do
2450  if as_fn_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
2451    ac_cv_prog_CC="$ac_tool_prefix$ac_prog"
2452    $as_echo "$as_me:${as_lineno-$LINENO}: found $as_dir/$ac_word$ac_exec_ext" >&5
2453    break 2
2454  fi
2455done
2456  done
2457IFS=$as_save_IFS
2458
2459fi
2460fi
2461CC=$ac_cv_prog_CC
2462if test -n "$CC"; then
2463  { $as_echo "$as_me:${as_lineno-$LINENO}: result: $CC" >&5
2464$as_echo "$CC" >&6; }
2465else
2466  { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
2467$as_echo "no" >&6; }
2468fi
2469
2470
2471    test -n "$CC" && break
2472  done
2473fi
2474if test -z "$CC"; then
2475  ac_ct_CC=$CC
2476  for ac_prog in cl.exe
2477do
2478  # Extract the first word of "$ac_prog", so it can be a program name with args.
2479set dummy $ac_prog; ac_word=$2
2480{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
2481$as_echo_n "checking for $ac_word... " >&6; }
2482if ${ac_cv_prog_ac_ct_CC+:} false; then :
2483  $as_echo_n "(cached) " >&6
2484else
2485  if test -n "$ac_ct_CC"; then
2486  ac_cv_prog_ac_ct_CC="$ac_ct_CC" # Let the user override the test.
2487else
2488as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2489for as_dir in $PATH
2490do
2491  IFS=$as_save_IFS
2492  test -z "$as_dir" && as_dir=.
2493    for ac_exec_ext in '' $ac_executable_extensions; do
2494  if as_fn_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
2495    ac_cv_prog_ac_ct_CC="$ac_prog"
2496    $as_echo "$as_me:${as_lineno-$LINENO}: found $as_dir/$ac_word$ac_exec_ext" >&5
2497    break 2
2498  fi
2499done
2500  done
2501IFS=$as_save_IFS
2502
2503fi
2504fi
2505ac_ct_CC=$ac_cv_prog_ac_ct_CC
2506if test -n "$ac_ct_CC"; then
2507  { $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_ct_CC" >&5
2508$as_echo "$ac_ct_CC" >&6; }
2509else
2510  { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
2511$as_echo "no" >&6; }
2512fi
2513
2514
2515  test -n "$ac_ct_CC" && break
2516done
2517
2518  if test "x$ac_ct_CC" = x; then
2519    CC=""
2520  else
2521    case $cross_compiling:$ac_tool_warned in
2522yes:)
2523{ $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: using cross tools not prefixed with host triplet" >&5
2524$as_echo "$as_me: WARNING: using cross tools not prefixed with host triplet" >&2;}
2525ac_tool_warned=yes ;;
2526esac
2527    CC=$ac_ct_CC
2528  fi
2529fi
2530
2531fi
2532
2533
2534test -z "$CC" && { { $as_echo "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
2535$as_echo "$as_me: error: in \`$ac_pwd':" >&2;}
2536as_fn_error $? "no acceptable C compiler found in \$PATH
2537See \`config.log' for more details" "$LINENO" 5; }
2538
2539# Provide some information about the compiler.
2540$as_echo "$as_me:${as_lineno-$LINENO}: checking for C compiler version" >&5
2541set X $ac_compile
2542ac_compiler=$2
2543for ac_option in --version -v -V -qversion; do
2544  { { ac_try="$ac_compiler $ac_option >&5"
2545case "(($ac_try" in
2546  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
2547  *) ac_try_echo=$ac_try;;
2548esac
2549eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
2550$as_echo "$ac_try_echo"; } >&5
2551  (eval "$ac_compiler $ac_option >&5") 2>conftest.err
2552  ac_status=$?
2553  if test -s conftest.err; then
2554    sed '10a\
2555... rest of stderr output deleted ...
2556         10q' conftest.err >conftest.er1
2557    cat conftest.er1 >&5
2558  fi
2559  rm -f conftest.er1 conftest.err
2560  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
2561  test $ac_status = 0; }
2562done
2563
2564cat confdefs.h - <<_ACEOF >conftest.$ac_ext
2565/* end confdefs.h.  */
2566
2567int
2568main ()
2569{
2570
2571  ;
2572  return 0;
2573}
2574_ACEOF
2575ac_clean_files_save=$ac_clean_files
2576ac_clean_files="$ac_clean_files a.out a.out.dSYM a.exe b.out"
2577# Try to create an executable without -o first, disregard a.out.
2578# It will help us diagnose broken compilers, and finding out an intuition
2579# of exeext.
2580{ $as_echo "$as_me:${as_lineno-$LINENO}: checking whether the C compiler works" >&5
2581$as_echo_n "checking whether the C compiler works... " >&6; }
2582ac_link_default=`$as_echo "$ac_link" | sed 's/ -o *conftest[^ ]*//'`
2583
2584# The possible output files:
2585ac_files="a.out conftest.exe conftest a.exe a_out.exe b.out conftest.*"
2586
2587ac_rmfiles=
2588for ac_file in $ac_files
2589do
2590  case $ac_file in
2591    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.map | *.inf | *.dSYM | *.o | *.obj ) ;;
2592    * ) ac_rmfiles="$ac_rmfiles $ac_file";;
2593  esac
2594done
2595rm -f $ac_rmfiles
2596
2597if { { ac_try="$ac_link_default"
2598case "(($ac_try" in
2599  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
2600  *) ac_try_echo=$ac_try;;
2601esac
2602eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
2603$as_echo "$ac_try_echo"; } >&5
2604  (eval "$ac_link_default") 2>&5
2605  ac_status=$?
2606  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
2607  test $ac_status = 0; }; then :
2608  # Autoconf-2.13 could set the ac_cv_exeext variable to `no'.
2609# So ignore a value of `no', otherwise this would lead to `EXEEXT = no'
2610# in a Makefile.  We should not override ac_cv_exeext if it was cached,
2611# so that the user can short-circuit this test for compilers unknown to
2612# Autoconf.
2613for ac_file in $ac_files ''
2614do
2615  test -f "$ac_file" || continue
2616  case $ac_file in
2617    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.map | *.inf | *.dSYM | *.o | *.obj )
2618	;;
2619    [ab].out )
2620	# We found the default executable, but exeext='' is most
2621	# certainly right.
2622	break;;
2623    *.* )
2624	if test "${ac_cv_exeext+set}" = set && test "$ac_cv_exeext" != no;
2625	then :; else
2626	   ac_cv_exeext=`expr "$ac_file" : '[^.]*\(\..*\)'`
2627	fi
2628	# We set ac_cv_exeext here because the later test for it is not
2629	# safe: cross compilers may not add the suffix if given an `-o'
2630	# argument, so we may need to know it at that point already.
2631	# Even if this section looks crufty: it has the advantage of
2632	# actually working.
2633	break;;
2634    * )
2635	break;;
2636  esac
2637done
2638test "$ac_cv_exeext" = no && ac_cv_exeext=
2639
2640else
2641  ac_file=''
2642fi
2643if test -z "$ac_file"; then :
2644  { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
2645$as_echo "no" >&6; }
2646$as_echo "$as_me: failed program was:" >&5
2647sed 's/^/| /' conftest.$ac_ext >&5
2648
2649{ { $as_echo "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
2650$as_echo "$as_me: error: in \`$ac_pwd':" >&2;}
2651as_fn_error 77 "C compiler cannot create executables
2652See \`config.log' for more details" "$LINENO" 5; }
2653else
2654  { $as_echo "$as_me:${as_lineno-$LINENO}: result: yes" >&5
2655$as_echo "yes" >&6; }
2656fi
2657{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for C compiler default output file name" >&5
2658$as_echo_n "checking for C compiler default output file name... " >&6; }
2659{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_file" >&5
2660$as_echo "$ac_file" >&6; }
2661ac_exeext=$ac_cv_exeext
2662
2663rm -f -r a.out a.out.dSYM a.exe conftest$ac_cv_exeext b.out
2664ac_clean_files=$ac_clean_files_save
2665{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for suffix of executables" >&5
2666$as_echo_n "checking for suffix of executables... " >&6; }
2667if { { ac_try="$ac_link"
2668case "(($ac_try" in
2669  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
2670  *) ac_try_echo=$ac_try;;
2671esac
2672eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
2673$as_echo "$ac_try_echo"; } >&5
2674  (eval "$ac_link") 2>&5
2675  ac_status=$?
2676  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
2677  test $ac_status = 0; }; then :
2678  # If both `conftest.exe' and `conftest' are `present' (well, observable)
2679# catch `conftest.exe'.  For instance with Cygwin, `ls conftest' will
2680# work properly (i.e., refer to `conftest.exe'), while it won't with
2681# `rm'.
2682for ac_file in conftest.exe conftest conftest.*; do
2683  test -f "$ac_file" || continue
2684  case $ac_file in
2685    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.map | *.inf | *.dSYM | *.o | *.obj ) ;;
2686    *.* ) ac_cv_exeext=`expr "$ac_file" : '[^.]*\(\..*\)'`
2687	  break;;
2688    * ) break;;
2689  esac
2690done
2691else
2692  { { $as_echo "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
2693$as_echo "$as_me: error: in \`$ac_pwd':" >&2;}
2694as_fn_error $? "cannot compute suffix of executables: cannot compile and link
2695See \`config.log' for more details" "$LINENO" 5; }
2696fi
2697rm -f conftest conftest$ac_cv_exeext
2698{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_exeext" >&5
2699$as_echo "$ac_cv_exeext" >&6; }
2700
2701rm -f conftest.$ac_ext
2702EXEEXT=$ac_cv_exeext
2703ac_exeext=$EXEEXT
2704cat confdefs.h - <<_ACEOF >conftest.$ac_ext
2705/* end confdefs.h.  */
2706#include <stdio.h>
2707int
2708main ()
2709{
2710FILE *f = fopen ("conftest.out", "w");
2711 return ferror (f) || fclose (f) != 0;
2712
2713  ;
2714  return 0;
2715}
2716_ACEOF
2717ac_clean_files="$ac_clean_files conftest.out"
2718# Check that the compiler produces executables we can run.  If not, either
2719# the compiler is broken, or we cross compile.
2720{ $as_echo "$as_me:${as_lineno-$LINENO}: checking whether we are cross compiling" >&5
2721$as_echo_n "checking whether we are cross compiling... " >&6; }
2722if test "$cross_compiling" != yes; then
2723  { { ac_try="$ac_link"
2724case "(($ac_try" in
2725  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
2726  *) ac_try_echo=$ac_try;;
2727esac
2728eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
2729$as_echo "$ac_try_echo"; } >&5
2730  (eval "$ac_link") 2>&5
2731  ac_status=$?
2732  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
2733  test $ac_status = 0; }
2734  if { ac_try='./conftest$ac_cv_exeext'
2735  { { case "(($ac_try" in
2736  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
2737  *) ac_try_echo=$ac_try;;
2738esac
2739eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
2740$as_echo "$ac_try_echo"; } >&5
2741  (eval "$ac_try") 2>&5
2742  ac_status=$?
2743  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
2744  test $ac_status = 0; }; }; then
2745    cross_compiling=no
2746  else
2747    if test "$cross_compiling" = maybe; then
2748	cross_compiling=yes
2749    else
2750	{ { $as_echo "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
2751$as_echo "$as_me: error: in \`$ac_pwd':" >&2;}
2752as_fn_error $? "cannot run C compiled programs.
2753If you meant to cross compile, use \`--host'.
2754See \`config.log' for more details" "$LINENO" 5; }
2755    fi
2756  fi
2757fi
2758{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $cross_compiling" >&5
2759$as_echo "$cross_compiling" >&6; }
2760
2761rm -f conftest.$ac_ext conftest$ac_cv_exeext conftest.out
2762ac_clean_files=$ac_clean_files_save
2763{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for suffix of object files" >&5
2764$as_echo_n "checking for suffix of object files... " >&6; }
2765if ${ac_cv_objext+:} false; then :
2766  $as_echo_n "(cached) " >&6
2767else
2768  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
2769/* end confdefs.h.  */
2770
2771int
2772main ()
2773{
2774
2775  ;
2776  return 0;
2777}
2778_ACEOF
2779rm -f conftest.o conftest.obj
2780if { { ac_try="$ac_compile"
2781case "(($ac_try" in
2782  *\"* | *\`* | *\\*) ac_try_echo=\$ac_try;;
2783  *) ac_try_echo=$ac_try;;
2784esac
2785eval ac_try_echo="\"\$as_me:${as_lineno-$LINENO}: $ac_try_echo\""
2786$as_echo "$ac_try_echo"; } >&5
2787  (eval "$ac_compile") 2>&5
2788  ac_status=$?
2789  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
2790  test $ac_status = 0; }; then :
2791  for ac_file in conftest.o conftest.obj conftest.*; do
2792  test -f "$ac_file" || continue;
2793  case $ac_file in
2794    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.map | *.inf | *.dSYM ) ;;
2795    *) ac_cv_objext=`expr "$ac_file" : '.*\.\(.*\)'`
2796       break;;
2797  esac
2798done
2799else
2800  $as_echo "$as_me: failed program was:" >&5
2801sed 's/^/| /' conftest.$ac_ext >&5
2802
2803{ { $as_echo "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
2804$as_echo "$as_me: error: in \`$ac_pwd':" >&2;}
2805as_fn_error $? "cannot compute suffix of object files: cannot compile
2806See \`config.log' for more details" "$LINENO" 5; }
2807fi
2808rm -f conftest.$ac_cv_objext conftest.$ac_ext
2809fi
2810{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_objext" >&5
2811$as_echo "$ac_cv_objext" >&6; }
2812OBJEXT=$ac_cv_objext
2813ac_objext=$OBJEXT
2814{ $as_echo "$as_me:${as_lineno-$LINENO}: checking whether we are using the GNU C compiler" >&5
2815$as_echo_n "checking whether we are using the GNU C compiler... " >&6; }
2816if ${ac_cv_c_compiler_gnu+:} false; then :
2817  $as_echo_n "(cached) " >&6
2818else
2819  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
2820/* end confdefs.h.  */
2821
2822int
2823main ()
2824{
2825#ifndef __GNUC__
2826       choke me
2827#endif
2828
2829  ;
2830  return 0;
2831}
2832_ACEOF
2833if ac_fn_c_try_compile "$LINENO"; then :
2834  ac_compiler_gnu=yes
2835else
2836  ac_compiler_gnu=no
2837fi
2838rm -f core conftest.err conftest.$ac_objext conftest.$ac_ext
2839ac_cv_c_compiler_gnu=$ac_compiler_gnu
2840
2841fi
2842{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_c_compiler_gnu" >&5
2843$as_echo "$ac_cv_c_compiler_gnu" >&6; }
2844if test $ac_compiler_gnu = yes; then
2845  GCC=yes
2846else
2847  GCC=
2848fi
2849ac_test_CFLAGS=${CFLAGS+set}
2850ac_save_CFLAGS=$CFLAGS
2851{ $as_echo "$as_me:${as_lineno-$LINENO}: checking whether $CC accepts -g" >&5
2852$as_echo_n "checking whether $CC accepts -g... " >&6; }
2853if ${ac_cv_prog_cc_g+:} false; then :
2854  $as_echo_n "(cached) " >&6
2855else
2856  ac_save_c_werror_flag=$ac_c_werror_flag
2857   ac_c_werror_flag=yes
2858   ac_cv_prog_cc_g=no
2859   CFLAGS="-g"
2860   cat confdefs.h - <<_ACEOF >conftest.$ac_ext
2861/* end confdefs.h.  */
2862
2863int
2864main ()
2865{
2866
2867  ;
2868  return 0;
2869}
2870_ACEOF
2871if ac_fn_c_try_compile "$LINENO"; then :
2872  ac_cv_prog_cc_g=yes
2873else
2874  CFLAGS=""
2875      cat confdefs.h - <<_ACEOF >conftest.$ac_ext
2876/* end confdefs.h.  */
2877
2878int
2879main ()
2880{
2881
2882  ;
2883  return 0;
2884}
2885_ACEOF
2886if ac_fn_c_try_compile "$LINENO"; then :
2887
2888else
2889  ac_c_werror_flag=$ac_save_c_werror_flag
2890	 CFLAGS="-g"
2891	 cat confdefs.h - <<_ACEOF >conftest.$ac_ext
2892/* end confdefs.h.  */
2893
2894int
2895main ()
2896{
2897
2898  ;
2899  return 0;
2900}
2901_ACEOF
2902if ac_fn_c_try_compile "$LINENO"; then :
2903  ac_cv_prog_cc_g=yes
2904fi
2905rm -f core conftest.err conftest.$ac_objext conftest.$ac_ext
2906fi
2907rm -f core conftest.err conftest.$ac_objext conftest.$ac_ext
2908fi
2909rm -f core conftest.err conftest.$ac_objext conftest.$ac_ext
2910   ac_c_werror_flag=$ac_save_c_werror_flag
2911fi
2912{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_prog_cc_g" >&5
2913$as_echo "$ac_cv_prog_cc_g" >&6; }
2914if test "$ac_test_CFLAGS" = set; then
2915  CFLAGS=$ac_save_CFLAGS
2916elif test $ac_cv_prog_cc_g = yes; then
2917  if test "$GCC" = yes; then
2918    CFLAGS="-g -O2"
2919  else
2920    CFLAGS="-g"
2921  fi
2922else
2923  if test "$GCC" = yes; then
2924    CFLAGS="-O2"
2925  else
2926    CFLAGS=
2927  fi
2928fi
2929{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for $CC option to accept ISO C89" >&5
2930$as_echo_n "checking for $CC option to accept ISO C89... " >&6; }
2931if ${ac_cv_prog_cc_c89+:} false; then :
2932  $as_echo_n "(cached) " >&6
2933else
2934  ac_cv_prog_cc_c89=no
2935ac_save_CC=$CC
2936cat confdefs.h - <<_ACEOF >conftest.$ac_ext
2937/* end confdefs.h.  */
2938#include <stdarg.h>
2939#include <stdio.h>
2940struct stat;
2941/* Most of the following tests are stolen from RCS 5.7's src/conf.sh.  */
2942struct buf { int x; };
2943FILE * (*rcsopen) (struct buf *, struct stat *, int);
2944static char *e (p, i)
2945     char **p;
2946     int i;
2947{
2948  return p[i];
2949}
2950static char *f (char * (*g) (char **, int), char **p, ...)
2951{
2952  char *s;
2953  va_list v;
2954  va_start (v,p);
2955  s = g (p, va_arg (v,int));
2956  va_end (v);
2957  return s;
2958}
2959
2960/* OSF 4.0 Compaq cc is some sort of almost-ANSI by default.  It has
2961   function prototypes and stuff, but not '\xHH' hex character constants.
2962   These don't provoke an error unfortunately, instead are silently treated
2963   as 'x'.  The following induces an error, until -std is added to get
2964   proper ANSI mode.  Curiously '\x00'!='x' always comes out true, for an
2965   array size at least.  It's necessary to write '\x00'==0 to get something
2966   that's true only with -std.  */
2967int osf4_cc_array ['\x00' == 0 ? 1 : -1];
2968
2969/* IBM C 6 for AIX is almost-ANSI by default, but it replaces macro parameters
2970   inside strings and character constants.  */
2971#define FOO(x) 'x'
2972int xlc6_cc_array[FOO(a) == 'x' ? 1 : -1];
2973
2974int test (int i, double x);
2975struct s1 {int (*f) (int a);};
2976struct s2 {int (*f) (double a);};
2977int pairnames (int, char **, FILE *(*)(struct buf *, struct stat *, int), int, int);
2978int argc;
2979char **argv;
2980int
2981main ()
2982{
2983return f (e, argv, 0) != argv[0]  ||  f (e, argv, 1) != argv[1];
2984  ;
2985  return 0;
2986}
2987_ACEOF
2988for ac_arg in '' -qlanglvl=extc89 -qlanglvl=ansi -std \
2989	-Ae "-Aa -D_HPUX_SOURCE" "-Xc -D__EXTENSIONS__"
2990do
2991  CC="$ac_save_CC $ac_arg"
2992  if ac_fn_c_try_compile "$LINENO"; then :
2993  ac_cv_prog_cc_c89=$ac_arg
2994fi
2995rm -f core conftest.err conftest.$ac_objext
2996  test "x$ac_cv_prog_cc_c89" != "xno" && break
2997done
2998rm -f conftest.$ac_ext
2999CC=$ac_save_CC
3000
3001fi
3002# AC_CACHE_VAL
3003case "x$ac_cv_prog_cc_c89" in
3004  x)
3005    { $as_echo "$as_me:${as_lineno-$LINENO}: result: none needed" >&5
3006$as_echo "none needed" >&6; } ;;
3007  xno)
3008    { $as_echo "$as_me:${as_lineno-$LINENO}: result: unsupported" >&5
3009$as_echo "unsupported" >&6; } ;;
3010  *)
3011    CC="$CC $ac_cv_prog_cc_c89"
3012    { $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_prog_cc_c89" >&5
3013$as_echo "$ac_cv_prog_cc_c89" >&6; } ;;
3014esac
3015if test "x$ac_cv_prog_cc_c89" != xno; then :
3016
3017fi
3018
3019ac_ext=c
3020ac_cpp='$CPP $CPPFLAGS'
3021ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
3022ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
3023ac_compiler_gnu=$ac_cv_c_compiler_gnu
3024
3025
3026DEBUG_FLAGS="-g -DDEBUG"
3027if test "$GCC" = yes; then
3028	DEBUG_FLAGS="$DEBUG_FLAGS -Wall $CFLAGS"
3029fi
3030
3031
3032# Check whether --enable-debug-mode was given.
3033if test "${enable_debug_mode+set}" = set; then :
3034  enableval=$enable_debug_mode;  case "$enableval" in
3035    no) ;;
3036    *)  CFLAGS=$DEBUG_FLAGS ;;
3037  esac
3038fi
3039
3040
3041# Check whether --enable-m64-build was given.
3042if test "${enable_m64_build+set}" = set; then :
3043  enableval=$enable_m64_build;  case "$enableval" in
3044    no) enable_m64_build=no ;;
3045    *)  enable_m64_build=yes ;;
3046  esac
3047
3048else
3049  enable_m64_build=no
3050fi
3051
3052
3053# Check whether --enable-m32-build was given.
3054if test "${enable_m32_build+set}" = set; then :
3055  enableval=$enable_m32_build;  case "$enableval" in
3056    no) enable_m32_build=no ;;
3057    *)  enable_m32_build=yes ;;
3058  esac
3059
3060else
3061  enable_m32_build=no
3062fi
3063
3064
3065no_mXX_LDFLAGS="$LDFLAGS"
3066
3067if test X${enable_m64_build} = Xyes; then
3068	CFLAGS="-m64 $CFLAGS"
3069	LDFLAGS="-m64 $LDFLAGS"
3070fi
3071if test X${enable_m32_build} = Xyes; then
3072	CFLAGS="-m32 $CFLAGS"
3073	LDFLAGS="-m32 $LDFLAGS"
3074fi
3075
3076
3077{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for sin in -lm" >&5
3078$as_echo_n "checking for sin in -lm... " >&6; }
3079if ${ac_cv_lib_m_sin+:} false; then :
3080  $as_echo_n "(cached) " >&6
3081else
3082  ac_check_lib_save_LIBS=$LIBS
3083LIBS="-lm  $LIBS"
3084cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3085/* end confdefs.h.  */
3086
3087/* Override any GCC internal prototype to avoid an error.
3088   Use char because int might match the return type of a GCC
3089   builtin and then its argument prototype would still apply.  */
3090#ifdef __cplusplus
3091extern "C"
3092#endif
3093char sin ();
3094int
3095main ()
3096{
3097return sin ();
3098  ;
3099  return 0;
3100}
3101_ACEOF
3102if ac_fn_c_try_link "$LINENO"; then :
3103  ac_cv_lib_m_sin=yes
3104else
3105  ac_cv_lib_m_sin=no
3106fi
3107rm -f core conftest.err conftest.$ac_objext \
3108    conftest$ac_exeext conftest.$ac_ext
3109LIBS=$ac_check_lib_save_LIBS
3110fi
3111{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_lib_m_sin" >&5
3112$as_echo "$ac_cv_lib_m_sin" >&6; }
3113if test "x$ac_cv_lib_m_sin" = xyes; then :
3114  cat >>confdefs.h <<_ACEOF
3115#define HAVE_LIBM 1
3116_ACEOF
3117
3118  LIBS="-lm $LIBS"
3119
3120fi
3121
3122
3123#--------------------------------------------------------------------
3124#	Interactive UNIX requires -linet instead of -lsocket, plus it
3125#	needs net/errno.h to define the socket-related error codes.
3126#--------------------------------------------------------------------
3127
3128{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for main in -linet" >&5
3129$as_echo_n "checking for main in -linet... " >&6; }
3130if ${ac_cv_lib_inet_main+:} false; then :
3131  $as_echo_n "(cached) " >&6
3132else
3133  ac_check_lib_save_LIBS=$LIBS
3134LIBS="-linet  $LIBS"
3135cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3136/* end confdefs.h.  */
3137
3138
3139int
3140main ()
3141{
3142return main ();
3143  ;
3144  return 0;
3145}
3146_ACEOF
3147if ac_fn_c_try_link "$LINENO"; then :
3148  ac_cv_lib_inet_main=yes
3149else
3150  ac_cv_lib_inet_main=no
3151fi
3152rm -f core conftest.err conftest.$ac_objext \
3153    conftest$ac_exeext conftest.$ac_ext
3154LIBS=$ac_check_lib_save_LIBS
3155fi
3156{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_lib_inet_main" >&5
3157$as_echo "$ac_cv_lib_inet_main" >&6; }
3158if test "x$ac_cv_lib_inet_main" = xyes; then :
3159  LIBS="$LIBS -linet"
3160fi
3161
3162ac_ext=c
3163ac_cpp='$CPP $CPPFLAGS'
3164ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
3165ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
3166ac_compiler_gnu=$ac_cv_c_compiler_gnu
3167{ $as_echo "$as_me:${as_lineno-$LINENO}: checking how to run the C preprocessor" >&5
3168$as_echo_n "checking how to run the C preprocessor... " >&6; }
3169# On Suns, sometimes $CPP names a directory.
3170if test -n "$CPP" && test -d "$CPP"; then
3171  CPP=
3172fi
3173if test -z "$CPP"; then
3174  if ${ac_cv_prog_CPP+:} false; then :
3175  $as_echo_n "(cached) " >&6
3176else
3177      # Double quotes because CPP needs to be expanded
3178    for CPP in "$CC -E" "$CC -E -traditional-cpp" "/lib/cpp"
3179    do
3180      ac_preproc_ok=false
3181for ac_c_preproc_warn_flag in '' yes
3182do
3183  # Use a header file that comes with gcc, so configuring glibc
3184  # with a fresh cross-compiler works.
3185  # Prefer <limits.h> to <assert.h> if __STDC__ is defined, since
3186  # <limits.h> exists even on freestanding compilers.
3187  # On the NeXT, cc -E runs the code through the compiler's parser,
3188  # not just through cpp. "Syntax error" is here to catch this case.
3189  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3190/* end confdefs.h.  */
3191#ifdef __STDC__
3192# include <limits.h>
3193#else
3194# include <assert.h>
3195#endif
3196		     Syntax error
3197_ACEOF
3198if ac_fn_c_try_cpp "$LINENO"; then :
3199
3200else
3201  # Broken: fails on valid input.
3202continue
3203fi
3204rm -f conftest.err conftest.i conftest.$ac_ext
3205
3206  # OK, works on sane cases.  Now check whether nonexistent headers
3207  # can be detected and how.
3208  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3209/* end confdefs.h.  */
3210#include <ac_nonexistent.h>
3211_ACEOF
3212if ac_fn_c_try_cpp "$LINENO"; then :
3213  # Broken: success on invalid input.
3214continue
3215else
3216  # Passes both tests.
3217ac_preproc_ok=:
3218break
3219fi
3220rm -f conftest.err conftest.i conftest.$ac_ext
3221
3222done
3223# Because of `break', _AC_PREPROC_IFELSE's cleaning code was skipped.
3224rm -f conftest.i conftest.err conftest.$ac_ext
3225if $ac_preproc_ok; then :
3226  break
3227fi
3228
3229    done
3230    ac_cv_prog_CPP=$CPP
3231
3232fi
3233  CPP=$ac_cv_prog_CPP
3234else
3235  ac_cv_prog_CPP=$CPP
3236fi
3237{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $CPP" >&5
3238$as_echo "$CPP" >&6; }
3239ac_preproc_ok=false
3240for ac_c_preproc_warn_flag in '' yes
3241do
3242  # Use a header file that comes with gcc, so configuring glibc
3243  # with a fresh cross-compiler works.
3244  # Prefer <limits.h> to <assert.h> if __STDC__ is defined, since
3245  # <limits.h> exists even on freestanding compilers.
3246  # On the NeXT, cc -E runs the code through the compiler's parser,
3247  # not just through cpp. "Syntax error" is here to catch this case.
3248  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3249/* end confdefs.h.  */
3250#ifdef __STDC__
3251# include <limits.h>
3252#else
3253# include <assert.h>
3254#endif
3255		     Syntax error
3256_ACEOF
3257if ac_fn_c_try_cpp "$LINENO"; then :
3258
3259else
3260  # Broken: fails on valid input.
3261continue
3262fi
3263rm -f conftest.err conftest.i conftest.$ac_ext
3264
3265  # OK, works on sane cases.  Now check whether nonexistent headers
3266  # can be detected and how.
3267  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3268/* end confdefs.h.  */
3269#include <ac_nonexistent.h>
3270_ACEOF
3271if ac_fn_c_try_cpp "$LINENO"; then :
3272  # Broken: success on invalid input.
3273continue
3274else
3275  # Passes both tests.
3276ac_preproc_ok=:
3277break
3278fi
3279rm -f conftest.err conftest.i conftest.$ac_ext
3280
3281done
3282# Because of `break', _AC_PREPROC_IFELSE's cleaning code was skipped.
3283rm -f conftest.i conftest.err conftest.$ac_ext
3284if $ac_preproc_ok; then :
3285
3286else
3287  { { $as_echo "$as_me:${as_lineno-$LINENO}: error: in \`$ac_pwd':" >&5
3288$as_echo "$as_me: error: in \`$ac_pwd':" >&2;}
3289as_fn_error $? "C preprocessor \"$CPP\" fails sanity check
3290See \`config.log' for more details" "$LINENO" 5; }
3291fi
3292
3293ac_ext=c
3294ac_cpp='$CPP $CPPFLAGS'
3295ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
3296ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
3297ac_compiler_gnu=$ac_cv_c_compiler_gnu
3298
3299
3300{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for grep that handles long lines and -e" >&5
3301$as_echo_n "checking for grep that handles long lines and -e... " >&6; }
3302if ${ac_cv_path_GREP+:} false; then :
3303  $as_echo_n "(cached) " >&6
3304else
3305  if test -z "$GREP"; then
3306  ac_path_GREP_found=false
3307  # Loop through the user's path and test for each of PROGNAME-LIST
3308  as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
3309for as_dir in $PATH$PATH_SEPARATOR/usr/xpg4/bin
3310do
3311  IFS=$as_save_IFS
3312  test -z "$as_dir" && as_dir=.
3313    for ac_prog in grep ggrep; do
3314    for ac_exec_ext in '' $ac_executable_extensions; do
3315      ac_path_GREP="$as_dir/$ac_prog$ac_exec_ext"
3316      as_fn_executable_p "$ac_path_GREP" || continue
3317# Check for GNU ac_path_GREP and select it if it is found.
3318  # Check for GNU $ac_path_GREP
3319case `"$ac_path_GREP" --version 2>&1` in
3320*GNU*)
3321  ac_cv_path_GREP="$ac_path_GREP" ac_path_GREP_found=:;;
3322*)
3323  ac_count=0
3324  $as_echo_n 0123456789 >"conftest.in"
3325  while :
3326  do
3327    cat "conftest.in" "conftest.in" >"conftest.tmp"
3328    mv "conftest.tmp" "conftest.in"
3329    cp "conftest.in" "conftest.nl"
3330    $as_echo 'GREP' >> "conftest.nl"
3331    "$ac_path_GREP" -e 'GREP$' -e '-(cannot match)-' < "conftest.nl" >"conftest.out" 2>/dev/null || break
3332    diff "conftest.out" "conftest.nl" >/dev/null 2>&1 || break
3333    as_fn_arith $ac_count + 1 && ac_count=$as_val
3334    if test $ac_count -gt ${ac_path_GREP_max-0}; then
3335      # Best one so far, save it but keep looking for a better one
3336      ac_cv_path_GREP="$ac_path_GREP"
3337      ac_path_GREP_max=$ac_count
3338    fi
3339    # 10*(2^10) chars as input seems more than enough
3340    test $ac_count -gt 10 && break
3341  done
3342  rm -f conftest.in conftest.tmp conftest.nl conftest.out;;
3343esac
3344
3345      $ac_path_GREP_found && break 3
3346    done
3347  done
3348  done
3349IFS=$as_save_IFS
3350  if test -z "$ac_cv_path_GREP"; then
3351    as_fn_error $? "no acceptable grep could be found in $PATH$PATH_SEPARATOR/usr/xpg4/bin" "$LINENO" 5
3352  fi
3353else
3354  ac_cv_path_GREP=$GREP
3355fi
3356
3357fi
3358{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_path_GREP" >&5
3359$as_echo "$ac_cv_path_GREP" >&6; }
3360 GREP="$ac_cv_path_GREP"
3361
3362
3363{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for egrep" >&5
3364$as_echo_n "checking for egrep... " >&6; }
3365if ${ac_cv_path_EGREP+:} false; then :
3366  $as_echo_n "(cached) " >&6
3367else
3368  if echo a | $GREP -E '(a|b)' >/dev/null 2>&1
3369   then ac_cv_path_EGREP="$GREP -E"
3370   else
3371     if test -z "$EGREP"; then
3372  ac_path_EGREP_found=false
3373  # Loop through the user's path and test for each of PROGNAME-LIST
3374  as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
3375for as_dir in $PATH$PATH_SEPARATOR/usr/xpg4/bin
3376do
3377  IFS=$as_save_IFS
3378  test -z "$as_dir" && as_dir=.
3379    for ac_prog in egrep; do
3380    for ac_exec_ext in '' $ac_executable_extensions; do
3381      ac_path_EGREP="$as_dir/$ac_prog$ac_exec_ext"
3382      as_fn_executable_p "$ac_path_EGREP" || continue
3383# Check for GNU ac_path_EGREP and select it if it is found.
3384  # Check for GNU $ac_path_EGREP
3385case `"$ac_path_EGREP" --version 2>&1` in
3386*GNU*)
3387  ac_cv_path_EGREP="$ac_path_EGREP" ac_path_EGREP_found=:;;
3388*)
3389  ac_count=0
3390  $as_echo_n 0123456789 >"conftest.in"
3391  while :
3392  do
3393    cat "conftest.in" "conftest.in" >"conftest.tmp"
3394    mv "conftest.tmp" "conftest.in"
3395    cp "conftest.in" "conftest.nl"
3396    $as_echo 'EGREP' >> "conftest.nl"
3397    "$ac_path_EGREP" 'EGREP$' < "conftest.nl" >"conftest.out" 2>/dev/null || break
3398    diff "conftest.out" "conftest.nl" >/dev/null 2>&1 || break
3399    as_fn_arith $ac_count + 1 && ac_count=$as_val
3400    if test $ac_count -gt ${ac_path_EGREP_max-0}; then
3401      # Best one so far, save it but keep looking for a better one
3402      ac_cv_path_EGREP="$ac_path_EGREP"
3403      ac_path_EGREP_max=$ac_count
3404    fi
3405    # 10*(2^10) chars as input seems more than enough
3406    test $ac_count -gt 10 && break
3407  done
3408  rm -f conftest.in conftest.tmp conftest.nl conftest.out;;
3409esac
3410
3411      $ac_path_EGREP_found && break 3
3412    done
3413  done
3414  done
3415IFS=$as_save_IFS
3416  if test -z "$ac_cv_path_EGREP"; then
3417    as_fn_error $? "no acceptable egrep could be found in $PATH$PATH_SEPARATOR/usr/xpg4/bin" "$LINENO" 5
3418  fi
3419else
3420  ac_cv_path_EGREP=$EGREP
3421fi
3422
3423   fi
3424fi
3425{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_path_EGREP" >&5
3426$as_echo "$ac_cv_path_EGREP" >&6; }
3427 EGREP="$ac_cv_path_EGREP"
3428
3429
3430{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for ANSI C header files" >&5
3431$as_echo_n "checking for ANSI C header files... " >&6; }
3432if ${ac_cv_header_stdc+:} false; then :
3433  $as_echo_n "(cached) " >&6
3434else
3435  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3436/* end confdefs.h.  */
3437#include <stdlib.h>
3438#include <stdarg.h>
3439#include <string.h>
3440#include <float.h>
3441
3442int
3443main ()
3444{
3445
3446  ;
3447  return 0;
3448}
3449_ACEOF
3450if ac_fn_c_try_compile "$LINENO"; then :
3451  ac_cv_header_stdc=yes
3452else
3453  ac_cv_header_stdc=no
3454fi
3455rm -f core conftest.err conftest.$ac_objext conftest.$ac_ext
3456
3457if test $ac_cv_header_stdc = yes; then
3458  # SunOS 4.x string.h does not declare mem*, contrary to ANSI.
3459  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3460/* end confdefs.h.  */
3461#include <string.h>
3462
3463_ACEOF
3464if (eval "$ac_cpp conftest.$ac_ext") 2>&5 |
3465  $EGREP "memchr" >/dev/null 2>&1; then :
3466
3467else
3468  ac_cv_header_stdc=no
3469fi
3470rm -f conftest*
3471
3472fi
3473
3474if test $ac_cv_header_stdc = yes; then
3475  # ISC 2.0.2 stdlib.h does not declare free, contrary to ANSI.
3476  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3477/* end confdefs.h.  */
3478#include <stdlib.h>
3479
3480_ACEOF
3481if (eval "$ac_cpp conftest.$ac_ext") 2>&5 |
3482  $EGREP "free" >/dev/null 2>&1; then :
3483
3484else
3485  ac_cv_header_stdc=no
3486fi
3487rm -f conftest*
3488
3489fi
3490
3491if test $ac_cv_header_stdc = yes; then
3492  # /bin/cc in Irix-4.0.5 gets non-ANSI ctype macros unless using -ansi.
3493  if test "$cross_compiling" = yes; then :
3494  :
3495else
3496  cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3497/* end confdefs.h.  */
3498#include <ctype.h>
3499#include <stdlib.h>
3500#if ((' ' & 0x0FF) == 0x020)
3501# define ISLOWER(c) ('a' <= (c) && (c) <= 'z')
3502# define TOUPPER(c) (ISLOWER(c) ? 'A' + ((c) - 'a') : (c))
3503#else
3504# define ISLOWER(c) \
3505		   (('a' <= (c) && (c) <= 'i') \
3506		     || ('j' <= (c) && (c) <= 'r') \
3507		     || ('s' <= (c) && (c) <= 'z'))
3508# define TOUPPER(c) (ISLOWER(c) ? ((c) | 0x40) : (c))
3509#endif
3510
3511#define XOR(e, f) (((e) && !(f)) || (!(e) && (f)))
3512int
3513main ()
3514{
3515  int i;
3516  for (i = 0; i < 256; i++)
3517    if (XOR (islower (i), ISLOWER (i))
3518	|| toupper (i) != TOUPPER (i))
3519      return 2;
3520  return 0;
3521}
3522_ACEOF
3523if ac_fn_c_try_run "$LINENO"; then :
3524
3525else
3526  ac_cv_header_stdc=no
3527fi
3528rm -f core *.core core.conftest.* gmon.out bb.out conftest$ac_exeext \
3529  conftest.$ac_objext conftest.beam conftest.$ac_ext
3530fi
3531
3532fi
3533fi
3534{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_header_stdc" >&5
3535$as_echo "$ac_cv_header_stdc" >&6; }
3536if test $ac_cv_header_stdc = yes; then
3537
3538$as_echo "#define STDC_HEADERS 1" >>confdefs.h
3539
3540fi
3541
3542# On IRIX 5.3, sys/types and inttypes.h are conflicting.
3543for ac_header in sys/types.h sys/stat.h stdlib.h string.h memory.h strings.h \
3544		  inttypes.h stdint.h unistd.h
3545do :
3546  as_ac_Header=`$as_echo "ac_cv_header_$ac_header" | $as_tr_sh`
3547ac_fn_c_check_header_compile "$LINENO" "$ac_header" "$as_ac_Header" "$ac_includes_default
3548"
3549if eval test \"x\$"$as_ac_Header"\" = x"yes"; then :
3550  cat >>confdefs.h <<_ACEOF
3551#define `$as_echo "HAVE_$ac_header" | $as_tr_cpp` 1
3552_ACEOF
3553
3554fi
3555
3556done
3557
3558
3559ac_fn_c_check_header_mongrel "$LINENO" "net/errno.h" "ac_cv_header_net_errno_h" "$ac_includes_default"
3560if test "x$ac_cv_header_net_errno_h" = xyes; then :
3561  $as_echo "#define HAVE_NET_ERRNO_H 1" >>confdefs.h
3562
3563fi
3564
3565
3566
3567#--------------------------------------------------------------------
3568# Linux/tcp.h may be needed for sockopt test in kernel
3569#--------------------------------------------------------------------
3570
3571ac_fn_c_check_header_mongrel "$LINENO" "linux/tcp.h" "ac_cv_header_linux_tcp_h" "$ac_includes_default"
3572if test "x$ac_cv_header_linux_tcp_h" = xyes; then :
3573  $as_echo "#define HAVE_LINUX_TCP_H 1" >>confdefs.h
3574
3575fi
3576
3577
3578{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for sane linux/tcp.h" >&5
3579$as_echo_n "checking for sane linux/tcp.h... " >&6; }
3580cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3581/* end confdefs.h.  */
3582#include <stdio.h>
3583		#include <stdlib.h>
3584		#include <string.h>
3585		#include <unistd.h>
3586		#include <stdarg.h>
3587		#include <sys/types.h>
3588		#include <sys/socket.h>
3589		#include <sys/wait.h>
3590		#include <linux/tcp.h>
3591		#include <netinet/in.h>
3592		#include <netdb.h>
3593int
3594main ()
3595{
3596return 0;
3597  ;
3598  return 0;
3599}
3600_ACEOF
3601if ac_fn_c_try_compile "$LINENO"; then :
3602  have_sane_linux_tcp_h=yes
3603else
3604  have_sane_linux_tcp_h=no
3605fi
3606rm -f core conftest.err conftest.$ac_objext conftest.$ac_ext
3607
3608if test $have_sane_linux_tcp_h = yes; then
3609
3610$as_echo "#define HAVE_SANE_LINUX_TCP_H 1" >>confdefs.h
3611
3612	{ $as_echo "$as_me:${as_lineno-$LINENO}: result: yes" >&5
3613$as_echo "yes" >&6; }
3614else
3615	{ $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
3616$as_echo "no" >&6; }
3617fi
3618
3619
3620
3621#--------------------------------------------------------------------
3622#	Linux requires sys/socketio.h instead of sys/sockio.h
3623#--------------------------------------------------------------------
3624ac_fn_c_check_header_mongrel "$LINENO" "sys/socketio.h" "ac_cv_header_sys_socketio_h" "$ac_includes_default"
3625if test "x$ac_cv_header_sys_socketio_h" = xyes; then :
3626  $as_echo "#define HAVE_SOCKETIO_H 1" >>confdefs.h
3627
3628fi
3629
3630
3631
3632
3633#--------------------------------------------------------------------
3634#	Misc
3635#--------------------------------------------------------------------
3636ac_fn_c_check_header_mongrel "$LINENO" "poll.h" "ac_cv_header_poll_h" "$ac_includes_default"
3637if test "x$ac_cv_header_poll_h" = xyes; then :
3638  $as_echo "#define HAVE_POLL_H 1" >>confdefs.h
3639
3640fi
3641
3642
3643
3644#--------------------------------------------------------------------
3645#	The statements below define a collection of symbols related to
3646#	dynamic loading and shared libraries:
3647#
3648#	SHLIB_CFLAGS -	Flags to pass to cc when compiling the components
3649#			of a shared library (may request position-independent
3650#			code, among other things).
3651#	SHLIB_LD -	Base command to use for combining object files
3652#			into a shared library.
3653#	SHLIB_SUFFIX -	Suffix to use for the names of dynamically loadable
3654#			extensions.  An empty string means we don't know how
3655#			to use shared libraries on this platform.
3656#--------------------------------------------------------------------
3657
3658# Step 1: set the variable "system" to hold the name and version number
3659# for the system.
3660
3661{ $as_echo "$as_me:${as_lineno-$LINENO}: checking system version (for dynamic loading)" >&5
3662$as_echo_n "checking system version (for dynamic loading)... " >&6; }
3663system=`./config.sub $host`
3664{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $system" >&5
3665$as_echo "$system" >&6; }
3666
3667# Step 2: check for existence of -ldl library.  This is needed because
3668# Linux can use either -ldl or -ldld for dynamic loading.
3669
3670{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for dlopen in -ldl" >&5
3671$as_echo_n "checking for dlopen in -ldl... " >&6; }
3672if ${ac_cv_lib_dl_dlopen+:} false; then :
3673  $as_echo_n "(cached) " >&6
3674else
3675  ac_check_lib_save_LIBS=$LIBS
3676LIBS="-ldl  $LIBS"
3677cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3678/* end confdefs.h.  */
3679
3680/* Override any GCC internal prototype to avoid an error.
3681   Use char because int might match the return type of a GCC
3682   builtin and then its argument prototype would still apply.  */
3683#ifdef __cplusplus
3684extern "C"
3685#endif
3686char dlopen ();
3687int
3688main ()
3689{
3690return dlopen ();
3691  ;
3692  return 0;
3693}
3694_ACEOF
3695if ac_fn_c_try_link "$LINENO"; then :
3696  ac_cv_lib_dl_dlopen=yes
3697else
3698  ac_cv_lib_dl_dlopen=no
3699fi
3700rm -f core conftest.err conftest.$ac_objext \
3701    conftest$ac_exeext conftest.$ac_ext
3702LIBS=$ac_check_lib_save_LIBS
3703fi
3704{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_lib_dl_dlopen" >&5
3705$as_echo "$ac_cv_lib_dl_dlopen" >&6; }
3706if test "x$ac_cv_lib_dl_dlopen" = xyes; then :
3707  have_dl=yes
3708else
3709  have_dl=no
3710fi
3711
3712
3713# Step 3: set configuration options based on system name and version.
3714
3715SHLIB_LDLIBS=
3716fullSrcDir=`cd $srcdir; pwd`
3717case $system in
3718    *-linux-*)
3719	SHLIB_CFLAGS="-fPIC"
3720	SHLIB_SUFFIX=".so"
3721	if test "$have_dl" = yes; then
3722	    SHLIB_LD="${CC}"
3723	    SHLIB_LDFLAGS="$LDFLAGS -shared"
3724	    LD_FLAGS="-rdynamic"
3725	else
3726	    ac_fn_c_check_header_mongrel "$LINENO" "dld.h" "ac_cv_header_dld_h" "$ac_includes_default"
3727if test "x$ac_cv_header_dld_h" = xyes; then :
3728
3729		SHLIB_LD="ld"
3730		SHLIB_LDFLAGS="-shared"
3731fi
3732
3733
3734	    if test X${enable_m64_build} = Xyes; then
3735	        as_fn_error $? "don't know how to link 64-bit dynamic drivers" "$LINENO" 5
3736	    fi
3737	    if test X${enable_m32_build} = Xyes; then
3738	        as_fn_error $? "don't know how to link 32-bit dynamic drivers" "$LINENO" 5
3739	    fi
3740	fi
3741	SHLIB_EXTRACT_ALL=""
3742	;;
3743    *-openbsd*|*-netbsd*|*-freebsd*|*-dragonfly*)
3744	# Not available on all versions:  check for include file.
3745	ac_fn_c_check_header_mongrel "$LINENO" "dlfcn.h" "ac_cv_header_dlfcn_h" "$ac_includes_default"
3746if test "x$ac_cv_header_dlfcn_h" = xyes; then :
3747
3748	    SHLIB_CFLAGS="-fpic"
3749	    SHLIB_LD="${CC}"
3750	    SHLIB_LDFLAGS="$LDFLAGS -shared"
3751	    SHLIB_SUFFIX=".so"
3752	    if test X${enable_m64_build} = Xyes; then
3753	        as_fn_error $? "don't know how to link 64-bit dynamic drivers" "$LINENO" 5
3754	    fi
3755	    if test X${enable_m32_build} = Xyes; then
3756	        as_fn_error $? "don't know how to link 32-bit dynamic drivers" "$LINENO" 5
3757	    fi
3758
3759else
3760
3761	    # No dynamic loading.
3762	    SHLIB_CFLAGS=""
3763	    SHLIB_LD="ld"
3764	    SHLIB_LDFLAGS=""
3765	    SHLIB_SUFFIX=""
3766	    as_fn_error $? "don't know how to compile and link dynamic drivers" "$LINENO" 5
3767
3768fi
3769
3770
3771	SHLIB_EXTRACT_ALL=""
3772	;;
3773    *-solaris2*|*-sysv4*)
3774	SHLIB_CFLAGS="-KPIC"
3775	SHLIB_LD="/usr/ccs/bin/ld"
3776	SHLIB_LDFLAGS="$no_mXX_LDFLAGS -G -z text"
3777	if test X${enable_m64_build} = Xyes; then
3778	   SHLIB_LDFLAGS="-64 $SHLIB_LDFLAGS"
3779	fi
3780	if test X${enable_m32_build} = Xyes; then
3781	   as_fn_error $? "don't know how to link 32-bit dynamic drivers" "$LINENO" 5
3782	fi
3783	SHLIB_SUFFIX=".so"
3784	SHLIB_EXTRACT_ALL="-z allextract"
3785	;;
3786    *darwin*)
3787	SHLIB_CFLAGS="-fno-common"
3788	SHLIB_LD="cc"
3789	SHLIB_LDFLAGS="$LDFLAGS -bundle -flat_namespace -undefined suppress"
3790	SHLIB_SUFFIX=".so"
3791	SHLIB_EXTRACT_ALL=""
3792	;;
3793    *osf1*)
3794	SHLIB_CFLAGS="-fPIC"
3795	SHLIB_LD="ld"
3796	SHLIB_LDFLAGS="$LDFLAGS -shared"
3797	if test X${enable_m64_build} = Xyes; then
3798	   as_fn_error $? "don't know how to link 64-bit dynamic drivers" "$LINENO" 5
3799	fi
3800	if test X${enable_m32_build} = Xyes; then
3801	   as_fn_error $? "don't know how to link 32-bit dynamic drivers" "$LINENO" 5
3802	fi
3803	SHLIB_SUFFIX=".so"
3804	SHLIB_EXTRACT_ALL=""
3805	;;
3806    *osf5*)
3807	SHLIB_CFLAGS="-fPIC"
3808	SHLIB_LD="${CC} -shared"
3809	SHLIB_LDFLAGS="$LDFLAGS"
3810	SHLIB_SUFFIX=".so"
3811	SHLIB_EXTRACT_ALL=""
3812	;;
3813    *)
3814	# No dynamic loading.
3815	SHLIB_CFLAGS=""
3816	SHLIB_LD="ld"
3817	SHLIB_LDFLAGS=""
3818	SHLIB_LDLIBS=""
3819	SHLIB_SUFFIX=""
3820	SHLIB_EXTRACT_ALL=""
3821	as_fn_error $? "don't know how to compile and link dynamic drivers" "$LINENO" 5
3822	;;
3823esac
3824
3825# If we're running gcc, then change the C flags for compiling shared
3826# libraries to the right flags for gcc, instead of those for the
3827# standard manufacturer compiler.
3828
3829if test "$CC" = "gcc" -o `$CC -v 2>&1 | grep -c gcc` != "0" ; then
3830	case $system in
3831	    *-aix)
3832		;;
3833	    *-bsd*)
3834		;;
3835	    *-irix)
3836		;;
3837	    *-netbsd|*-freebsd|*-openbsd)
3838		;;
3839	    *-riscos)
3840		;;
3841	    *ultrix4.*)
3842		;;
3843	    *darwin*)
3844		;;
3845	    *)
3846		SHLIB_CFLAGS="-fPIC"
3847		;;
3848	esac
3849fi
3850
3851# Make it possible for erl_interface to use it's own compiler options
3852EI_CFLAGS="$CFLAGS"
3853
3854# Add thread-safety flags if requested
3855# Check whether --enable-shlib-thread-safety was given.
3856if test "${enable_shlib_thread_safety+set}" = set; then :
3857  enableval=$enable_shlib_thread_safety;  case "$enableval" in
3858    no) ;;
3859    *)  SHLIB_CFLAGS="$SHLIB_CFLAGS -D_THREAD_SAFE -D_REENTRANT"
3860	CFLAGS="$CFLAGS -D_THREAD_SAFE -D_REENTRANT"
3861	;;
3862  esac
3863fi
3864
3865
3866SHLIB_CFLAGS="$SHLIB_CFLAGS $CFLAGS"
3867
3868
3869
3870
3871
3872
3873
3874
3875
3876
3877
3878#--------------------------------------------------------------------
3879#	Check for the existence of the -lsocket and -lnsl libraries.
3880#	The order here is important, so that they end up in the right
3881#	order in the command line generated by make.  Here are some
3882#	special considerations:
3883#	1. Use "connect" and "accept" to check for -lsocket, and
3884#	   "gethostbyname" to check for -lnsl.
3885#	2. Use each function name only once:  can't redo a check because
3886#	   autoconf caches the results of the last check and won't redo it.
3887#	3. Use -lnsl and -lsocket only if they supply procedures that
3888#	   aren't already present in the normal libraries.  This is because
3889#	   IRIX 5.2 has libraries, but they aren't needed and they're
3890#	   bogus:  they goof up name resolution if used.
3891#	4. On some SVR4 systems, can't use -lsocket without -lnsl too.
3892#	   To get around this problem, check for both libraries together
3893#	   if -lsocket doesn't work by itself.
3894#--------------------------------------------------------------------
3895
3896erl_checkBoth=0
3897ac_fn_c_check_func "$LINENO" "connect" "ac_cv_func_connect"
3898if test "x$ac_cv_func_connect" = xyes; then :
3899  erl_checkSocket=0
3900else
3901  erl_checkSocket=1
3902fi
3903
3904if test "$erl_checkSocket" = 1; then
3905    { $as_echo "$as_me:${as_lineno-$LINENO}: checking for main in -lsocket" >&5
3906$as_echo_n "checking for main in -lsocket... " >&6; }
3907if ${ac_cv_lib_socket_main+:} false; then :
3908  $as_echo_n "(cached) " >&6
3909else
3910  ac_check_lib_save_LIBS=$LIBS
3911LIBS="-lsocket  $LIBS"
3912cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3913/* end confdefs.h.  */
3914
3915
3916int
3917main ()
3918{
3919return main ();
3920  ;
3921  return 0;
3922}
3923_ACEOF
3924if ac_fn_c_try_link "$LINENO"; then :
3925  ac_cv_lib_socket_main=yes
3926else
3927  ac_cv_lib_socket_main=no
3928fi
3929rm -f core conftest.err conftest.$ac_objext \
3930    conftest$ac_exeext conftest.$ac_ext
3931LIBS=$ac_check_lib_save_LIBS
3932fi
3933{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_lib_socket_main" >&5
3934$as_echo "$ac_cv_lib_socket_main" >&6; }
3935if test "x$ac_cv_lib_socket_main" = xyes; then :
3936  LIBS="$LIBS -lsocket"
3937else
3938  erl_checkBoth=1
3939fi
3940
3941fi
3942if test "$erl_checkBoth" = 1; then
3943    tk_oldLibs=$LIBS
3944    LIBS="$LIBS -lsocket -lnsl"
3945    ac_fn_c_check_func "$LINENO" "accept" "ac_cv_func_accept"
3946if test "x$ac_cv_func_accept" = xyes; then :
3947  erl_checkNsl=0
3948else
3949  LIBS=$tk_oldLibs
3950fi
3951
3952fi
3953ac_fn_c_check_func "$LINENO" "gethostbyname" "ac_cv_func_gethostbyname"
3954if test "x$ac_cv_func_gethostbyname" = xyes; then :
3955
3956else
3957  { $as_echo "$as_me:${as_lineno-$LINENO}: checking for main in -lnsl" >&5
3958$as_echo_n "checking for main in -lnsl... " >&6; }
3959if ${ac_cv_lib_nsl_main+:} false; then :
3960  $as_echo_n "(cached) " >&6
3961else
3962  ac_check_lib_save_LIBS=$LIBS
3963LIBS="-lnsl  $LIBS"
3964cat confdefs.h - <<_ACEOF >conftest.$ac_ext
3965/* end confdefs.h.  */
3966
3967
3968int
3969main ()
3970{
3971return main ();
3972  ;
3973  return 0;
3974}
3975_ACEOF
3976if ac_fn_c_try_link "$LINENO"; then :
3977  ac_cv_lib_nsl_main=yes
3978else
3979  ac_cv_lib_nsl_main=no
3980fi
3981rm -f core conftest.err conftest.$ac_objext \
3982    conftest$ac_exeext conftest.$ac_ext
3983LIBS=$ac_check_lib_save_LIBS
3984fi
3985{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_lib_nsl_main" >&5
3986$as_echo "$ac_cv_lib_nsl_main" >&6; }
3987if test "x$ac_cv_lib_nsl_main" = xyes; then :
3988  LIBS="$LIBS -lnsl"
3989fi
3990
3991fi
3992
3993
3994for ac_func in strerror
3995do :
3996  ac_fn_c_check_func "$LINENO" "strerror" "ac_cv_func_strerror"
3997if test "x$ac_cv_func_strerror" = xyes; then :
3998  cat >>confdefs.h <<_ACEOF
3999#define HAVE_STRERROR 1
4000_ACEOF
4001
4002fi
4003done
4004
4005for ac_func in vsnprintf
4006do :
4007  ac_fn_c_check_func "$LINENO" "vsnprintf" "ac_cv_func_vsnprintf"
4008if test "x$ac_cv_func_vsnprintf" = xyes; then :
4009  cat >>confdefs.h <<_ACEOF
4010#define HAVE_VSNPRINTF 1
4011_ACEOF
4012
4013fi
4014done
4015
4016for ac_func in usleep
4017do :
4018  ac_fn_c_check_func "$LINENO" "usleep" "ac_cv_func_usleep"
4019if test "x$ac_cv_func_usleep" = xyes; then :
4020  cat >>confdefs.h <<_ACEOF
4021#define HAVE_USLEEP 1
4022_ACEOF
4023
4024fi
4025done
4026
4027
4028# First check if the library is available, then if we can choose between
4029# two versions of gethostbyname
4030{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for main in -lresolv" >&5
4031$as_echo_n "checking for main in -lresolv... " >&6; }
4032if ${ac_cv_lib_resolv_main+:} false; then :
4033  $as_echo_n "(cached) " >&6
4034else
4035  ac_check_lib_save_LIBS=$LIBS
4036LIBS="-lresolv  $LIBS"
4037cat confdefs.h - <<_ACEOF >conftest.$ac_ext
4038/* end confdefs.h.  */
4039
4040
4041int
4042main ()
4043{
4044return main ();
4045  ;
4046  return 0;
4047}
4048_ACEOF
4049if ac_fn_c_try_link "$LINENO"; then :
4050  ac_cv_lib_resolv_main=yes
4051else
4052  ac_cv_lib_resolv_main=no
4053fi
4054rm -f core conftest.err conftest.$ac_objext \
4055    conftest$ac_exeext conftest.$ac_ext
4056LIBS=$ac_check_lib_save_LIBS
4057fi
4058{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_lib_resolv_main" >&5
4059$as_echo "$ac_cv_lib_resolv_main" >&6; }
4060if test "x$ac_cv_lib_resolv_main" = xyes; then :
4061  cat >>confdefs.h <<_ACEOF
4062#define HAVE_LIBRESOLV 1
4063_ACEOF
4064
4065  LIBS="-lresolv $LIBS"
4066
4067fi
4068ac_cv_lib_resolv=ac_cv_lib_resolv_main
4069
4070{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for res_gethostbyname in -lresolv" >&5
4071$as_echo_n "checking for res_gethostbyname in -lresolv... " >&6; }
4072if ${ac_cv_lib_resolv_res_gethostbyname+:} false; then :
4073  $as_echo_n "(cached) " >&6
4074else
4075  ac_check_lib_save_LIBS=$LIBS
4076LIBS="-lresolv  $LIBS"
4077cat confdefs.h - <<_ACEOF >conftest.$ac_ext
4078/* end confdefs.h.  */
4079
4080/* Override any GCC internal prototype to avoid an error.
4081   Use char because int might match the return type of a GCC
4082   builtin and then its argument prototype would still apply.  */
4083#ifdef __cplusplus
4084extern "C"
4085#endif
4086char res_gethostbyname ();
4087int
4088main ()
4089{
4090return res_gethostbyname ();
4091  ;
4092  return 0;
4093}
4094_ACEOF
4095if ac_fn_c_try_link "$LINENO"; then :
4096  ac_cv_lib_resolv_res_gethostbyname=yes
4097else
4098  ac_cv_lib_resolv_res_gethostbyname=no
4099fi
4100rm -f core conftest.err conftest.$ac_objext \
4101    conftest$ac_exeext conftest.$ac_ext
4102LIBS=$ac_check_lib_save_LIBS
4103fi
4104{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_lib_resolv_res_gethostbyname" >&5
4105$as_echo "$ac_cv_lib_resolv_res_gethostbyname" >&6; }
4106if test "x$ac_cv_lib_resolv_res_gethostbyname" = xyes; then :
4107  $as_echo "#define HAVE_RES_GETHOSTBYNAME 1" >>confdefs.h
4108
4109fi
4110
4111
4112#--------------------------------------------------------------------
4113# Check for isfinite
4114#--------------------------------------------------------------------
4115
4116{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for isfinite" >&5
4117$as_echo_n "checking for isfinite... " >&6; }
4118cat confdefs.h - <<_ACEOF >conftest.$ac_ext
4119/* end confdefs.h.  */
4120#include <math.h>
4121int
4122main ()
4123{
4124isfinite(0);
4125  ;
4126  return 0;
4127}
4128_ACEOF
4129if ac_fn_c_try_link "$LINENO"; then :
4130  have_isfinite=yes
4131else
4132  have_isfinite=no
4133fi
4134rm -f core conftest.err conftest.$ac_objext \
4135    conftest$ac_exeext conftest.$ac_ext
4136
4137if test $have_isfinite = yes; then
4138    $as_echo "#define HAVE_ISFINITE 1" >>confdefs.h
4139
4140    { $as_echo "$as_me:${as_lineno-$LINENO}: result: yes" >&5
4141$as_echo "yes" >&6; }
4142else
4143    $as_echo "#define HAVE_FINITE 1" >>confdefs.h
4144
4145    { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
4146$as_echo "no" >&6; }
4147fi
4148
4149#--------------------------------------------------------------------
4150# Emulator compatible flags (for drivers)
4151#--------------------------------------------------------------------
4152
4153ERTS_CFLAGS=$CFLAGS
4154
4155
4156ERTS_LIBS=$LIBS
4157
4158
4159#--------------------------------------------------------------------
4160# Special compiler macro to handle cross compiling
4161# (HCC) is used to compile tools run in the HOST environment
4162#--------------------------------------------------------------------
4163HCC='$(CC)'
4164
4165
4166#--------------------------------------------------------------------
4167# ld
4168#--------------------------------------------------------------------
4169LD='$(CC) $(CFLAGS)'
4170
4171
4172#--------------------------------------------------------------------
4173# object file suffix
4174#--------------------------------------------------------------------
4175obj='.o'
4176
4177
4178#--------------------------------------------------------------------
4179# executable file suffix
4180#--------------------------------------------------------------------
4181exe=''
4182
4183
4184#--------------------------------------------------------------------
4185# wsl command (if on windows using wsl)
4186#--------------------------------------------------------------------
4187wsl=''
4188
4189
4190#--------------------------------------------------------------------
4191# flags when linking for cross platform targets (yet 'tis useful with
4192# native builds)
4193#--------------------------------------------------------------------
4194CROSSLDFLAGS=''
4195
4196
4197
4198
4199TARGET=$host
4200
4201# We search for SSL. First in the OTP team ClearCase standard location,
4202# then in the common OS standard locations
4203# No we do not.
4204SSL_APP=ssl
4205CRYPTO_APP=crypto
4206SSLEAY_ROOT=$TARGET
4207#for dir in /usr /usr/pkg /usr/local /usr/local/ssl /usr/lib/ssl /usr/ssl; do
4208#         AC_CHECK_HEADER($dir/include/openssl/opensslv.h,
4209#		ac_cv_openssl=yes, ac_cv_openssl=no)
4210#	 if test $ac_cv_openssl = yes ; then
4211#                SSLEAY_ROOT="$dir"
4212#		ssl_found=yes
4213#		break
4214#	 fi
4215#done
4216
4217# Find a usable java compiler
4218#
4219# WARNING this code is copied from ERTS configure.in, and should be
4220# updated if that code changes. I hate duplicating code, but what
4221# can I do.
4222#
4223
4224for ac_prog in javac guavac gcj jikes bock
4225do
4226  # Extract the first word of "$ac_prog", so it can be a program name with args.
4227set dummy $ac_prog; ac_word=$2
4228{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
4229$as_echo_n "checking for $ac_word... " >&6; }
4230if ${ac_cv_prog_JAVAC+:} false; then :
4231  $as_echo_n "(cached) " >&6
4232else
4233  if test -n "$JAVAC"; then
4234  ac_cv_prog_JAVAC="$JAVAC" # Let the user override the test.
4235else
4236as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
4237for as_dir in $PATH
4238do
4239  IFS=$as_save_IFS
4240  test -z "$as_dir" && as_dir=.
4241    for ac_exec_ext in '' $ac_executable_extensions; do
4242  if as_fn_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
4243    ac_cv_prog_JAVAC="$ac_prog"
4244    $as_echo "$as_me:${as_lineno-$LINENO}: found $as_dir/$ac_word$ac_exec_ext" >&5
4245    break 2
4246  fi
4247done
4248  done
4249IFS=$as_save_IFS
4250
4251fi
4252fi
4253JAVAC=$ac_cv_prog_JAVAC
4254if test -n "$JAVAC"; then
4255  { $as_echo "$as_me:${as_lineno-$LINENO}: result: $JAVAC" >&5
4256$as_echo "$JAVAC" >&6; }
4257else
4258  { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
4259$as_echo "no" >&6; }
4260fi
4261
4262
4263  test -n "$JAVAC" && break
4264done
4265
4266if test -n "$JAVAC"; then
4267    { $as_echo "$as_me:${as_lineno-$LINENO}: checking for JDK version 1.5" >&5
4268$as_echo_n "checking for JDK version 1.5... " >&6; }
4269if ${ac_cv_prog_javac_ver_1_5+:} false; then :
4270  $as_echo_n "(cached) " >&6
4271else
4272  java_link='$JAVAC conftest.java 1>&5'
4273cat > conftest.java <<EOF
4274
4275class conftest { public static void main(String[] args) {
4276   for (String i : args);
4277   ; return; }}
4278EOF
4279if { { eval echo "\"\$as_me\":${as_lineno-$LINENO}: \"$java_link\""; } >&5
4280  (eval $java_link) 2>&5
4281  ac_status=$?
4282  $as_echo "$as_me:${as_lineno-$LINENO}: \$? = $ac_status" >&5
4283  test $ac_status = 0; } && test -s conftest.class; then
4284   rm -rf conftest*
4285   ac_cv_prog_javac_ver_1_5=yes
4286else
4287   echo "configure: failed program was:" 1>&5
4288   cat conftest.java 1>&5
4289   echo "configure: PATH was $PATH" 1>&5
4290  rm -rf conftest*
4291  ac_cv_prog_javac_ver_1_5=no
4292fi
4293rm -f conftest*
4294fi
4295{ $as_echo "$as_me:${as_lineno-$LINENO}: result: $ac_cv_prog_javac_ver_1_5" >&5
4296$as_echo "$ac_cv_prog_javac_ver_1_5" >&6; }
4297  if test $ac_cv_prog_javac_ver_1_5 = no; then
4298    unset -v JAVAC
4299  fi
4300fi
4301if test -n "$JAVAC"; then
4302
4303  :
4304fi
4305
4306for ac_prog in make gmake
4307do
4308  # Extract the first word of "$ac_prog", so it can be a program name with args.
4309set dummy $ac_prog; ac_word=$2
4310{ $as_echo "$as_me:${as_lineno-$LINENO}: checking for $ac_word" >&5
4311$as_echo_n "checking for $ac_word... " >&6; }
4312if ${ac_cv_prog_make_command+:} false; then :
4313  $as_echo_n "(cached) " >&6
4314else
4315  if test -n "$make_command"; then
4316  ac_cv_prog_make_command="$make_command" # Let the user override the test.
4317else
4318as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
4319for as_dir in $PATH
4320do
4321  IFS=$as_save_IFS
4322  test -z "$as_dir" && as_dir=.
4323    for ac_exec_ext in '' $ac_executable_extensions; do
4324  if as_fn_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
4325    ac_cv_prog_make_command="$ac_prog"
4326    $as_echo "$as_me:${as_lineno-$LINENO}: found $as_dir/$ac_word$ac_exec_ext" >&5
4327    break 2
4328  fi
4329done
4330  done
4331IFS=$as_save_IFS
4332
4333fi
4334fi
4335make_command=$ac_cv_prog_make_command
4336if test -n "$make_command"; then
4337  { $as_echo "$as_me:${as_lineno-$LINENO}: result: $make_command" >&5
4338$as_echo "$make_command" >&6; }
4339else
4340  { $as_echo "$as_me:${as_lineno-$LINENO}: result: no" >&5
4341$as_echo "no" >&6; }
4342fi
4343
4344
4345  test -n "$make_command" && break
4346done
4347test -n "$make_command" || make_command="false"
4348
4349
4350
4351if test "$GCC" = yes; then
4352  test_c_compiler="{gnuc, undefined}"
4353else
4354  test_c_compiler="undefined"
4355fi
4356
4357
4358ac_config_files="$ac_config_files conf_vars"
4359
4360cat >confcache <<\_ACEOF
4361# This file is a shell script that caches the results of configure
4362# tests run on this system so they can be shared between configure
4363# scripts and configure runs, see configure's option --config-cache.
4364# It is not useful on other systems.  If it contains results you don't
4365# want to keep, you may remove or edit it.
4366#
4367# config.status only pays attention to the cache file if you give it
4368# the --recheck option to rerun configure.
4369#
4370# `ac_cv_env_foo' variables (set or unset) will be overridden when
4371# loading this file, other *unset* `ac_cv_foo' will be assigned the
4372# following values.
4373
4374_ACEOF
4375
4376# The following way of writing the cache mishandles newlines in values,
4377# but we know of no workaround that is simple, portable, and efficient.
4378# So, we kill variables containing newlines.
4379# Ultrix sh set writes to stderr and can't be redirected directly,
4380# and sets the high bit in the cache file unless we assign to the vars.
4381(
4382  for ac_var in `(set) 2>&1 | sed -n 's/^\([a-zA-Z_][a-zA-Z0-9_]*\)=.*/\1/p'`; do
4383    eval ac_val=\$$ac_var
4384    case $ac_val in #(
4385    *${as_nl}*)
4386      case $ac_var in #(
4387      *_cv_*) { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: cache variable $ac_var contains a newline" >&5
4388$as_echo "$as_me: WARNING: cache variable $ac_var contains a newline" >&2;} ;;
4389      esac
4390      case $ac_var in #(
4391      _ | IFS | as_nl) ;; #(
4392      BASH_ARGV | BASH_SOURCE) eval $ac_var= ;; #(
4393      *) { eval $ac_var=; unset $ac_var;} ;;
4394      esac ;;
4395    esac
4396  done
4397
4398  (set) 2>&1 |
4399    case $as_nl`(ac_space=' '; set) 2>&1` in #(
4400    *${as_nl}ac_space=\ *)
4401      # `set' does not quote correctly, so add quotes: double-quote
4402      # substitution turns \\\\ into \\, and sed turns \\ into \.
4403      sed -n \
4404	"s/'/'\\\\''/g;
4405	  s/^\\([_$as_cr_alnum]*_cv_[_$as_cr_alnum]*\\)=\\(.*\\)/\\1='\\2'/p"
4406      ;; #(
4407    *)
4408      # `set' quotes correctly as required by POSIX, so do not add quotes.
4409      sed -n "/^[_$as_cr_alnum]*_cv_[_$as_cr_alnum]*=/p"
4410      ;;
4411    esac |
4412    sort
4413) |
4414  sed '
4415     /^ac_cv_env_/b end
4416     t clear
4417     :clear
4418     s/^\([^=]*\)=\(.*[{}].*\)$/test "${\1+set}" = set || &/
4419     t end
4420     s/^\([^=]*\)=\(.*\)$/\1=${\1=\2}/
4421     :end' >>confcache
4422if diff "$cache_file" confcache >/dev/null 2>&1; then :; else
4423  if test -w "$cache_file"; then
4424    if test "x$cache_file" != "x/dev/null"; then
4425      { $as_echo "$as_me:${as_lineno-$LINENO}: updating cache $cache_file" >&5
4426$as_echo "$as_me: updating cache $cache_file" >&6;}
4427      if test ! -f "$cache_file" || test -h "$cache_file"; then
4428	cat confcache >"$cache_file"
4429      else
4430        case $cache_file in #(
4431        */* | ?:*)
4432	  mv -f confcache "$cache_file"$$ &&
4433	  mv -f "$cache_file"$$ "$cache_file" ;; #(
4434        *)
4435	  mv -f confcache "$cache_file" ;;
4436	esac
4437      fi
4438    fi
4439  else
4440    { $as_echo "$as_me:${as_lineno-$LINENO}: not updating unwritable cache $cache_file" >&5
4441$as_echo "$as_me: not updating unwritable cache $cache_file" >&6;}
4442  fi
4443fi
4444rm -f confcache
4445
4446test "x$prefix" = xNONE && prefix=$ac_default_prefix
4447# Let make expand exec_prefix.
4448test "x$exec_prefix" = xNONE && exec_prefix='${prefix}'
4449
4450# Transform confdefs.h into DEFS.
4451# Protect against shell expansion while executing Makefile rules.
4452# Protect against Makefile macro expansion.
4453#
4454# If the first sed substitution is executed (which looks for macros that
4455# take arguments), then branch to the quote section.  Otherwise,
4456# look for a macro that doesn't take arguments.
4457ac_script='
4458:mline
4459/\\$/{
4460 N
4461 s,\\\n,,
4462 b mline
4463}
4464t clear
4465:clear
4466s/^[	 ]*#[	 ]*define[	 ][	 ]*\([^	 (][^	 (]*([^)]*)\)[	 ]*\(.*\)/-D\1=\2/g
4467t quote
4468s/^[	 ]*#[	 ]*define[	 ][	 ]*\([^	 ][^	 ]*\)[	 ]*\(.*\)/-D\1=\2/g
4469t quote
4470b any
4471:quote
4472s/[	 `~#$^&*(){}\\|;'\''"<>?]/\\&/g
4473s/\[/\\&/g
4474s/\]/\\&/g
4475s/\$/$$/g
4476H
4477:any
4478${
4479	g
4480	s/^\n//
4481	s/\n/ /g
4482	p
4483}
4484'
4485DEFS=`sed -n "$ac_script" confdefs.h`
4486
4487
4488ac_libobjs=
4489ac_ltlibobjs=
4490U=
4491for ac_i in : $LIBOBJS; do test "x$ac_i" = x: && continue
4492  # 1. Remove the extension, and $U if already installed.
4493  ac_script='s/\$U\././;s/\.o$//;s/\.obj$//'
4494  ac_i=`$as_echo "$ac_i" | sed "$ac_script"`
4495  # 2. Prepend LIBOBJDIR.  When used with automake>=1.10 LIBOBJDIR
4496  #    will be set to the directory where LIBOBJS objects are built.
4497  as_fn_append ac_libobjs " \${LIBOBJDIR}$ac_i\$U.$ac_objext"
4498  as_fn_append ac_ltlibobjs " \${LIBOBJDIR}$ac_i"'$U.lo'
4499done
4500LIBOBJS=$ac_libobjs
4501
4502LTLIBOBJS=$ac_ltlibobjs
4503
4504
4505
4506: "${CONFIG_STATUS=./config.status}"
4507ac_write_fail=0
4508ac_clean_files_save=$ac_clean_files
4509ac_clean_files="$ac_clean_files $CONFIG_STATUS"
4510{ $as_echo "$as_me:${as_lineno-$LINENO}: creating $CONFIG_STATUS" >&5
4511$as_echo "$as_me: creating $CONFIG_STATUS" >&6;}
4512as_write_fail=0
4513cat >$CONFIG_STATUS <<_ASEOF || as_write_fail=1
4514#! $SHELL
4515# Generated by $as_me.
4516# Run this file to recreate the current configuration.
4517# Compiler output produced by configure, useful for debugging
4518# configure, is in config.log if it exists.
4519
4520debug=false
4521ac_cs_recheck=false
4522ac_cs_silent=false
4523
4524SHELL=\${CONFIG_SHELL-$SHELL}
4525export SHELL
4526_ASEOF
4527cat >>$CONFIG_STATUS <<\_ASEOF || as_write_fail=1
4528## -------------------- ##
4529## M4sh Initialization. ##
4530## -------------------- ##
4531
4532# Be more Bourne compatible
4533DUALCASE=1; export DUALCASE # for MKS sh
4534if test -n "${ZSH_VERSION+set}" && (emulate sh) >/dev/null 2>&1; then :
4535  emulate sh
4536  NULLCMD=:
4537  # Pre-4.2 versions of Zsh do word splitting on ${1+"$@"}, which
4538  # is contrary to our usage.  Disable this feature.
4539  alias -g '${1+"$@"}'='"$@"'
4540  setopt NO_GLOB_SUBST
4541else
4542  case `(set -o) 2>/dev/null` in #(
4543  *posix*) :
4544    set -o posix ;; #(
4545  *) :
4546     ;;
4547esac
4548fi
4549
4550
4551as_nl='
4552'
4553export as_nl
4554# Printing a long string crashes Solaris 7 /usr/bin/printf.
4555as_echo='\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\\'
4556as_echo=$as_echo$as_echo$as_echo$as_echo$as_echo
4557as_echo=$as_echo$as_echo$as_echo$as_echo$as_echo$as_echo
4558# Prefer a ksh shell builtin over an external printf program on Solaris,
4559# but without wasting forks for bash or zsh.
4560if test -z "$BASH_VERSION$ZSH_VERSION" \
4561    && (test "X`print -r -- $as_echo`" = "X$as_echo") 2>/dev/null; then
4562  as_echo='print -r --'
4563  as_echo_n='print -rn --'
4564elif (test "X`printf %s $as_echo`" = "X$as_echo") 2>/dev/null; then
4565  as_echo='printf %s\n'
4566  as_echo_n='printf %s'
4567else
4568  if test "X`(/usr/ucb/echo -n -n $as_echo) 2>/dev/null`" = "X-n $as_echo"; then
4569    as_echo_body='eval /usr/ucb/echo -n "$1$as_nl"'
4570    as_echo_n='/usr/ucb/echo -n'
4571  else
4572    as_echo_body='eval expr "X$1" : "X\\(.*\\)"'
4573    as_echo_n_body='eval
4574      arg=$1;
4575      case $arg in #(
4576      *"$as_nl"*)
4577	expr "X$arg" : "X\\(.*\\)$as_nl";
4578	arg=`expr "X$arg" : ".*$as_nl\\(.*\\)"`;;
4579      esac;
4580      expr "X$arg" : "X\\(.*\\)" | tr -d "$as_nl"
4581    '
4582    export as_echo_n_body
4583    as_echo_n='sh -c $as_echo_n_body as_echo'
4584  fi
4585  export as_echo_body
4586  as_echo='sh -c $as_echo_body as_echo'
4587fi
4588
4589# The user is always right.
4590if test "${PATH_SEPARATOR+set}" != set; then
4591  PATH_SEPARATOR=:
4592  (PATH='/bin;/bin'; FPATH=$PATH; sh -c :) >/dev/null 2>&1 && {
4593    (PATH='/bin:/bin'; FPATH=$PATH; sh -c :) >/dev/null 2>&1 ||
4594      PATH_SEPARATOR=';'
4595  }
4596fi
4597
4598
4599# IFS
4600# We need space, tab and new line, in precisely that order.  Quoting is
4601# there to prevent editors from complaining about space-tab.
4602# (If _AS_PATH_WALK were called with IFS unset, it would disable word
4603# splitting by setting IFS to empty value.)
4604IFS=" ""	$as_nl"
4605
4606# Find who we are.  Look in the path if we contain no directory separator.
4607as_myself=
4608case $0 in #((
4609  *[\\/]* ) as_myself=$0 ;;
4610  *) as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
4611for as_dir in $PATH
4612do
4613  IFS=$as_save_IFS
4614  test -z "$as_dir" && as_dir=.
4615    test -r "$as_dir/$0" && as_myself=$as_dir/$0 && break
4616  done
4617IFS=$as_save_IFS
4618
4619     ;;
4620esac
4621# We did not find ourselves, most probably we were run as `sh COMMAND'
4622# in which case we are not to be found in the path.
4623if test "x$as_myself" = x; then
4624  as_myself=$0
4625fi
4626if test ! -f "$as_myself"; then
4627  $as_echo "$as_myself: error: cannot find myself; rerun with an absolute file name" >&2
4628  exit 1
4629fi
4630
4631# Unset variables that we do not need and which cause bugs (e.g. in
4632# pre-3.0 UWIN ksh).  But do not cause bugs in bash 2.01; the "|| exit 1"
4633# suppresses any "Segmentation fault" message there.  '((' could
4634# trigger a bug in pdksh 5.2.14.
4635for as_var in BASH_ENV ENV MAIL MAILPATH
4636do eval test x\${$as_var+set} = xset \
4637  && ( (unset $as_var) || exit 1) >/dev/null 2>&1 && unset $as_var || :
4638done
4639PS1='$ '
4640PS2='> '
4641PS4='+ '
4642
4643# NLS nuisances.
4644LC_ALL=C
4645export LC_ALL
4646LANGUAGE=C
4647export LANGUAGE
4648
4649# CDPATH.
4650(unset CDPATH) >/dev/null 2>&1 && unset CDPATH
4651
4652
4653# as_fn_error STATUS ERROR [LINENO LOG_FD]
4654# ----------------------------------------
4655# Output "`basename $0`: error: ERROR" to stderr. If LINENO and LOG_FD are
4656# provided, also output the error to LOG_FD, referencing LINENO. Then exit the
4657# script with STATUS, using 1 if that was 0.
4658as_fn_error ()
4659{
4660  as_status=$1; test $as_status -eq 0 && as_status=1
4661  if test "$4"; then
4662    as_lineno=${as_lineno-"$3"} as_lineno_stack=as_lineno_stack=$as_lineno_stack
4663    $as_echo "$as_me:${as_lineno-$LINENO}: error: $2" >&$4
4664  fi
4665  $as_echo "$as_me: error: $2" >&2
4666  as_fn_exit $as_status
4667} # as_fn_error
4668
4669
4670# as_fn_set_status STATUS
4671# -----------------------
4672# Set $? to STATUS, without forking.
4673as_fn_set_status ()
4674{
4675  return $1
4676} # as_fn_set_status
4677
4678# as_fn_exit STATUS
4679# -----------------
4680# Exit the shell with STATUS, even in a "trap 0" or "set -e" context.
4681as_fn_exit ()
4682{
4683  set +e
4684  as_fn_set_status $1
4685  exit $1
4686} # as_fn_exit
4687
4688# as_fn_unset VAR
4689# ---------------
4690# Portably unset VAR.
4691as_fn_unset ()
4692{
4693  { eval $1=; unset $1;}
4694}
4695as_unset=as_fn_unset
4696# as_fn_append VAR VALUE
4697# ----------------------
4698# Append the text in VALUE to the end of the definition contained in VAR. Take
4699# advantage of any shell optimizations that allow amortized linear growth over
4700# repeated appends, instead of the typical quadratic growth present in naive
4701# implementations.
4702if (eval "as_var=1; as_var+=2; test x\$as_var = x12") 2>/dev/null; then :
4703  eval 'as_fn_append ()
4704  {
4705    eval $1+=\$2
4706  }'
4707else
4708  as_fn_append ()
4709  {
4710    eval $1=\$$1\$2
4711  }
4712fi # as_fn_append
4713
4714# as_fn_arith ARG...
4715# ------------------
4716# Perform arithmetic evaluation on the ARGs, and store the result in the
4717# global $as_val. Take advantage of shells that can avoid forks. The arguments
4718# must be portable across $(()) and expr.
4719if (eval "test \$(( 1 + 1 )) = 2") 2>/dev/null; then :
4720  eval 'as_fn_arith ()
4721  {
4722    as_val=$(( $* ))
4723  }'
4724else
4725  as_fn_arith ()
4726  {
4727    as_val=`expr "$@" || test $? -eq 1`
4728  }
4729fi # as_fn_arith
4730
4731
4732if expr a : '\(a\)' >/dev/null 2>&1 &&
4733   test "X`expr 00001 : '.*\(...\)'`" = X001; then
4734  as_expr=expr
4735else
4736  as_expr=false
4737fi
4738
4739if (basename -- /) >/dev/null 2>&1 && test "X`basename -- / 2>&1`" = "X/"; then
4740  as_basename=basename
4741else
4742  as_basename=false
4743fi
4744
4745if (as_dir=`dirname -- /` && test "X$as_dir" = X/) >/dev/null 2>&1; then
4746  as_dirname=dirname
4747else
4748  as_dirname=false
4749fi
4750
4751as_me=`$as_basename -- "$0" ||
4752$as_expr X/"$0" : '.*/\([^/][^/]*\)/*$' \| \
4753	 X"$0" : 'X\(//\)$' \| \
4754	 X"$0" : 'X\(/\)' \| . 2>/dev/null ||
4755$as_echo X/"$0" |
4756    sed '/^.*\/\([^/][^/]*\)\/*$/{
4757	    s//\1/
4758	    q
4759	  }
4760	  /^X\/\(\/\/\)$/{
4761	    s//\1/
4762	    q
4763	  }
4764	  /^X\/\(\/\).*/{
4765	    s//\1/
4766	    q
4767	  }
4768	  s/.*/./; q'`
4769
4770# Avoid depending upon Character Ranges.
4771as_cr_letters='abcdefghijklmnopqrstuvwxyz'
4772as_cr_LETTERS='ABCDEFGHIJKLMNOPQRSTUVWXYZ'
4773as_cr_Letters=$as_cr_letters$as_cr_LETTERS
4774as_cr_digits='0123456789'
4775as_cr_alnum=$as_cr_Letters$as_cr_digits
4776
4777ECHO_C= ECHO_N= ECHO_T=
4778case `echo -n x` in #(((((
4779-n*)
4780  case `echo 'xy\c'` in
4781  *c*) ECHO_T='	';;	# ECHO_T is single tab character.
4782  xy)  ECHO_C='\c';;
4783  *)   echo `echo ksh88 bug on AIX 6.1` > /dev/null
4784       ECHO_T='	';;
4785  esac;;
4786*)
4787  ECHO_N='-n';;
4788esac
4789
4790rm -f conf$$ conf$$.exe conf$$.file
4791if test -d conf$$.dir; then
4792  rm -f conf$$.dir/conf$$.file
4793else
4794  rm -f conf$$.dir
4795  mkdir conf$$.dir 2>/dev/null
4796fi
4797if (echo >conf$$.file) 2>/dev/null; then
4798  if ln -s conf$$.file conf$$ 2>/dev/null; then
4799    as_ln_s='ln -s'
4800    # ... but there are two gotchas:
4801    # 1) On MSYS, both `ln -s file dir' and `ln file dir' fail.
4802    # 2) DJGPP < 2.04 has no symlinks; `ln -s' creates a wrapper executable.
4803    # In both cases, we have to default to `cp -pR'.
4804    ln -s conf$$.file conf$$.dir 2>/dev/null && test ! -f conf$$.exe ||
4805      as_ln_s='cp -pR'
4806  elif ln conf$$.file conf$$ 2>/dev/null; then
4807    as_ln_s=ln
4808  else
4809    as_ln_s='cp -pR'
4810  fi
4811else
4812  as_ln_s='cp -pR'
4813fi
4814rm -f conf$$ conf$$.exe conf$$.dir/conf$$.file conf$$.file
4815rmdir conf$$.dir 2>/dev/null
4816
4817
4818# as_fn_mkdir_p
4819# -------------
4820# Create "$as_dir" as a directory, including parents if necessary.
4821as_fn_mkdir_p ()
4822{
4823
4824  case $as_dir in #(
4825  -*) as_dir=./$as_dir;;
4826  esac
4827  test -d "$as_dir" || eval $as_mkdir_p || {
4828    as_dirs=
4829    while :; do
4830      case $as_dir in #(
4831      *\'*) as_qdir=`$as_echo "$as_dir" | sed "s/'/'\\\\\\\\''/g"`;; #'(
4832      *) as_qdir=$as_dir;;
4833      esac
4834      as_dirs="'$as_qdir' $as_dirs"
4835      as_dir=`$as_dirname -- "$as_dir" ||
4836$as_expr X"$as_dir" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
4837	 X"$as_dir" : 'X\(//\)[^/]' \| \
4838	 X"$as_dir" : 'X\(//\)$' \| \
4839	 X"$as_dir" : 'X\(/\)' \| . 2>/dev/null ||
4840$as_echo X"$as_dir" |
4841    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
4842	    s//\1/
4843	    q
4844	  }
4845	  /^X\(\/\/\)[^/].*/{
4846	    s//\1/
4847	    q
4848	  }
4849	  /^X\(\/\/\)$/{
4850	    s//\1/
4851	    q
4852	  }
4853	  /^X\(\/\).*/{
4854	    s//\1/
4855	    q
4856	  }
4857	  s/.*/./; q'`
4858      test -d "$as_dir" && break
4859    done
4860    test -z "$as_dirs" || eval "mkdir $as_dirs"
4861  } || test -d "$as_dir" || as_fn_error $? "cannot create directory $as_dir"
4862
4863
4864} # as_fn_mkdir_p
4865if mkdir -p . 2>/dev/null; then
4866  as_mkdir_p='mkdir -p "$as_dir"'
4867else
4868  test -d ./-p && rmdir ./-p
4869  as_mkdir_p=false
4870fi
4871
4872
4873# as_fn_executable_p FILE
4874# -----------------------
4875# Test if FILE is an executable regular file.
4876as_fn_executable_p ()
4877{
4878  test -f "$1" && test -x "$1"
4879} # as_fn_executable_p
4880as_test_x='test -x'
4881as_executable_p=as_fn_executable_p
4882
4883# Sed expression to map a string onto a valid CPP name.
4884as_tr_cpp="eval sed 'y%*$as_cr_letters%P$as_cr_LETTERS%;s%[^_$as_cr_alnum]%_%g'"
4885
4886# Sed expression to map a string onto a valid variable name.
4887as_tr_sh="eval sed 'y%*+%pp%;s%[^_$as_cr_alnum]%_%g'"
4888
4889
4890exec 6>&1
4891## ----------------------------------- ##
4892## Main body of $CONFIG_STATUS script. ##
4893## ----------------------------------- ##
4894_ASEOF
4895test $as_write_fail = 0 && chmod +x $CONFIG_STATUS || ac_write_fail=1
4896
4897cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
4898# Save the log message, to keep $0 and so on meaningful, and to
4899# report actual input values of CONFIG_FILES etc. instead of their
4900# values after options handling.
4901ac_log="
4902This file was extended by $as_me, which was
4903generated by GNU Autoconf 2.69.  Invocation command line was
4904
4905  CONFIG_FILES    = $CONFIG_FILES
4906  CONFIG_HEADERS  = $CONFIG_HEADERS
4907  CONFIG_LINKS    = $CONFIG_LINKS
4908  CONFIG_COMMANDS = $CONFIG_COMMANDS
4909  $ $0 $@
4910
4911on `(hostname || uname -n) 2>/dev/null | sed 1q`
4912"
4913
4914_ACEOF
4915
4916case $ac_config_files in *"
4917"*) set x $ac_config_files; shift; ac_config_files=$*;;
4918esac
4919
4920
4921
4922cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
4923# Files that config.status was made for.
4924config_files="$ac_config_files"
4925
4926_ACEOF
4927
4928cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
4929ac_cs_usage="\
4930\`$as_me' instantiates files and other configuration actions
4931from templates according to the current configuration.  Unless the files
4932and actions are specified as TAGs, all are instantiated by default.
4933
4934Usage: $0 [OPTION]... [TAG]...
4935
4936  -h, --help       print this help, then exit
4937  -V, --version    print version number and configuration settings, then exit
4938      --config     print configuration, then exit
4939  -q, --quiet, --silent
4940                   do not print progress messages
4941  -d, --debug      don't remove temporary files
4942      --recheck    update $as_me by reconfiguring in the same conditions
4943      --file=FILE[:TEMPLATE]
4944                   instantiate the configuration file FILE
4945
4946Configuration files:
4947$config_files
4948
4949Report bugs to the package provider."
4950
4951_ACEOF
4952cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
4953ac_cs_config="`$as_echo "$ac_configure_args" | sed 's/^ //; s/[\\""\`\$]/\\\\&/g'`"
4954ac_cs_version="\\
4955config.status
4956configured by $0, generated by GNU Autoconf 2.69,
4957  with options \\"\$ac_cs_config\\"
4958
4959Copyright (C) 2012 Free Software Foundation, Inc.
4960This config.status script is free software; the Free Software Foundation
4961gives unlimited permission to copy, distribute and modify it."
4962
4963ac_pwd='$ac_pwd'
4964srcdir='$srcdir'
4965test -n "\$AWK" || AWK=awk
4966_ACEOF
4967
4968cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
4969# The default lists apply if the user does not specify any file.
4970ac_need_defaults=:
4971while test $# != 0
4972do
4973  case $1 in
4974  --*=?*)
4975    ac_option=`expr "X$1" : 'X\([^=]*\)='`
4976    ac_optarg=`expr "X$1" : 'X[^=]*=\(.*\)'`
4977    ac_shift=:
4978    ;;
4979  --*=)
4980    ac_option=`expr "X$1" : 'X\([^=]*\)='`
4981    ac_optarg=
4982    ac_shift=:
4983    ;;
4984  *)
4985    ac_option=$1
4986    ac_optarg=$2
4987    ac_shift=shift
4988    ;;
4989  esac
4990
4991  case $ac_option in
4992  # Handling of the options.
4993  -recheck | --recheck | --rechec | --reche | --rech | --rec | --re | --r)
4994    ac_cs_recheck=: ;;
4995  --version | --versio | --versi | --vers | --ver | --ve | --v | -V )
4996    $as_echo "$ac_cs_version"; exit ;;
4997  --config | --confi | --conf | --con | --co | --c )
4998    $as_echo "$ac_cs_config"; exit ;;
4999  --debug | --debu | --deb | --de | --d | -d )
5000    debug=: ;;
5001  --file | --fil | --fi | --f )
5002    $ac_shift
5003    case $ac_optarg in
5004    *\'*) ac_optarg=`$as_echo "$ac_optarg" | sed "s/'/'\\\\\\\\''/g"` ;;
5005    '') as_fn_error $? "missing file argument" ;;
5006    esac
5007    as_fn_append CONFIG_FILES " '$ac_optarg'"
5008    ac_need_defaults=false;;
5009  --he | --h |  --help | --hel | -h )
5010    $as_echo "$ac_cs_usage"; exit ;;
5011  -q | -quiet | --quiet | --quie | --qui | --qu | --q \
5012  | -silent | --silent | --silen | --sile | --sil | --si | --s)
5013    ac_cs_silent=: ;;
5014
5015  # This is an error.
5016  -*) as_fn_error $? "unrecognized option: \`$1'
5017Try \`$0 --help' for more information." ;;
5018
5019  *) as_fn_append ac_config_targets " $1"
5020     ac_need_defaults=false ;;
5021
5022  esac
5023  shift
5024done
5025
5026ac_configure_extra_args=
5027
5028if $ac_cs_silent; then
5029  exec 6>/dev/null
5030  ac_configure_extra_args="$ac_configure_extra_args --silent"
5031fi
5032
5033_ACEOF
5034cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
5035if \$ac_cs_recheck; then
5036  set X $SHELL '$0' $ac_configure_args \$ac_configure_extra_args --no-create --no-recursion
5037  shift
5038  \$as_echo "running CONFIG_SHELL=$SHELL \$*" >&6
5039  CONFIG_SHELL='$SHELL'
5040  export CONFIG_SHELL
5041  exec "\$@"
5042fi
5043
5044_ACEOF
5045cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
5046exec 5>>config.log
5047{
5048  echo
5049  sed 'h;s/./-/g;s/^.../## /;s/...$/ ##/;p;x;p;x' <<_ASBOX
5050## Running $as_me. ##
5051_ASBOX
5052  $as_echo "$ac_log"
5053} >&5
5054
5055_ACEOF
5056cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
5057_ACEOF
5058
5059cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
5060
5061# Handling of arguments.
5062for ac_config_target in $ac_config_targets
5063do
5064  case $ac_config_target in
5065    "conf_vars") CONFIG_FILES="$CONFIG_FILES conf_vars" ;;
5066
5067  *) as_fn_error $? "invalid argument: \`$ac_config_target'" "$LINENO" 5;;
5068  esac
5069done
5070
5071
5072# If the user did not use the arguments to specify the items to instantiate,
5073# then the envvar interface is used.  Set only those that are not.
5074# We use the long form for the default assignment because of an extremely
5075# bizarre bug on SunOS 4.1.3.
5076if $ac_need_defaults; then
5077  test "${CONFIG_FILES+set}" = set || CONFIG_FILES=$config_files
5078fi
5079
5080# Have a temporary directory for convenience.  Make it in the build tree
5081# simply because there is no reason against having it here, and in addition,
5082# creating and moving files from /tmp can sometimes cause problems.
5083# Hook for its removal unless debugging.
5084# Note that there is a small window in which the directory will not be cleaned:
5085# after its creation but before its name has been assigned to `$tmp'.
5086$debug ||
5087{
5088  tmp= ac_tmp=
5089  trap 'exit_status=$?
5090  : "${ac_tmp:=$tmp}"
5091  { test ! -d "$ac_tmp" || rm -fr "$ac_tmp"; } && exit $exit_status
5092' 0
5093  trap 'as_fn_exit 1' 1 2 13 15
5094}
5095# Create a (secure) tmp directory for tmp files.
5096
5097{
5098  tmp=`(umask 077 && mktemp -d "./confXXXXXX") 2>/dev/null` &&
5099  test -d "$tmp"
5100}  ||
5101{
5102  tmp=./conf$$-$RANDOM
5103  (umask 077 && mkdir "$tmp")
5104} || as_fn_error $? "cannot create a temporary directory in ." "$LINENO" 5
5105ac_tmp=$tmp
5106
5107# Set up the scripts for CONFIG_FILES section.
5108# No need to generate them if there are no CONFIG_FILES.
5109# This happens for instance with `./config.status config.h'.
5110if test -n "$CONFIG_FILES"; then
5111
5112
5113ac_cr=`echo X | tr X '\015'`
5114# On cygwin, bash can eat \r inside `` if the user requested igncr.
5115# But we know of no other shell where ac_cr would be empty at this
5116# point, so we can use a bashism as a fallback.
5117if test "x$ac_cr" = x; then
5118  eval ac_cr=\$\'\\r\'
5119fi
5120ac_cs_awk_cr=`$AWK 'BEGIN { print "a\rb" }' </dev/null 2>/dev/null`
5121if test "$ac_cs_awk_cr" = "a${ac_cr}b"; then
5122  ac_cs_awk_cr='\\r'
5123else
5124  ac_cs_awk_cr=$ac_cr
5125fi
5126
5127echo 'BEGIN {' >"$ac_tmp/subs1.awk" &&
5128_ACEOF
5129
5130
5131{
5132  echo "cat >conf$$subs.awk <<_ACEOF" &&
5133  echo "$ac_subst_vars" | sed 's/.*/&!$&$ac_delim/' &&
5134  echo "_ACEOF"
5135} >conf$$subs.sh ||
5136  as_fn_error $? "could not make $CONFIG_STATUS" "$LINENO" 5
5137ac_delim_num=`echo "$ac_subst_vars" | grep -c '^'`
5138ac_delim='%!_!# '
5139for ac_last_try in false false false false false :; do
5140  . ./conf$$subs.sh ||
5141    as_fn_error $? "could not make $CONFIG_STATUS" "$LINENO" 5
5142
5143  ac_delim_n=`sed -n "s/.*$ac_delim\$/X/p" conf$$subs.awk | grep -c X`
5144  if test $ac_delim_n = $ac_delim_num; then
5145    break
5146  elif $ac_last_try; then
5147    as_fn_error $? "could not make $CONFIG_STATUS" "$LINENO" 5
5148  else
5149    ac_delim="$ac_delim!$ac_delim _$ac_delim!! "
5150  fi
5151done
5152rm -f conf$$subs.sh
5153
5154cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
5155cat >>"\$ac_tmp/subs1.awk" <<\\_ACAWK &&
5156_ACEOF
5157sed -n '
5158h
5159s/^/S["/; s/!.*/"]=/
5160p
5161g
5162s/^[^!]*!//
5163:repl
5164t repl
5165s/'"$ac_delim"'$//
5166t delim
5167:nl
5168h
5169s/\(.\{148\}\)..*/\1/
5170t more1
5171s/["\\]/\\&/g; s/^/"/; s/$/\\n"\\/
5172p
5173n
5174b repl
5175:more1
5176s/["\\]/\\&/g; s/^/"/; s/$/"\\/
5177p
5178g
5179s/.\{148\}//
5180t nl
5181:delim
5182h
5183s/\(.\{148\}\)..*/\1/
5184t more2
5185s/["\\]/\\&/g; s/^/"/; s/$/"/
5186p
5187b
5188:more2
5189s/["\\]/\\&/g; s/^/"/; s/$/"\\/
5190p
5191g
5192s/.\{148\}//
5193t delim
5194' <conf$$subs.awk | sed '
5195/^[^""]/{
5196  N
5197  s/\n//
5198}
5199' >>$CONFIG_STATUS || ac_write_fail=1
5200rm -f conf$$subs.awk
5201cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
5202_ACAWK
5203cat >>"\$ac_tmp/subs1.awk" <<_ACAWK &&
5204  for (key in S) S_is_set[key] = 1
5205  FS = ""
5206
5207}
5208{
5209  line = $ 0
5210  nfields = split(line, field, "@")
5211  substed = 0
5212  len = length(field[1])
5213  for (i = 2; i < nfields; i++) {
5214    key = field[i]
5215    keylen = length(key)
5216    if (S_is_set[key]) {
5217      value = S[key]
5218      line = substr(line, 1, len) "" value "" substr(line, len + keylen + 3)
5219      len += length(value) + length(field[++i])
5220      substed = 1
5221    } else
5222      len += 1 + keylen
5223  }
5224
5225  print line
5226}
5227
5228_ACAWK
5229_ACEOF
5230cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
5231if sed "s/$ac_cr//" < /dev/null > /dev/null 2>&1; then
5232  sed "s/$ac_cr\$//; s/$ac_cr/$ac_cs_awk_cr/g"
5233else
5234  cat
5235fi < "$ac_tmp/subs1.awk" > "$ac_tmp/subs.awk" \
5236  || as_fn_error $? "could not setup config files machinery" "$LINENO" 5
5237_ACEOF
5238
5239# VPATH may cause trouble with some makes, so we remove sole $(srcdir),
5240# ${srcdir} and @srcdir@ entries from VPATH if srcdir is ".", strip leading and
5241# trailing colons and then remove the whole line if VPATH becomes empty
5242# (actually we leave an empty line to preserve line numbers).
5243if test "x$srcdir" = x.; then
5244  ac_vpsub='/^[	 ]*VPATH[	 ]*=[	 ]*/{
5245h
5246s///
5247s/^/:/
5248s/[	 ]*$/:/
5249s/:\$(srcdir):/:/g
5250s/:\${srcdir}:/:/g
5251s/:@srcdir@:/:/g
5252s/^:*//
5253s/:*$//
5254x
5255s/\(=[	 ]*\).*/\1/
5256G
5257s/\n//
5258s/^[^=]*=[	 ]*$//
5259}'
5260fi
5261
5262cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
5263fi # test -n "$CONFIG_FILES"
5264
5265
5266eval set X "  :F $CONFIG_FILES      "
5267shift
5268for ac_tag
5269do
5270  case $ac_tag in
5271  :[FHLC]) ac_mode=$ac_tag; continue;;
5272  esac
5273  case $ac_mode$ac_tag in
5274  :[FHL]*:*);;
5275  :L* | :C*:*) as_fn_error $? "invalid tag \`$ac_tag'" "$LINENO" 5;;
5276  :[FH]-) ac_tag=-:-;;
5277  :[FH]*) ac_tag=$ac_tag:$ac_tag.in;;
5278  esac
5279  ac_save_IFS=$IFS
5280  IFS=:
5281  set x $ac_tag
5282  IFS=$ac_save_IFS
5283  shift
5284  ac_file=$1
5285  shift
5286
5287  case $ac_mode in
5288  :L) ac_source=$1;;
5289  :[FH])
5290    ac_file_inputs=
5291    for ac_f
5292    do
5293      case $ac_f in
5294      -) ac_f="$ac_tmp/stdin";;
5295      *) # Look for the file first in the build tree, then in the source tree
5296	 # (if the path is not absolute).  The absolute path cannot be DOS-style,
5297	 # because $ac_f cannot contain `:'.
5298	 test -f "$ac_f" ||
5299	   case $ac_f in
5300	   [\\/$]*) false;;
5301	   *) test -f "$srcdir/$ac_f" && ac_f="$srcdir/$ac_f";;
5302	   esac ||
5303	   as_fn_error 1 "cannot find input file: \`$ac_f'" "$LINENO" 5;;
5304      esac
5305      case $ac_f in *\'*) ac_f=`$as_echo "$ac_f" | sed "s/'/'\\\\\\\\''/g"`;; esac
5306      as_fn_append ac_file_inputs " '$ac_f'"
5307    done
5308
5309    # Let's still pretend it is `configure' which instantiates (i.e., don't
5310    # use $as_me), people would be surprised to read:
5311    #    /* config.h.  Generated by config.status.  */
5312    configure_input='Generated from '`
5313	  $as_echo "$*" | sed 's|^[^:]*/||;s|:[^:]*/|, |g'
5314	`' by configure.'
5315    if test x"$ac_file" != x-; then
5316      configure_input="$ac_file.  $configure_input"
5317      { $as_echo "$as_me:${as_lineno-$LINENO}: creating $ac_file" >&5
5318$as_echo "$as_me: creating $ac_file" >&6;}
5319    fi
5320    # Neutralize special characters interpreted by sed in replacement strings.
5321    case $configure_input in #(
5322    *\&* | *\|* | *\\* )
5323       ac_sed_conf_input=`$as_echo "$configure_input" |
5324       sed 's/[\\\\&|]/\\\\&/g'`;; #(
5325    *) ac_sed_conf_input=$configure_input;;
5326    esac
5327
5328    case $ac_tag in
5329    *:-:* | *:-) cat >"$ac_tmp/stdin" \
5330      || as_fn_error $? "could not create $ac_file" "$LINENO" 5 ;;
5331    esac
5332    ;;
5333  esac
5334
5335  ac_dir=`$as_dirname -- "$ac_file" ||
5336$as_expr X"$ac_file" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
5337	 X"$ac_file" : 'X\(//\)[^/]' \| \
5338	 X"$ac_file" : 'X\(//\)$' \| \
5339	 X"$ac_file" : 'X\(/\)' \| . 2>/dev/null ||
5340$as_echo X"$ac_file" |
5341    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{
5342	    s//\1/
5343	    q
5344	  }
5345	  /^X\(\/\/\)[^/].*/{
5346	    s//\1/
5347	    q
5348	  }
5349	  /^X\(\/\/\)$/{
5350	    s//\1/
5351	    q
5352	  }
5353	  /^X\(\/\).*/{
5354	    s//\1/
5355	    q
5356	  }
5357	  s/.*/./; q'`
5358  as_dir="$ac_dir"; as_fn_mkdir_p
5359  ac_builddir=.
5360
5361case "$ac_dir" in
5362.) ac_dir_suffix= ac_top_builddir_sub=. ac_top_build_prefix= ;;
5363*)
5364  ac_dir_suffix=/`$as_echo "$ac_dir" | sed 's|^\.[\\/]||'`
5365  # A ".." for each directory in $ac_dir_suffix.
5366  ac_top_builddir_sub=`$as_echo "$ac_dir_suffix" | sed 's|/[^\\/]*|/..|g;s|/||'`
5367  case $ac_top_builddir_sub in
5368  "") ac_top_builddir_sub=. ac_top_build_prefix= ;;
5369  *)  ac_top_build_prefix=$ac_top_builddir_sub/ ;;
5370  esac ;;
5371esac
5372ac_abs_top_builddir=$ac_pwd
5373ac_abs_builddir=$ac_pwd$ac_dir_suffix
5374# for backward compatibility:
5375ac_top_builddir=$ac_top_build_prefix
5376
5377case $srcdir in
5378  .)  # We are building in place.
5379    ac_srcdir=.
5380    ac_top_srcdir=$ac_top_builddir_sub
5381    ac_abs_top_srcdir=$ac_pwd ;;
5382  [\\/]* | ?:[\\/]* )  # Absolute name.
5383    ac_srcdir=$srcdir$ac_dir_suffix;
5384    ac_top_srcdir=$srcdir
5385    ac_abs_top_srcdir=$srcdir ;;
5386  *) # Relative name.
5387    ac_srcdir=$ac_top_build_prefix$srcdir$ac_dir_suffix
5388    ac_top_srcdir=$ac_top_build_prefix$srcdir
5389    ac_abs_top_srcdir=$ac_pwd/$srcdir ;;
5390esac
5391ac_abs_srcdir=$ac_abs_top_srcdir$ac_dir_suffix
5392
5393
5394  case $ac_mode in
5395  :F)
5396  #
5397  # CONFIG_FILE
5398  #
5399
5400_ACEOF
5401
5402cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
5403# If the template does not know about datarootdir, expand it.
5404# FIXME: This hack should be removed a few years after 2.60.
5405ac_datarootdir_hack=; ac_datarootdir_seen=
5406ac_sed_dataroot='
5407/datarootdir/ {
5408  p
5409  q
5410}
5411/@datadir@/p
5412/@docdir@/p
5413/@infodir@/p
5414/@localedir@/p
5415/@mandir@/p'
5416case `eval "sed -n \"\$ac_sed_dataroot\" $ac_file_inputs"` in
5417*datarootdir*) ac_datarootdir_seen=yes;;
5418*@datadir@*|*@docdir@*|*@infodir@*|*@localedir@*|*@mandir@*)
5419  { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: $ac_file_inputs seems to ignore the --datarootdir setting" >&5
5420$as_echo "$as_me: WARNING: $ac_file_inputs seems to ignore the --datarootdir setting" >&2;}
5421_ACEOF
5422cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
5423  ac_datarootdir_hack='
5424  s&@datadir@&$datadir&g
5425  s&@docdir@&$docdir&g
5426  s&@infodir@&$infodir&g
5427  s&@localedir@&$localedir&g
5428  s&@mandir@&$mandir&g
5429  s&\\\${datarootdir}&$datarootdir&g' ;;
5430esac
5431_ACEOF
5432
5433# Neutralize VPATH when `$srcdir' = `.'.
5434# Shell code in configure.ac might set extrasub.
5435# FIXME: do we really want to maintain this feature?
5436cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
5437ac_sed_extra="$ac_vpsub
5438$extrasub
5439_ACEOF
5440cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
5441:t
5442/@[a-zA-Z_][a-zA-Z_0-9]*@/!b
5443s|@configure_input@|$ac_sed_conf_input|;t t
5444s&@top_builddir@&$ac_top_builddir_sub&;t t
5445s&@top_build_prefix@&$ac_top_build_prefix&;t t
5446s&@srcdir@&$ac_srcdir&;t t
5447s&@abs_srcdir@&$ac_abs_srcdir&;t t
5448s&@top_srcdir@&$ac_top_srcdir&;t t
5449s&@abs_top_srcdir@&$ac_abs_top_srcdir&;t t
5450s&@builddir@&$ac_builddir&;t t
5451s&@abs_builddir@&$ac_abs_builddir&;t t
5452s&@abs_top_builddir@&$ac_abs_top_builddir&;t t
5453$ac_datarootdir_hack
5454"
5455eval sed \"\$ac_sed_extra\" "$ac_file_inputs" | $AWK -f "$ac_tmp/subs.awk" \
5456  >$ac_tmp/out || as_fn_error $? "could not create $ac_file" "$LINENO" 5
5457
5458test -z "$ac_datarootdir_hack$ac_datarootdir_seen" &&
5459  { ac_out=`sed -n '/\${datarootdir}/p' "$ac_tmp/out"`; test -n "$ac_out"; } &&
5460  { ac_out=`sed -n '/^[	 ]*datarootdir[	 ]*:*=/p' \
5461      "$ac_tmp/out"`; test -z "$ac_out"; } &&
5462  { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: $ac_file contains a reference to the variable \`datarootdir'
5463which seems to be undefined.  Please make sure it is defined" >&5
5464$as_echo "$as_me: WARNING: $ac_file contains a reference to the variable \`datarootdir'
5465which seems to be undefined.  Please make sure it is defined" >&2;}
5466
5467  rm -f "$ac_tmp/stdin"
5468  case $ac_file in
5469  -) cat "$ac_tmp/out" && rm -f "$ac_tmp/out";;
5470  *) rm -f "$ac_file" && mv "$ac_tmp/out" "$ac_file";;
5471  esac \
5472  || as_fn_error $? "could not create $ac_file" "$LINENO" 5
5473 ;;
5474
5475
5476
5477  esac
5478
5479done # for ac_tag
5480
5481
5482as_fn_exit 0
5483_ACEOF
5484ac_clean_files=$ac_clean_files_save
5485
5486test $ac_write_fail = 0 ||
5487  as_fn_error $? "write failure creating $CONFIG_STATUS" "$LINENO" 5
5488
5489
5490# configure is writing to config.log, and then calls config.status.
5491# config.status does its own redirection, appending to config.log.
5492# Unfortunately, on DOS this fails, as config.log is still kept open
5493# by configure, so config.status won't be able to write to it; its
5494# output is simply discarded.  So we exec the FD to /dev/null,
5495# effectively closing config.log, so it can be properly (re)opened and
5496# appended to by config.status.  When coming back to configure, we
5497# need to make the FD available again.
5498if test "$no_create" != yes; then
5499  ac_cs_success=:
5500  ac_config_status_args=
5501  test "$silent" = yes &&
5502    ac_config_status_args="$ac_config_status_args --quiet"
5503  exec 5>/dev/null
5504  $SHELL $CONFIG_STATUS $ac_config_status_args || ac_cs_success=false
5505  exec 5>>config.log
5506  # Use ||, not &&, to avoid exiting from the if with $? = 1, which
5507  # would make configure fail if this is the last instruction.
5508  $ac_cs_success || as_fn_exit 1
5509fi
5510if test -n "$ac_unrecognized_opts" && test "$enable_option_checking" != no; then
5511  { $as_echo "$as_me:${as_lineno-$LINENO}: WARNING: unrecognized options: $ac_unrecognized_opts" >&5
5512$as_echo "$as_me: WARNING: unrecognized options: $ac_unrecognized_opts" >&2;}
5513fi
5514
5515