1#! /bin/sh
2# Guess values for system-dependent variables and create Makefiles.
3# Generated by GNU Autoconf 2.59 for fdlibm 5.3.
4#
5# Report bugs to <FDLIBM COMMENTS <fdlibm-comments AT sun.com>>.
6#
7# Copyright (C) 2003 Free Software Foundation, Inc.
8# This configure script is free software; the Free Software Foundation
9# gives unlimited permission to copy, distribute and modify it.
10## --------------------- ##
11## M4sh Initialization.  ##
12## --------------------- ##
13
14# Be Bourne compatible
15if test -n "${ZSH_VERSION+set}" && (emulate sh) >/dev/null 2>&1; then
16  emulate sh
17  NULLCMD=:
18  # Zsh 3.x and 4.x performs word splitting on ${1+"$@"}, which
19  # is contrary to our usage.  Disable this feature.
20  alias -g '${1+"$@"}'='"$@"'
21elif test -n "${BASH_VERSION+set}" && (set -o posix) >/dev/null 2>&1; then
22  set -o posix
23fi
24DUALCASE=1; export DUALCASE # for MKS sh
25
26# Support unset when possible.
27if ( (MAIL=60; unset MAIL) || exit) >/dev/null 2>&1; then
28  as_unset=unset
29else
30  as_unset=false
31fi
32
33
34# Work around bugs in pre-3.0 UWIN ksh.
35$as_unset ENV MAIL MAILPATH
36PS1='$ '
37PS2='> '
38PS4='+ '
39
40# NLS nuisances.
41for as_var in \
42  LANG LANGUAGE LC_ADDRESS LC_ALL LC_COLLATE LC_CTYPE LC_IDENTIFICATION \
43  LC_MEASUREMENT LC_MESSAGES LC_MONETARY LC_NAME LC_NUMERIC LC_PAPER \
44  LC_TELEPHONE LC_TIME
45do
46  if (set +x; test -z "`(eval $as_var=C; export $as_var) 2>&1`"); then
47    eval $as_var=C; export $as_var
48  else
49    $as_unset $as_var
50  fi
51done
52
53# Required to use basename.
54if expr a : '\(a\)' >/dev/null 2>&1; then
55  as_expr=expr
56else
57  as_expr=false
58fi
59
60if (basename /) >/dev/null 2>&1 && test "X`basename / 2>&1`" = "X/"; then
61  as_basename=basename
62else
63  as_basename=false
64fi
65
66
67# Name of the executable.
68as_me=`$as_basename "$0" ||
69$as_expr X/"$0" : '.*/\([^/][^/]*\)/*$' \| \
70	 X"$0" : 'X\(//\)$' \| \
71	 X"$0" : 'X\(/\)$' \| \
72	 .     : '\(.\)' 2>/dev/null ||
73echo X/"$0" |
74    sed '/^.*\/\([^/][^/]*\)\/*$/{ s//\1/; q; }
75  	  /^X\/\(\/\/\)$/{ s//\1/; q; }
76  	  /^X\/\(\/\).*/{ s//\1/; q; }
77  	  s/.*/./; q'`
78
79
80# PATH needs CR, and LINENO needs CR and PATH.
81# Avoid depending upon Character Ranges.
82as_cr_letters='abcdefghijklmnopqrstuvwxyz'
83as_cr_LETTERS='ABCDEFGHIJKLMNOPQRSTUVWXYZ'
84as_cr_Letters=$as_cr_letters$as_cr_LETTERS
85as_cr_digits='0123456789'
86as_cr_alnum=$as_cr_Letters$as_cr_digits
87
88# The user is always right.
89if test "${PATH_SEPARATOR+set}" != set; then
90  echo "#! /bin/sh" >conf$$.sh
91  echo  "exit 0"   >>conf$$.sh
92  chmod +x conf$$.sh
93  if (PATH="/nonexistent;."; conf$$.sh) >/dev/null 2>&1; then
94    PATH_SEPARATOR=';'
95  else
96    PATH_SEPARATOR=:
97  fi
98  rm -f conf$$.sh
99fi
100
101
102  as_lineno_1=$LINENO
103  as_lineno_2=$LINENO
104  as_lineno_3=`(expr $as_lineno_1 + 1) 2>/dev/null`
105  test "x$as_lineno_1" != "x$as_lineno_2" &&
106  test "x$as_lineno_3"  = "x$as_lineno_2"  || {
107  # Find who we are.  Look in the path if we contain no path at all
108  # relative or not.
109  case $0 in
110    *[\\/]* ) as_myself=$0 ;;
111    *) as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
112for as_dir in $PATH
113do
114  IFS=$as_save_IFS
115  test -z "$as_dir" && as_dir=.
116  test -r "$as_dir/$0" && as_myself=$as_dir/$0 && break
117done
118
119       ;;
120  esac
121  # We did not find ourselves, most probably we were run as `sh COMMAND'
122  # in which case we are not to be found in the path.
123  if test "x$as_myself" = x; then
124    as_myself=$0
125  fi
126  if test ! -f "$as_myself"; then
127    { echo "$as_me: error: cannot find myself; rerun with an absolute path" >&2
128   { (exit 1); exit 1; }; }
129  fi
130  case $CONFIG_SHELL in
131  '')
132    as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
133for as_dir in /bin$PATH_SEPARATOR/usr/bin$PATH_SEPARATOR$PATH
134do
135  IFS=$as_save_IFS
136  test -z "$as_dir" && as_dir=.
137  for as_base in sh bash ksh sh5; do
138	 case $as_dir in
139	 /*)
140	   if ("$as_dir/$as_base" -c '
141  as_lineno_1=$LINENO
142  as_lineno_2=$LINENO
143  as_lineno_3=`(expr $as_lineno_1 + 1) 2>/dev/null`
144  test "x$as_lineno_1" != "x$as_lineno_2" &&
145  test "x$as_lineno_3"  = "x$as_lineno_2" ') 2>/dev/null; then
146	     $as_unset BASH_ENV || test "${BASH_ENV+set}" != set || { BASH_ENV=; export BASH_ENV; }
147	     $as_unset ENV || test "${ENV+set}" != set || { ENV=; export ENV; }
148	     CONFIG_SHELL=$as_dir/$as_base
149	     export CONFIG_SHELL
150	     exec "$CONFIG_SHELL" "$0" ${1+"$@"}
151	   fi;;
152	 esac
153       done
154done
155;;
156  esac
157
158  # Create $as_me.lineno as a copy of $as_myself, but with $LINENO
159  # uniformly replaced by the line number.  The first 'sed' inserts a
160  # line-number line before each line; the second 'sed' does the real
161  # work.  The second script uses 'N' to pair each line-number line
162  # with the numbered line, and appends trailing '-' during
163  # substitution so that $LINENO is not a special case at line end.
164  # (Raja R Harinath suggested sed '=', and Paul Eggert wrote the
165  # second 'sed' script.  Blame Lee E. McMahon for sed's syntax.  :-)
166  sed '=' <$as_myself |
167    sed '
168      N
169      s,$,-,
170      : loop
171      s,^\(['$as_cr_digits']*\)\(.*\)[$]LINENO\([^'$as_cr_alnum'_]\),\1\2\1\3,
172      t loop
173      s,-$,,
174      s,^['$as_cr_digits']*\n,,
175    ' >$as_me.lineno &&
176  chmod +x $as_me.lineno ||
177    { echo "$as_me: error: cannot create $as_me.lineno; rerun with a POSIX shell" >&2
178   { (exit 1); exit 1; }; }
179
180  # Don't try to exec as it changes $[0], causing all sort of problems
181  # (the dirname of $[0] is not the place where we might find the
182  # original and so on.  Autoconf is especially sensible to this).
183  . ./$as_me.lineno
184  # Exit status is that of the last command.
185  exit
186}
187
188
189case `echo "testing\c"; echo 1,2,3`,`echo -n testing; echo 1,2,3` in
190  *c*,-n*) ECHO_N= ECHO_C='
191' ECHO_T='	' ;;
192  *c*,*  ) ECHO_N=-n ECHO_C= ECHO_T= ;;
193  *)       ECHO_N= ECHO_C='\c' ECHO_T= ;;
194esac
195
196if expr a : '\(a\)' >/dev/null 2>&1; then
197  as_expr=expr
198else
199  as_expr=false
200fi
201
202rm -f conf$$ conf$$.exe conf$$.file
203echo >conf$$.file
204if ln -s conf$$.file conf$$ 2>/dev/null; then
205  # We could just check for DJGPP; but this test a) works b) is more generic
206  # and c) will remain valid once DJGPP supports symlinks (DJGPP 2.04).
207  if test -f conf$$.exe; then
208    # Don't use ln at all; we don't have any links
209    as_ln_s='cp -p'
210  else
211    as_ln_s='ln -s'
212  fi
213elif ln conf$$.file conf$$ 2>/dev/null; then
214  as_ln_s=ln
215else
216  as_ln_s='cp -p'
217fi
218rm -f conf$$ conf$$.exe conf$$.file
219
220if mkdir -p . 2>/dev/null; then
221  as_mkdir_p=:
222else
223  test -d ./-p && rmdir ./-p
224  as_mkdir_p=false
225fi
226
227as_executable_p="test -f"
228
229# Sed expression to map a string onto a valid CPP name.
230as_tr_cpp="eval sed 'y%*$as_cr_letters%P$as_cr_LETTERS%;s%[^_$as_cr_alnum]%_%g'"
231
232# Sed expression to map a string onto a valid variable name.
233as_tr_sh="eval sed 'y%*+%pp%;s%[^_$as_cr_alnum]%_%g'"
234
235
236# IFS
237# We need space, tab and new line, in precisely that order.
238as_nl='
239'
240IFS=" 	$as_nl"
241
242# CDPATH.
243$as_unset CDPATH
244
245
246# Name of the host.
247# hostname on some systems (SVR3.2, Linux) returns a bogus exit status,
248# so uname gets run too.
249ac_hostname=`(hostname || uname -n) 2>/dev/null | sed 1q`
250
251exec 6>&1
252
253#
254# Initializations.
255#
256ac_default_prefix=/usr/local
257ac_config_libobj_dir=.
258cross_compiling=no
259subdirs=
260MFLAGS=
261MAKEFLAGS=
262SHELL=${CONFIG_SHELL-/bin/sh}
263
264# Maximum number of lines to put in a shell here document.
265# This variable seems obsolete.  It should probably be removed, and
266# only ac_max_sed_lines should be used.
267: ${ac_max_here_lines=38}
268
269# Identity of this package.
270PACKAGE_NAME='fdlibm'
271PACKAGE_TARNAME='fdlibm'
272PACKAGE_VERSION='5.3'
273PACKAGE_STRING='fdlibm 5.3'
274PACKAGE_BUGREPORT='FDLIBM COMMENTS <fdlibm-comments AT sun.com>'
275
276ac_unique_file="e_acos.c"
277ac_subst_vars='SHELL PATH_SEPARATOR PACKAGE_NAME PACKAGE_TARNAME PACKAGE_VERSION PACKAGE_STRING PACKAGE_BUGREPORT exec_prefix prefix program_transform_name bindir sbindir libexecdir datadir sysconfdir sharedstatedir localstatedir libdir includedir oldincludedir infodir mandir build_alias host_alias target_alias DEFS ECHO_C ECHO_N ECHO_T LIBS CC CFLAGS LDFLAGS CPPFLAGS ac_ct_CC EXEEXT OBJEXT AR CHMOD CP RANLIB RM LIBOBJS LTLIBOBJS'
278ac_subst_files=''
279
280# Initialize some variables set by options.
281ac_init_help=
282ac_init_version=false
283# The variables have the same names as the options, with
284# dashes changed to underlines.
285cache_file=/dev/null
286exec_prefix=NONE
287no_create=
288no_recursion=
289prefix=NONE
290program_prefix=NONE
291program_suffix=NONE
292program_transform_name=s,x,x,
293silent=
294site=
295srcdir=
296verbose=
297x_includes=NONE
298x_libraries=NONE
299
300# Installation directory options.
301# These are left unexpanded so users can "make install exec_prefix=/foo"
302# and all the variables that are supposed to be based on exec_prefix
303# by default will actually change.
304# Use braces instead of parens because sh, perl, etc. also accept them.
305bindir='${exec_prefix}/bin'
306sbindir='${exec_prefix}/sbin'
307libexecdir='${exec_prefix}/libexec'
308datadir='${prefix}/share'
309sysconfdir='${prefix}/etc'
310sharedstatedir='${prefix}/com'
311localstatedir='${prefix}/var'
312libdir='${exec_prefix}/lib'
313includedir='${prefix}/include'
314oldincludedir='/usr/include'
315infodir='${prefix}/info'
316mandir='${prefix}/man'
317
318ac_prev=
319for ac_option
320do
321  # If the previous option needs an argument, assign it.
322  if test -n "$ac_prev"; then
323    eval "$ac_prev=\$ac_option"
324    ac_prev=
325    continue
326  fi
327
328  ac_optarg=`expr "x$ac_option" : 'x[^=]*=\(.*\)'`
329
330  # Accept the important Cygnus configure options, so we can diagnose typos.
331
332  case $ac_option in
333
334  -bindir | --bindir | --bindi | --bind | --bin | --bi)
335    ac_prev=bindir ;;
336  -bindir=* | --bindir=* | --bindi=* | --bind=* | --bin=* | --bi=*)
337    bindir=$ac_optarg ;;
338
339  -build | --build | --buil | --bui | --bu)
340    ac_prev=build_alias ;;
341  -build=* | --build=* | --buil=* | --bui=* | --bu=*)
342    build_alias=$ac_optarg ;;
343
344  -cache-file | --cache-file | --cache-fil | --cache-fi \
345  | --cache-f | --cache- | --cache | --cach | --cac | --ca | --c)
346    ac_prev=cache_file ;;
347  -cache-file=* | --cache-file=* | --cache-fil=* | --cache-fi=* \
348  | --cache-f=* | --cache-=* | --cache=* | --cach=* | --cac=* | --ca=* | --c=*)
349    cache_file=$ac_optarg ;;
350
351  --config-cache | -C)
352    cache_file=config.cache ;;
353
354  -datadir | --datadir | --datadi | --datad | --data | --dat | --da)
355    ac_prev=datadir ;;
356  -datadir=* | --datadir=* | --datadi=* | --datad=* | --data=* | --dat=* \
357  | --da=*)
358    datadir=$ac_optarg ;;
359
360  -disable-* | --disable-*)
361    ac_feature=`expr "x$ac_option" : 'x-*disable-\(.*\)'`
362    # Reject names that are not valid shell variable names.
363    expr "x$ac_feature" : ".*[^-_$as_cr_alnum]" >/dev/null &&
364      { echo "$as_me: error: invalid feature name: $ac_feature" >&2
365   { (exit 1); exit 1; }; }
366    ac_feature=`echo $ac_feature | sed 's/-/_/g'`
367    eval "enable_$ac_feature=no" ;;
368
369  -enable-* | --enable-*)
370    ac_feature=`expr "x$ac_option" : 'x-*enable-\([^=]*\)'`
371    # Reject names that are not valid shell variable names.
372    expr "x$ac_feature" : ".*[^-_$as_cr_alnum]" >/dev/null &&
373      { echo "$as_me: error: invalid feature name: $ac_feature" >&2
374   { (exit 1); exit 1; }; }
375    ac_feature=`echo $ac_feature | sed 's/-/_/g'`
376    case $ac_option in
377      *=*) ac_optarg=`echo "$ac_optarg" | sed "s/'/'\\\\\\\\''/g"`;;
378      *) ac_optarg=yes ;;
379    esac
380    eval "enable_$ac_feature='$ac_optarg'" ;;
381
382  -exec-prefix | --exec_prefix | --exec-prefix | --exec-prefi \
383  | --exec-pref | --exec-pre | --exec-pr | --exec-p | --exec- \
384  | --exec | --exe | --ex)
385    ac_prev=exec_prefix ;;
386  -exec-prefix=* | --exec_prefix=* | --exec-prefix=* | --exec-prefi=* \
387  | --exec-pref=* | --exec-pre=* | --exec-pr=* | --exec-p=* | --exec-=* \
388  | --exec=* | --exe=* | --ex=*)
389    exec_prefix=$ac_optarg ;;
390
391  -gas | --gas | --ga | --g)
392    # Obsolete; use --with-gas.
393    with_gas=yes ;;
394
395  -help | --help | --hel | --he | -h)
396    ac_init_help=long ;;
397  -help=r* | --help=r* | --hel=r* | --he=r* | -hr*)
398    ac_init_help=recursive ;;
399  -help=s* | --help=s* | --hel=s* | --he=s* | -hs*)
400    ac_init_help=short ;;
401
402  -host | --host | --hos | --ho)
403    ac_prev=host_alias ;;
404  -host=* | --host=* | --hos=* | --ho=*)
405    host_alias=$ac_optarg ;;
406
407  -includedir | --includedir | --includedi | --included | --include \
408  | --includ | --inclu | --incl | --inc)
409    ac_prev=includedir ;;
410  -includedir=* | --includedir=* | --includedi=* | --included=* | --include=* \
411  | --includ=* | --inclu=* | --incl=* | --inc=*)
412    includedir=$ac_optarg ;;
413
414  -infodir | --infodir | --infodi | --infod | --info | --inf)
415    ac_prev=infodir ;;
416  -infodir=* | --infodir=* | --infodi=* | --infod=* | --info=* | --inf=*)
417    infodir=$ac_optarg ;;
418
419  -libdir | --libdir | --libdi | --libd)
420    ac_prev=libdir ;;
421  -libdir=* | --libdir=* | --libdi=* | --libd=*)
422    libdir=$ac_optarg ;;
423
424  -libexecdir | --libexecdir | --libexecdi | --libexecd | --libexec \
425  | --libexe | --libex | --libe)
426    ac_prev=libexecdir ;;
427  -libexecdir=* | --libexecdir=* | --libexecdi=* | --libexecd=* | --libexec=* \
428  | --libexe=* | --libex=* | --libe=*)
429    libexecdir=$ac_optarg ;;
430
431  -localstatedir | --localstatedir | --localstatedi | --localstated \
432  | --localstate | --localstat | --localsta | --localst \
433  | --locals | --local | --loca | --loc | --lo)
434    ac_prev=localstatedir ;;
435  -localstatedir=* | --localstatedir=* | --localstatedi=* | --localstated=* \
436  | --localstate=* | --localstat=* | --localsta=* | --localst=* \
437  | --locals=* | --local=* | --loca=* | --loc=* | --lo=*)
438    localstatedir=$ac_optarg ;;
439
440  -mandir | --mandir | --mandi | --mand | --man | --ma | --m)
441    ac_prev=mandir ;;
442  -mandir=* | --mandir=* | --mandi=* | --mand=* | --man=* | --ma=* | --m=*)
443    mandir=$ac_optarg ;;
444
445  -nfp | --nfp | --nf)
446    # Obsolete; use --without-fp.
447    with_fp=no ;;
448
449  -no-create | --no-create | --no-creat | --no-crea | --no-cre \
450  | --no-cr | --no-c | -n)
451    no_create=yes ;;
452
453  -no-recursion | --no-recursion | --no-recursio | --no-recursi \
454  | --no-recurs | --no-recur | --no-recu | --no-rec | --no-re | --no-r)
455    no_recursion=yes ;;
456
457  -oldincludedir | --oldincludedir | --oldincludedi | --oldincluded \
458  | --oldinclude | --oldinclud | --oldinclu | --oldincl | --oldinc \
459  | --oldin | --oldi | --old | --ol | --o)
460    ac_prev=oldincludedir ;;
461  -oldincludedir=* | --oldincludedir=* | --oldincludedi=* | --oldincluded=* \
462  | --oldinclude=* | --oldinclud=* | --oldinclu=* | --oldincl=* | --oldinc=* \
463  | --oldin=* | --oldi=* | --old=* | --ol=* | --o=*)
464    oldincludedir=$ac_optarg ;;
465
466  -prefix | --prefix | --prefi | --pref | --pre | --pr | --p)
467    ac_prev=prefix ;;
468  -prefix=* | --prefix=* | --prefi=* | --pref=* | --pre=* | --pr=* | --p=*)
469    prefix=$ac_optarg ;;
470
471  -program-prefix | --program-prefix | --program-prefi | --program-pref \
472  | --program-pre | --program-pr | --program-p)
473    ac_prev=program_prefix ;;
474  -program-prefix=* | --program-prefix=* | --program-prefi=* \
475  | --program-pref=* | --program-pre=* | --program-pr=* | --program-p=*)
476    program_prefix=$ac_optarg ;;
477
478  -program-suffix | --program-suffix | --program-suffi | --program-suff \
479  | --program-suf | --program-su | --program-s)
480    ac_prev=program_suffix ;;
481  -program-suffix=* | --program-suffix=* | --program-suffi=* \
482  | --program-suff=* | --program-suf=* | --program-su=* | --program-s=*)
483    program_suffix=$ac_optarg ;;
484
485  -program-transform-name | --program-transform-name \
486  | --program-transform-nam | --program-transform-na \
487  | --program-transform-n | --program-transform- \
488  | --program-transform | --program-transfor \
489  | --program-transfo | --program-transf \
490  | --program-trans | --program-tran \
491  | --progr-tra | --program-tr | --program-t)
492    ac_prev=program_transform_name ;;
493  -program-transform-name=* | --program-transform-name=* \
494  | --program-transform-nam=* | --program-transform-na=* \
495  | --program-transform-n=* | --program-transform-=* \
496  | --program-transform=* | --program-transfor=* \
497  | --program-transfo=* | --program-transf=* \
498  | --program-trans=* | --program-tran=* \
499  | --progr-tra=* | --program-tr=* | --program-t=*)
500    program_transform_name=$ac_optarg ;;
501
502  -q | -quiet | --quiet | --quie | --qui | --qu | --q \
503  | -silent | --silent | --silen | --sile | --sil)
504    silent=yes ;;
505
506  -sbindir | --sbindir | --sbindi | --sbind | --sbin | --sbi | --sb)
507    ac_prev=sbindir ;;
508  -sbindir=* | --sbindir=* | --sbindi=* | --sbind=* | --sbin=* \
509  | --sbi=* | --sb=*)
510    sbindir=$ac_optarg ;;
511
512  -sharedstatedir | --sharedstatedir | --sharedstatedi \
513  | --sharedstated | --sharedstate | --sharedstat | --sharedsta \
514  | --sharedst | --shareds | --shared | --share | --shar \
515  | --sha | --sh)
516    ac_prev=sharedstatedir ;;
517  -sharedstatedir=* | --sharedstatedir=* | --sharedstatedi=* \
518  | --sharedstated=* | --sharedstate=* | --sharedstat=* | --sharedsta=* \
519  | --sharedst=* | --shareds=* | --shared=* | --share=* | --shar=* \
520  | --sha=* | --sh=*)
521    sharedstatedir=$ac_optarg ;;
522
523  -site | --site | --sit)
524    ac_prev=site ;;
525  -site=* | --site=* | --sit=*)
526    site=$ac_optarg ;;
527
528  -srcdir | --srcdir | --srcdi | --srcd | --src | --sr)
529    ac_prev=srcdir ;;
530  -srcdir=* | --srcdir=* | --srcdi=* | --srcd=* | --src=* | --sr=*)
531    srcdir=$ac_optarg ;;
532
533  -sysconfdir | --sysconfdir | --sysconfdi | --sysconfd | --sysconf \
534  | --syscon | --sysco | --sysc | --sys | --sy)
535    ac_prev=sysconfdir ;;
536  -sysconfdir=* | --sysconfdir=* | --sysconfdi=* | --sysconfd=* | --sysconf=* \
537  | --syscon=* | --sysco=* | --sysc=* | --sys=* | --sy=*)
538    sysconfdir=$ac_optarg ;;
539
540  -target | --target | --targe | --targ | --tar | --ta | --t)
541    ac_prev=target_alias ;;
542  -target=* | --target=* | --targe=* | --targ=* | --tar=* | --ta=* | --t=*)
543    target_alias=$ac_optarg ;;
544
545  -v | -verbose | --verbose | --verbos | --verbo | --verb)
546    verbose=yes ;;
547
548  -version | --version | --versio | --versi | --vers | -V)
549    ac_init_version=: ;;
550
551  -with-* | --with-*)
552    ac_package=`expr "x$ac_option" : 'x-*with-\([^=]*\)'`
553    # Reject names that are not valid shell variable names.
554    expr "x$ac_package" : ".*[^-_$as_cr_alnum]" >/dev/null &&
555      { echo "$as_me: error: invalid package name: $ac_package" >&2
556   { (exit 1); exit 1; }; }
557    ac_package=`echo $ac_package| sed 's/-/_/g'`
558    case $ac_option in
559      *=*) ac_optarg=`echo "$ac_optarg" | sed "s/'/'\\\\\\\\''/g"`;;
560      *) ac_optarg=yes ;;
561    esac
562    eval "with_$ac_package='$ac_optarg'" ;;
563
564  -without-* | --without-*)
565    ac_package=`expr "x$ac_option" : 'x-*without-\(.*\)'`
566    # Reject names that are not valid shell variable names.
567    expr "x$ac_package" : ".*[^-_$as_cr_alnum]" >/dev/null &&
568      { echo "$as_me: error: invalid package name: $ac_package" >&2
569   { (exit 1); exit 1; }; }
570    ac_package=`echo $ac_package | sed 's/-/_/g'`
571    eval "with_$ac_package=no" ;;
572
573  --x)
574    # Obsolete; use --with-x.
575    with_x=yes ;;
576
577  -x-includes | --x-includes | --x-include | --x-includ | --x-inclu \
578  | --x-incl | --x-inc | --x-in | --x-i)
579    ac_prev=x_includes ;;
580  -x-includes=* | --x-includes=* | --x-include=* | --x-includ=* | --x-inclu=* \
581  | --x-incl=* | --x-inc=* | --x-in=* | --x-i=*)
582    x_includes=$ac_optarg ;;
583
584  -x-libraries | --x-libraries | --x-librarie | --x-librari \
585  | --x-librar | --x-libra | --x-libr | --x-lib | --x-li | --x-l)
586    ac_prev=x_libraries ;;
587  -x-libraries=* | --x-libraries=* | --x-librarie=* | --x-librari=* \
588  | --x-librar=* | --x-libra=* | --x-libr=* | --x-lib=* | --x-li=* | --x-l=*)
589    x_libraries=$ac_optarg ;;
590
591  -*) { echo "$as_me: error: unrecognized option: $ac_option
592Try \`$0 --help' for more information." >&2
593   { (exit 1); exit 1; }; }
594    ;;
595
596  *=*)
597    ac_envvar=`expr "x$ac_option" : 'x\([^=]*\)='`
598    # Reject names that are not valid shell variable names.
599    expr "x$ac_envvar" : ".*[^_$as_cr_alnum]" >/dev/null &&
600      { echo "$as_me: error: invalid variable name: $ac_envvar" >&2
601   { (exit 1); exit 1; }; }
602    ac_optarg=`echo "$ac_optarg" | sed "s/'/'\\\\\\\\''/g"`
603    eval "$ac_envvar='$ac_optarg'"
604    export $ac_envvar ;;
605
606  *)
607    # FIXME: should be removed in autoconf 3.0.
608    echo "$as_me: WARNING: you should use --build, --host, --target" >&2
609    expr "x$ac_option" : ".*[^-._$as_cr_alnum]" >/dev/null &&
610      echo "$as_me: WARNING: invalid host type: $ac_option" >&2
611    : ${build_alias=$ac_option} ${host_alias=$ac_option} ${target_alias=$ac_option}
612    ;;
613
614  esac
615done
616
617if test -n "$ac_prev"; then
618  ac_option=--`echo $ac_prev | sed 's/_/-/g'`
619  { echo "$as_me: error: missing argument to $ac_option" >&2
620   { (exit 1); exit 1; }; }
621fi
622
623# Be sure to have absolute paths.
624for ac_var in exec_prefix prefix
625do
626  eval ac_val=$`echo $ac_var`
627  case $ac_val in
628    [\\/$]* | ?:[\\/]* | NONE | '' ) ;;
629    *)  { echo "$as_me: error: expected an absolute directory name for --$ac_var: $ac_val" >&2
630   { (exit 1); exit 1; }; };;
631  esac
632done
633
634# Be sure to have absolute paths.
635for ac_var in bindir sbindir libexecdir datadir sysconfdir sharedstatedir \
636	      localstatedir libdir includedir oldincludedir infodir mandir
637do
638  eval ac_val=$`echo $ac_var`
639  case $ac_val in
640    [\\/$]* | ?:[\\/]* ) ;;
641    *)  { echo "$as_me: error: expected an absolute directory name for --$ac_var: $ac_val" >&2
642   { (exit 1); exit 1; }; };;
643  esac
644done
645
646# There might be people who depend on the old broken behavior: `$host'
647# used to hold the argument of --host etc.
648# FIXME: To remove some day.
649build=$build_alias
650host=$host_alias
651target=$target_alias
652
653# FIXME: To remove some day.
654if test "x$host_alias" != x; then
655  if test "x$build_alias" = x; then
656    cross_compiling=maybe
657    echo "$as_me: WARNING: If you wanted to set the --build type, don't use --host.
658    If a cross compiler is detected then cross compile mode will be used." >&2
659  elif test "x$build_alias" != "x$host_alias"; then
660    cross_compiling=yes
661  fi
662fi
663
664ac_tool_prefix=
665test -n "$host_alias" && ac_tool_prefix=$host_alias-
666
667test "$silent" = yes && exec 6>/dev/null
668
669
670# Find the source files, if location was not specified.
671if test -z "$srcdir"; then
672  ac_srcdir_defaulted=yes
673  # Try the directory containing this script, then its parent.
674  ac_confdir=`(dirname "$0") 2>/dev/null ||
675$as_expr X"$0" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
676	 X"$0" : 'X\(//\)[^/]' \| \
677	 X"$0" : 'X\(//\)$' \| \
678	 X"$0" : 'X\(/\)' \| \
679	 .     : '\(.\)' 2>/dev/null ||
680echo X"$0" |
681    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{ s//\1/; q; }
682  	  /^X\(\/\/\)[^/].*/{ s//\1/; q; }
683  	  /^X\(\/\/\)$/{ s//\1/; q; }
684  	  /^X\(\/\).*/{ s//\1/; q; }
685  	  s/.*/./; q'`
686  srcdir=$ac_confdir
687  if test ! -r $srcdir/$ac_unique_file; then
688    srcdir=..
689  fi
690else
691  ac_srcdir_defaulted=no
692fi
693if test ! -r $srcdir/$ac_unique_file; then
694  if test "$ac_srcdir_defaulted" = yes; then
695    { echo "$as_me: error: cannot find sources ($ac_unique_file) in $ac_confdir or .." >&2
696   { (exit 1); exit 1; }; }
697  else
698    { echo "$as_me: error: cannot find sources ($ac_unique_file) in $srcdir" >&2
699   { (exit 1); exit 1; }; }
700  fi
701fi
702(cd $srcdir && test -r ./$ac_unique_file) 2>/dev/null ||
703  { echo "$as_me: error: sources are in $srcdir, but \`cd $srcdir' does not work" >&2
704   { (exit 1); exit 1; }; }
705srcdir=`echo "$srcdir" | sed 's%\([^\\/]\)[\\/]*$%\1%'`
706ac_env_build_alias_set=${build_alias+set}
707ac_env_build_alias_value=$build_alias
708ac_cv_env_build_alias_set=${build_alias+set}
709ac_cv_env_build_alias_value=$build_alias
710ac_env_host_alias_set=${host_alias+set}
711ac_env_host_alias_value=$host_alias
712ac_cv_env_host_alias_set=${host_alias+set}
713ac_cv_env_host_alias_value=$host_alias
714ac_env_target_alias_set=${target_alias+set}
715ac_env_target_alias_value=$target_alias
716ac_cv_env_target_alias_set=${target_alias+set}
717ac_cv_env_target_alias_value=$target_alias
718ac_env_CC_set=${CC+set}
719ac_env_CC_value=$CC
720ac_cv_env_CC_set=${CC+set}
721ac_cv_env_CC_value=$CC
722ac_env_CFLAGS_set=${CFLAGS+set}
723ac_env_CFLAGS_value=$CFLAGS
724ac_cv_env_CFLAGS_set=${CFLAGS+set}
725ac_cv_env_CFLAGS_value=$CFLAGS
726ac_env_LDFLAGS_set=${LDFLAGS+set}
727ac_env_LDFLAGS_value=$LDFLAGS
728ac_cv_env_LDFLAGS_set=${LDFLAGS+set}
729ac_cv_env_LDFLAGS_value=$LDFLAGS
730ac_env_CPPFLAGS_set=${CPPFLAGS+set}
731ac_env_CPPFLAGS_value=$CPPFLAGS
732ac_cv_env_CPPFLAGS_set=${CPPFLAGS+set}
733ac_cv_env_CPPFLAGS_value=$CPPFLAGS
734
735#
736# Report the --help message.
737#
738if test "$ac_init_help" = "long"; then
739  # Omit some internal or obsolete options to make the list less imposing.
740  # This message is too long to be a string in the A/UX 3.1 sh.
741  cat <<_ACEOF
742\`configure' configures fdlibm 5.3 to adapt to many kinds of systems.
743
744Usage: $0 [OPTION]... [VAR=VALUE]...
745
746To assign environment variables (e.g., CC, CFLAGS...), specify them as
747VAR=VALUE.  See below for descriptions of some of the useful variables.
748
749Defaults for the options are specified in brackets.
750
751Configuration:
752  -h, --help              display this help and exit
753      --help=short        display options specific to this package
754      --help=recursive    display the short help of all the included packages
755  -V, --version           display version information and exit
756  -q, --quiet, --silent   do not print \`checking...' messages
757      --cache-file=FILE   cache test results in FILE [disabled]
758  -C, --config-cache      alias for \`--cache-file=config.cache'
759  -n, --no-create         do not create output files
760      --srcdir=DIR        find the sources in DIR [configure dir or \`..']
761
762_ACEOF
763
764  cat <<_ACEOF
765Installation directories:
766  --prefix=PREFIX         install architecture-independent files in PREFIX
767			  [$ac_default_prefix]
768  --exec-prefix=EPREFIX   install architecture-dependent files in EPREFIX
769			  [PREFIX]
770
771By default, \`make install' will install all the files in
772\`$ac_default_prefix/bin', \`$ac_default_prefix/lib' etc.  You can specify
773an installation prefix other than \`$ac_default_prefix' using \`--prefix',
774for instance \`--prefix=\$HOME'.
775
776For better control, use the options below.
777
778Fine tuning of the installation directories:
779  --bindir=DIR           user executables [EPREFIX/bin]
780  --sbindir=DIR          system admin executables [EPREFIX/sbin]
781  --libexecdir=DIR       program executables [EPREFIX/libexec]
782  --datadir=DIR          read-only architecture-independent data [PREFIX/share]
783  --sysconfdir=DIR       read-only single-machine data [PREFIX/etc]
784  --sharedstatedir=DIR   modifiable architecture-independent data [PREFIX/com]
785  --localstatedir=DIR    modifiable single-machine data [PREFIX/var]
786  --libdir=DIR           object code libraries [EPREFIX/lib]
787  --includedir=DIR       C header files [PREFIX/include]
788  --oldincludedir=DIR    C header files for non-gcc [/usr/include]
789  --infodir=DIR          info documentation [PREFIX/info]
790  --mandir=DIR           man documentation [PREFIX/man]
791_ACEOF
792
793  cat <<\_ACEOF
794_ACEOF
795fi
796
797if test -n "$ac_init_help"; then
798  case $ac_init_help in
799     short | recursive ) echo "Configuration of fdlibm 5.3:";;
800   esac
801  cat <<\_ACEOF
802
803Some influential environment variables:
804  CC          C compiler command
805  CFLAGS      C compiler flags
806  LDFLAGS     linker flags, e.g. -L<lib dir> if you have libraries in a
807              nonstandard directory <lib dir>
808  CPPFLAGS    C/C++ preprocessor flags, e.g. -I<include dir> if you have
809              headers in a nonstandard directory <include dir>
810
811Use these variables to override the choices made by `configure' or to help
812it to find libraries and programs with nonstandard names/locations.
813
814Report bugs to <FDLIBM COMMENTS <fdlibm-comments AT sun.com>>
815_ACEOF
816fi
817
818if test "$ac_init_help" = "recursive"; then
819  # If there are subdirs, report their specific --help.
820  ac_popdir=`pwd`
821  for ac_dir in : $ac_subdirs_all; do test "x$ac_dir" = x: && continue
822    test -d $ac_dir || continue
823    ac_builddir=.
824
825if test "$ac_dir" != .; then
826  ac_dir_suffix=/`echo "$ac_dir" | sed 's,^\.[\\/],,'`
827  # A "../" for each directory in $ac_dir_suffix.
828  ac_top_builddir=`echo "$ac_dir_suffix" | sed 's,/[^\\/]*,../,g'`
829else
830  ac_dir_suffix= ac_top_builddir=
831fi
832
833case $srcdir in
834  .)  # No --srcdir option.  We are building in place.
835    ac_srcdir=.
836    if test -z "$ac_top_builddir"; then
837       ac_top_srcdir=.
838    else
839       ac_top_srcdir=`echo $ac_top_builddir | sed 's,/$,,'`
840    fi ;;
841  [\\/]* | ?:[\\/]* )  # Absolute path.
842    ac_srcdir=$srcdir$ac_dir_suffix;
843    ac_top_srcdir=$srcdir ;;
844  *) # Relative path.
845    ac_srcdir=$ac_top_builddir$srcdir$ac_dir_suffix
846    ac_top_srcdir=$ac_top_builddir$srcdir ;;
847esac
848
849# Do not use `cd foo && pwd` to compute absolute paths, because
850# the directories may not exist.
851case `pwd` in
852.) ac_abs_builddir="$ac_dir";;
853*)
854  case "$ac_dir" in
855  .) ac_abs_builddir=`pwd`;;
856  [\\/]* | ?:[\\/]* ) ac_abs_builddir="$ac_dir";;
857  *) ac_abs_builddir=`pwd`/"$ac_dir";;
858  esac;;
859esac
860case $ac_abs_builddir in
861.) ac_abs_top_builddir=${ac_top_builddir}.;;
862*)
863  case ${ac_top_builddir}. in
864  .) ac_abs_top_builddir=$ac_abs_builddir;;
865  [\\/]* | ?:[\\/]* ) ac_abs_top_builddir=${ac_top_builddir}.;;
866  *) ac_abs_top_builddir=$ac_abs_builddir/${ac_top_builddir}.;;
867  esac;;
868esac
869case $ac_abs_builddir in
870.) ac_abs_srcdir=$ac_srcdir;;
871*)
872  case $ac_srcdir in
873  .) ac_abs_srcdir=$ac_abs_builddir;;
874  [\\/]* | ?:[\\/]* ) ac_abs_srcdir=$ac_srcdir;;
875  *) ac_abs_srcdir=$ac_abs_builddir/$ac_srcdir;;
876  esac;;
877esac
878case $ac_abs_builddir in
879.) ac_abs_top_srcdir=$ac_top_srcdir;;
880*)
881  case $ac_top_srcdir in
882  .) ac_abs_top_srcdir=$ac_abs_builddir;;
883  [\\/]* | ?:[\\/]* ) ac_abs_top_srcdir=$ac_top_srcdir;;
884  *) ac_abs_top_srcdir=$ac_abs_builddir/$ac_top_srcdir;;
885  esac;;
886esac
887
888    cd $ac_dir
889    # Check for guested configure; otherwise get Cygnus style configure.
890    if test -f $ac_srcdir/configure.gnu; then
891      echo
892      $SHELL $ac_srcdir/configure.gnu  --help=recursive
893    elif test -f $ac_srcdir/configure; then
894      echo
895      $SHELL $ac_srcdir/configure  --help=recursive
896    elif test -f $ac_srcdir/configure.ac ||
897	   test -f $ac_srcdir/configure.in; then
898      echo
899      $ac_configure --help
900    else
901      echo "$as_me: WARNING: no configuration information is in $ac_dir" >&2
902    fi
903    cd $ac_popdir
904  done
905fi
906
907test -n "$ac_init_help" && exit 0
908if $ac_init_version; then
909  cat <<\_ACEOF
910fdlibm configure 5.3
911generated by GNU Autoconf 2.59
912
913Copyright (C) 2003 Free Software Foundation, Inc.
914This configure script is free software; the Free Software Foundation
915gives unlimited permission to copy, distribute and modify it.
916_ACEOF
917  exit 0
918fi
919exec 5>config.log
920cat >&5 <<_ACEOF
921This file contains any messages produced by compilers while
922running configure, to aid debugging if configure makes a mistake.
923
924It was created by fdlibm $as_me 5.3, which was
925generated by GNU Autoconf 2.59.  Invocation command line was
926
927  $ $0 $@
928
929_ACEOF
930{
931cat <<_ASUNAME
932## --------- ##
933## Platform. ##
934## --------- ##
935
936hostname = `(hostname || uname -n) 2>/dev/null | sed 1q`
937uname -m = `(uname -m) 2>/dev/null || echo unknown`
938uname -r = `(uname -r) 2>/dev/null || echo unknown`
939uname -s = `(uname -s) 2>/dev/null || echo unknown`
940uname -v = `(uname -v) 2>/dev/null || echo unknown`
941
942/usr/bin/uname -p = `(/usr/bin/uname -p) 2>/dev/null || echo unknown`
943/bin/uname -X     = `(/bin/uname -X) 2>/dev/null     || echo unknown`
944
945/bin/arch              = `(/bin/arch) 2>/dev/null              || echo unknown`
946/usr/bin/arch -k       = `(/usr/bin/arch -k) 2>/dev/null       || echo unknown`
947/usr/convex/getsysinfo = `(/usr/convex/getsysinfo) 2>/dev/null || echo unknown`
948hostinfo               = `(hostinfo) 2>/dev/null               || echo unknown`
949/bin/machine           = `(/bin/machine) 2>/dev/null           || echo unknown`
950/usr/bin/oslevel       = `(/usr/bin/oslevel) 2>/dev/null       || echo unknown`
951/bin/universe          = `(/bin/universe) 2>/dev/null          || echo unknown`
952
953_ASUNAME
954
955as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
956for as_dir in $PATH
957do
958  IFS=$as_save_IFS
959  test -z "$as_dir" && as_dir=.
960  echo "PATH: $as_dir"
961done
962
963} >&5
964
965cat >&5 <<_ACEOF
966
967
968## ----------- ##
969## Core tests. ##
970## ----------- ##
971
972_ACEOF
973
974
975# Keep a trace of the command line.
976# Strip out --no-create and --no-recursion so they do not pile up.
977# Strip out --silent because we don't want to record it for future runs.
978# Also quote any args containing shell meta-characters.
979# Make two passes to allow for proper duplicate-argument suppression.
980ac_configure_args=
981ac_configure_args0=
982ac_configure_args1=
983ac_sep=
984ac_must_keep_next=false
985for ac_pass in 1 2
986do
987  for ac_arg
988  do
989    case $ac_arg in
990    -no-create | --no-c* | -n | -no-recursion | --no-r*) continue ;;
991    -q | -quiet | --quiet | --quie | --qui | --qu | --q \
992    | -silent | --silent | --silen | --sile | --sil)
993      continue ;;
994    *" "*|*"	"*|*[\[\]\~\#\$\^\&\*\(\)\{\}\\\|\;\<\>\?\"\']*)
995      ac_arg=`echo "$ac_arg" | sed "s/'/'\\\\\\\\''/g"` ;;
996    esac
997    case $ac_pass in
998    1) ac_configure_args0="$ac_configure_args0 '$ac_arg'" ;;
999    2)
1000      ac_configure_args1="$ac_configure_args1 '$ac_arg'"
1001      if test $ac_must_keep_next = true; then
1002	ac_must_keep_next=false # Got value, back to normal.
1003      else
1004	case $ac_arg in
1005	  *=* | --config-cache | -C | -disable-* | --disable-* \
1006	  | -enable-* | --enable-* | -gas | --g* | -nfp | --nf* \
1007	  | -q | -quiet | --q* | -silent | --sil* | -v | -verb* \
1008	  | -with-* | --with-* | -without-* | --without-* | --x)
1009	    case "$ac_configure_args0 " in
1010	      "$ac_configure_args1"*" '$ac_arg' "* ) continue ;;
1011	    esac
1012	    ;;
1013	  -* ) ac_must_keep_next=true ;;
1014	esac
1015      fi
1016      ac_configure_args="$ac_configure_args$ac_sep'$ac_arg'"
1017      # Get rid of the leading space.
1018      ac_sep=" "
1019      ;;
1020    esac
1021  done
1022done
1023$as_unset ac_configure_args0 || test "${ac_configure_args0+set}" != set || { ac_configure_args0=; export ac_configure_args0; }
1024$as_unset ac_configure_args1 || test "${ac_configure_args1+set}" != set || { ac_configure_args1=; export ac_configure_args1; }
1025
1026# When interrupted or exit'd, cleanup temporary files, and complete
1027# config.log.  We remove comments because anyway the quotes in there
1028# would cause problems or look ugly.
1029# WARNING: Be sure not to use single quotes in there, as some shells,
1030# such as our DU 5.0 friend, will then `close' the trap.
1031trap 'exit_status=$?
1032  # Save into config.log some information that might help in debugging.
1033  {
1034    echo
1035
1036    cat <<\_ASBOX
1037## ---------------- ##
1038## Cache variables. ##
1039## ---------------- ##
1040_ASBOX
1041    echo
1042    # The following way of writing the cache mishandles newlines in values,
1043{
1044  (set) 2>&1 |
1045    case `(ac_space='"'"' '"'"'; set | grep ac_space) 2>&1` in
1046    *ac_space=\ *)
1047      sed -n \
1048	"s/'"'"'/'"'"'\\\\'"'"''"'"'/g;
1049	  s/^\\([_$as_cr_alnum]*_cv_[_$as_cr_alnum]*\\)=\\(.*\\)/\\1='"'"'\\2'"'"'/p"
1050      ;;
1051    *)
1052      sed -n \
1053	"s/^\\([_$as_cr_alnum]*_cv_[_$as_cr_alnum]*\\)=\\(.*\\)/\\1=\\2/p"
1054      ;;
1055    esac;
1056}
1057    echo
1058
1059    cat <<\_ASBOX
1060## ----------------- ##
1061## Output variables. ##
1062## ----------------- ##
1063_ASBOX
1064    echo
1065    for ac_var in $ac_subst_vars
1066    do
1067      eval ac_val=$`echo $ac_var`
1068      echo "$ac_var='"'"'$ac_val'"'"'"
1069    done | sort
1070    echo
1071
1072    if test -n "$ac_subst_files"; then
1073      cat <<\_ASBOX
1074## ------------- ##
1075## Output files. ##
1076## ------------- ##
1077_ASBOX
1078      echo
1079      for ac_var in $ac_subst_files
1080      do
1081	eval ac_val=$`echo $ac_var`
1082	echo "$ac_var='"'"'$ac_val'"'"'"
1083      done | sort
1084      echo
1085    fi
1086
1087    if test -s confdefs.h; then
1088      cat <<\_ASBOX
1089## ----------- ##
1090## confdefs.h. ##
1091## ----------- ##
1092_ASBOX
1093      echo
1094      sed "/^$/d" confdefs.h | sort
1095      echo
1096    fi
1097    test "$ac_signal" != 0 &&
1098      echo "$as_me: caught signal $ac_signal"
1099    echo "$as_me: exit $exit_status"
1100  } >&5
1101  rm -f core *.core &&
1102  rm -rf conftest* confdefs* conf$$* $ac_clean_files &&
1103    exit $exit_status
1104     ' 0
1105for ac_signal in 1 2 13 15; do
1106  trap 'ac_signal='$ac_signal'; { (exit 1); exit 1; }' $ac_signal
1107done
1108ac_signal=0
1109
1110# confdefs.h avoids OS command line length limits that DEFS can exceed.
1111rm -rf conftest* confdefs.h
1112# AIX cpp loses on an empty file, so make sure it contains at least a newline.
1113echo >confdefs.h
1114
1115# Predefined preprocessor variables.
1116
1117cat >>confdefs.h <<_ACEOF
1118#define PACKAGE_NAME "$PACKAGE_NAME"
1119_ACEOF
1120
1121
1122cat >>confdefs.h <<_ACEOF
1123#define PACKAGE_TARNAME "$PACKAGE_TARNAME"
1124_ACEOF
1125
1126
1127cat >>confdefs.h <<_ACEOF
1128#define PACKAGE_VERSION "$PACKAGE_VERSION"
1129_ACEOF
1130
1131
1132cat >>confdefs.h <<_ACEOF
1133#define PACKAGE_STRING "$PACKAGE_STRING"
1134_ACEOF
1135
1136
1137cat >>confdefs.h <<_ACEOF
1138#define PACKAGE_BUGREPORT "$PACKAGE_BUGREPORT"
1139_ACEOF
1140
1141
1142# Let the site file select an alternate cache file if it wants to.
1143# Prefer explicitly selected file to automatically selected ones.
1144if test -z "$CONFIG_SITE"; then
1145  if test "x$prefix" != xNONE; then
1146    CONFIG_SITE="$prefix/share/config.site $prefix/etc/config.site"
1147  else
1148    CONFIG_SITE="$ac_default_prefix/share/config.site $ac_default_prefix/etc/config.site"
1149  fi
1150fi
1151for ac_site_file in $CONFIG_SITE; do
1152  if test -r "$ac_site_file"; then
1153    { echo "$as_me:$LINENO: loading site script $ac_site_file" >&5
1154echo "$as_me: loading site script $ac_site_file" >&6;}
1155    sed 's/^/| /' "$ac_site_file" >&5
1156    . "$ac_site_file"
1157  fi
1158done
1159
1160if test -r "$cache_file"; then
1161  # Some versions of bash will fail to source /dev/null (special
1162  # files actually), so we avoid doing that.
1163  if test -f "$cache_file"; then
1164    { echo "$as_me:$LINENO: loading cache $cache_file" >&5
1165echo "$as_me: loading cache $cache_file" >&6;}
1166    case $cache_file in
1167      [\\/]* | ?:[\\/]* ) . $cache_file;;
1168      *)                      . ./$cache_file;;
1169    esac
1170  fi
1171else
1172  { echo "$as_me:$LINENO: creating cache $cache_file" >&5
1173echo "$as_me: creating cache $cache_file" >&6;}
1174  >$cache_file
1175fi
1176
1177# Check that the precious variables saved in the cache have kept the same
1178# value.
1179ac_cache_corrupted=false
1180for ac_var in `(set) 2>&1 |
1181	       sed -n 's/^ac_env_\([a-zA-Z_0-9]*\)_set=.*/\1/p'`; do
1182  eval ac_old_set=\$ac_cv_env_${ac_var}_set
1183  eval ac_new_set=\$ac_env_${ac_var}_set
1184  eval ac_old_val="\$ac_cv_env_${ac_var}_value"
1185  eval ac_new_val="\$ac_env_${ac_var}_value"
1186  case $ac_old_set,$ac_new_set in
1187    set,)
1188      { echo "$as_me:$LINENO: error: \`$ac_var' was set to \`$ac_old_val' in the previous run" >&5
1189echo "$as_me: error: \`$ac_var' was set to \`$ac_old_val' in the previous run" >&2;}
1190      ac_cache_corrupted=: ;;
1191    ,set)
1192      { echo "$as_me:$LINENO: error: \`$ac_var' was not set in the previous run" >&5
1193echo "$as_me: error: \`$ac_var' was not set in the previous run" >&2;}
1194      ac_cache_corrupted=: ;;
1195    ,);;
1196    *)
1197      if test "x$ac_old_val" != "x$ac_new_val"; then
1198	{ echo "$as_me:$LINENO: error: \`$ac_var' has changed since the previous run:" >&5
1199echo "$as_me: error: \`$ac_var' has changed since the previous run:" >&2;}
1200	{ echo "$as_me:$LINENO:   former value:  $ac_old_val" >&5
1201echo "$as_me:   former value:  $ac_old_val" >&2;}
1202	{ echo "$as_me:$LINENO:   current value: $ac_new_val" >&5
1203echo "$as_me:   current value: $ac_new_val" >&2;}
1204	ac_cache_corrupted=:
1205      fi;;
1206  esac
1207  # Pass precious variables to config.status.
1208  if test "$ac_new_set" = set; then
1209    case $ac_new_val in
1210    *" "*|*"	"*|*[\[\]\~\#\$\^\&\*\(\)\{\}\\\|\;\<\>\?\"\']*)
1211      ac_arg=$ac_var=`echo "$ac_new_val" | sed "s/'/'\\\\\\\\''/g"` ;;
1212    *) ac_arg=$ac_var=$ac_new_val ;;
1213    esac
1214    case " $ac_configure_args " in
1215      *" '$ac_arg' "*) ;; # Avoid dups.  Use of quotes ensures accuracy.
1216      *) ac_configure_args="$ac_configure_args '$ac_arg'" ;;
1217    esac
1218  fi
1219done
1220if $ac_cache_corrupted; then
1221  { echo "$as_me:$LINENO: error: changes in the environment can compromise the build" >&5
1222echo "$as_me: error: changes in the environment can compromise the build" >&2;}
1223  { { echo "$as_me:$LINENO: error: run \`make distclean' and/or \`rm $cache_file' and start over" >&5
1224echo "$as_me: error: run \`make distclean' and/or \`rm $cache_file' and start over" >&2;}
1225   { (exit 1); exit 1; }; }
1226fi
1227
1228ac_ext=c
1229ac_cpp='$CPP $CPPFLAGS'
1230ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
1231ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
1232ac_compiler_gnu=$ac_cv_c_compiler_gnu
1233
1234
1235
1236
1237
1238
1239
1240
1241
1242
1243
1244
1245
1246
1247
1248
1249
1250
1251
1252
1253
1254
1255
1256
1257
1258
1259
1260
1261
1262ac_ext=c
1263ac_cpp='$CPP $CPPFLAGS'
1264ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
1265ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
1266ac_compiler_gnu=$ac_cv_c_compiler_gnu
1267if test -n "$ac_tool_prefix"; then
1268  # Extract the first word of "${ac_tool_prefix}gcc", so it can be a program name with args.
1269set dummy ${ac_tool_prefix}gcc; ac_word=$2
1270echo "$as_me:$LINENO: checking for $ac_word" >&5
1271echo $ECHO_N "checking for $ac_word... $ECHO_C" >&6
1272if test "${ac_cv_prog_CC+set}" = set; then
1273  echo $ECHO_N "(cached) $ECHO_C" >&6
1274else
1275  if test -n "$CC"; then
1276  ac_cv_prog_CC="$CC" # Let the user override the test.
1277else
1278as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
1279for as_dir in $PATH
1280do
1281  IFS=$as_save_IFS
1282  test -z "$as_dir" && as_dir=.
1283  for ac_exec_ext in '' $ac_executable_extensions; do
1284  if $as_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
1285    ac_cv_prog_CC="${ac_tool_prefix}gcc"
1286    echo "$as_me:$LINENO: found $as_dir/$ac_word$ac_exec_ext" >&5
1287    break 2
1288  fi
1289done
1290done
1291
1292fi
1293fi
1294CC=$ac_cv_prog_CC
1295if test -n "$CC"; then
1296  echo "$as_me:$LINENO: result: $CC" >&5
1297echo "${ECHO_T}$CC" >&6
1298else
1299  echo "$as_me:$LINENO: result: no" >&5
1300echo "${ECHO_T}no" >&6
1301fi
1302
1303fi
1304if test -z "$ac_cv_prog_CC"; then
1305  ac_ct_CC=$CC
1306  # Extract the first word of "gcc", so it can be a program name with args.
1307set dummy gcc; ac_word=$2
1308echo "$as_me:$LINENO: checking for $ac_word" >&5
1309echo $ECHO_N "checking for $ac_word... $ECHO_C" >&6
1310if test "${ac_cv_prog_ac_ct_CC+set}" = set; then
1311  echo $ECHO_N "(cached) $ECHO_C" >&6
1312else
1313  if test -n "$ac_ct_CC"; then
1314  ac_cv_prog_ac_ct_CC="$ac_ct_CC" # Let the user override the test.
1315else
1316as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
1317for as_dir in $PATH
1318do
1319  IFS=$as_save_IFS
1320  test -z "$as_dir" && as_dir=.
1321  for ac_exec_ext in '' $ac_executable_extensions; do
1322  if $as_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
1323    ac_cv_prog_ac_ct_CC="gcc"
1324    echo "$as_me:$LINENO: found $as_dir/$ac_word$ac_exec_ext" >&5
1325    break 2
1326  fi
1327done
1328done
1329
1330fi
1331fi
1332ac_ct_CC=$ac_cv_prog_ac_ct_CC
1333if test -n "$ac_ct_CC"; then
1334  echo "$as_me:$LINENO: result: $ac_ct_CC" >&5
1335echo "${ECHO_T}$ac_ct_CC" >&6
1336else
1337  echo "$as_me:$LINENO: result: no" >&5
1338echo "${ECHO_T}no" >&6
1339fi
1340
1341  CC=$ac_ct_CC
1342else
1343  CC="$ac_cv_prog_CC"
1344fi
1345
1346if test -z "$CC"; then
1347  if test -n "$ac_tool_prefix"; then
1348  # Extract the first word of "${ac_tool_prefix}cc", so it can be a program name with args.
1349set dummy ${ac_tool_prefix}cc; ac_word=$2
1350echo "$as_me:$LINENO: checking for $ac_word" >&5
1351echo $ECHO_N "checking for $ac_word... $ECHO_C" >&6
1352if test "${ac_cv_prog_CC+set}" = set; then
1353  echo $ECHO_N "(cached) $ECHO_C" >&6
1354else
1355  if test -n "$CC"; then
1356  ac_cv_prog_CC="$CC" # Let the user override the test.
1357else
1358as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
1359for as_dir in $PATH
1360do
1361  IFS=$as_save_IFS
1362  test -z "$as_dir" && as_dir=.
1363  for ac_exec_ext in '' $ac_executable_extensions; do
1364  if $as_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
1365    ac_cv_prog_CC="${ac_tool_prefix}cc"
1366    echo "$as_me:$LINENO: found $as_dir/$ac_word$ac_exec_ext" >&5
1367    break 2
1368  fi
1369done
1370done
1371
1372fi
1373fi
1374CC=$ac_cv_prog_CC
1375if test -n "$CC"; then
1376  echo "$as_me:$LINENO: result: $CC" >&5
1377echo "${ECHO_T}$CC" >&6
1378else
1379  echo "$as_me:$LINENO: result: no" >&5
1380echo "${ECHO_T}no" >&6
1381fi
1382
1383fi
1384if test -z "$ac_cv_prog_CC"; then
1385  ac_ct_CC=$CC
1386  # Extract the first word of "cc", so it can be a program name with args.
1387set dummy cc; ac_word=$2
1388echo "$as_me:$LINENO: checking for $ac_word" >&5
1389echo $ECHO_N "checking for $ac_word... $ECHO_C" >&6
1390if test "${ac_cv_prog_ac_ct_CC+set}" = set; then
1391  echo $ECHO_N "(cached) $ECHO_C" >&6
1392else
1393  if test -n "$ac_ct_CC"; then
1394  ac_cv_prog_ac_ct_CC="$ac_ct_CC" # Let the user override the test.
1395else
1396as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
1397for as_dir in $PATH
1398do
1399  IFS=$as_save_IFS
1400  test -z "$as_dir" && as_dir=.
1401  for ac_exec_ext in '' $ac_executable_extensions; do
1402  if $as_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
1403    ac_cv_prog_ac_ct_CC="cc"
1404    echo "$as_me:$LINENO: found $as_dir/$ac_word$ac_exec_ext" >&5
1405    break 2
1406  fi
1407done
1408done
1409
1410fi
1411fi
1412ac_ct_CC=$ac_cv_prog_ac_ct_CC
1413if test -n "$ac_ct_CC"; then
1414  echo "$as_me:$LINENO: result: $ac_ct_CC" >&5
1415echo "${ECHO_T}$ac_ct_CC" >&6
1416else
1417  echo "$as_me:$LINENO: result: no" >&5
1418echo "${ECHO_T}no" >&6
1419fi
1420
1421  CC=$ac_ct_CC
1422else
1423  CC="$ac_cv_prog_CC"
1424fi
1425
1426fi
1427if test -z "$CC"; then
1428  # Extract the first word of "cc", so it can be a program name with args.
1429set dummy cc; ac_word=$2
1430echo "$as_me:$LINENO: checking for $ac_word" >&5
1431echo $ECHO_N "checking for $ac_word... $ECHO_C" >&6
1432if test "${ac_cv_prog_CC+set}" = set; then
1433  echo $ECHO_N "(cached) $ECHO_C" >&6
1434else
1435  if test -n "$CC"; then
1436  ac_cv_prog_CC="$CC" # Let the user override the test.
1437else
1438  ac_prog_rejected=no
1439as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
1440for as_dir in $PATH
1441do
1442  IFS=$as_save_IFS
1443  test -z "$as_dir" && as_dir=.
1444  for ac_exec_ext in '' $ac_executable_extensions; do
1445  if $as_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
1446    if test "$as_dir/$ac_word$ac_exec_ext" = "/usr/ucb/cc"; then
1447       ac_prog_rejected=yes
1448       continue
1449     fi
1450    ac_cv_prog_CC="cc"
1451    echo "$as_me:$LINENO: found $as_dir/$ac_word$ac_exec_ext" >&5
1452    break 2
1453  fi
1454done
1455done
1456
1457if test $ac_prog_rejected = yes; then
1458  # We found a bogon in the path, so make sure we never use it.
1459  set dummy $ac_cv_prog_CC
1460  shift
1461  if test $# != 0; then
1462    # We chose a different compiler from the bogus one.
1463    # However, it has the same basename, so the bogon will be chosen
1464    # first if we set CC to just the basename; use the full file name.
1465    shift
1466    ac_cv_prog_CC="$as_dir/$ac_word${1+' '}$@"
1467  fi
1468fi
1469fi
1470fi
1471CC=$ac_cv_prog_CC
1472if test -n "$CC"; then
1473  echo "$as_me:$LINENO: result: $CC" >&5
1474echo "${ECHO_T}$CC" >&6
1475else
1476  echo "$as_me:$LINENO: result: no" >&5
1477echo "${ECHO_T}no" >&6
1478fi
1479
1480fi
1481if test -z "$CC"; then
1482  if test -n "$ac_tool_prefix"; then
1483  for ac_prog in cl
1484  do
1485    # Extract the first word of "$ac_tool_prefix$ac_prog", so it can be a program name with args.
1486set dummy $ac_tool_prefix$ac_prog; ac_word=$2
1487echo "$as_me:$LINENO: checking for $ac_word" >&5
1488echo $ECHO_N "checking for $ac_word... $ECHO_C" >&6
1489if test "${ac_cv_prog_CC+set}" = set; then
1490  echo $ECHO_N "(cached) $ECHO_C" >&6
1491else
1492  if test -n "$CC"; then
1493  ac_cv_prog_CC="$CC" # Let the user override the test.
1494else
1495as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
1496for as_dir in $PATH
1497do
1498  IFS=$as_save_IFS
1499  test -z "$as_dir" && as_dir=.
1500  for ac_exec_ext in '' $ac_executable_extensions; do
1501  if $as_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
1502    ac_cv_prog_CC="$ac_tool_prefix$ac_prog"
1503    echo "$as_me:$LINENO: found $as_dir/$ac_word$ac_exec_ext" >&5
1504    break 2
1505  fi
1506done
1507done
1508
1509fi
1510fi
1511CC=$ac_cv_prog_CC
1512if test -n "$CC"; then
1513  echo "$as_me:$LINENO: result: $CC" >&5
1514echo "${ECHO_T}$CC" >&6
1515else
1516  echo "$as_me:$LINENO: result: no" >&5
1517echo "${ECHO_T}no" >&6
1518fi
1519
1520    test -n "$CC" && break
1521  done
1522fi
1523if test -z "$CC"; then
1524  ac_ct_CC=$CC
1525  for ac_prog in cl
1526do
1527  # Extract the first word of "$ac_prog", so it can be a program name with args.
1528set dummy $ac_prog; ac_word=$2
1529echo "$as_me:$LINENO: checking for $ac_word" >&5
1530echo $ECHO_N "checking for $ac_word... $ECHO_C" >&6
1531if test "${ac_cv_prog_ac_ct_CC+set}" = set; then
1532  echo $ECHO_N "(cached) $ECHO_C" >&6
1533else
1534  if test -n "$ac_ct_CC"; then
1535  ac_cv_prog_ac_ct_CC="$ac_ct_CC" # Let the user override the test.
1536else
1537as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
1538for as_dir in $PATH
1539do
1540  IFS=$as_save_IFS
1541  test -z "$as_dir" && as_dir=.
1542  for ac_exec_ext in '' $ac_executable_extensions; do
1543  if $as_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
1544    ac_cv_prog_ac_ct_CC="$ac_prog"
1545    echo "$as_me:$LINENO: found $as_dir/$ac_word$ac_exec_ext" >&5
1546    break 2
1547  fi
1548done
1549done
1550
1551fi
1552fi
1553ac_ct_CC=$ac_cv_prog_ac_ct_CC
1554if test -n "$ac_ct_CC"; then
1555  echo "$as_me:$LINENO: result: $ac_ct_CC" >&5
1556echo "${ECHO_T}$ac_ct_CC" >&6
1557else
1558  echo "$as_me:$LINENO: result: no" >&5
1559echo "${ECHO_T}no" >&6
1560fi
1561
1562  test -n "$ac_ct_CC" && break
1563done
1564
1565  CC=$ac_ct_CC
1566fi
1567
1568fi
1569
1570
1571test -z "$CC" && { { echo "$as_me:$LINENO: error: no acceptable C compiler found in \$PATH
1572See \`config.log' for more details." >&5
1573echo "$as_me: error: no acceptable C compiler found in \$PATH
1574See \`config.log' for more details." >&2;}
1575   { (exit 1); exit 1; }; }
1576
1577# Provide some information about the compiler.
1578echo "$as_me:$LINENO:" \
1579     "checking for C compiler version" >&5
1580ac_compiler=`set X $ac_compile; echo $2`
1581{ (eval echo "$as_me:$LINENO: \"$ac_compiler --version </dev/null >&5\"") >&5
1582  (eval $ac_compiler --version </dev/null >&5) 2>&5
1583  ac_status=$?
1584  echo "$as_me:$LINENO: \$? = $ac_status" >&5
1585  (exit $ac_status); }
1586{ (eval echo "$as_me:$LINENO: \"$ac_compiler -v </dev/null >&5\"") >&5
1587  (eval $ac_compiler -v </dev/null >&5) 2>&5
1588  ac_status=$?
1589  echo "$as_me:$LINENO: \$? = $ac_status" >&5
1590  (exit $ac_status); }
1591{ (eval echo "$as_me:$LINENO: \"$ac_compiler -V </dev/null >&5\"") >&5
1592  (eval $ac_compiler -V </dev/null >&5) 2>&5
1593  ac_status=$?
1594  echo "$as_me:$LINENO: \$? = $ac_status" >&5
1595  (exit $ac_status); }
1596
1597cat >conftest.$ac_ext <<_ACEOF
1598/* confdefs.h.  */
1599_ACEOF
1600cat confdefs.h >>conftest.$ac_ext
1601cat >>conftest.$ac_ext <<_ACEOF
1602/* end confdefs.h.  */
1603
1604int
1605main ()
1606{
1607
1608  ;
1609  return 0;
1610}
1611_ACEOF
1612ac_clean_files_save=$ac_clean_files
1613ac_clean_files="$ac_clean_files a.out a.exe b.out"
1614# Try to create an executable without -o first, disregard a.out.
1615# It will help us diagnose broken compilers, and finding out an intuition
1616# of exeext.
1617echo "$as_me:$LINENO: checking for C compiler default output file name" >&5
1618echo $ECHO_N "checking for C compiler default output file name... $ECHO_C" >&6
1619ac_link_default=`echo "$ac_link" | sed 's/ -o *conftest[^ ]*//'`
1620if { (eval echo "$as_me:$LINENO: \"$ac_link_default\"") >&5
1621  (eval $ac_link_default) 2>&5
1622  ac_status=$?
1623  echo "$as_me:$LINENO: \$? = $ac_status" >&5
1624  (exit $ac_status); }; then
1625  # Find the output, starting from the most likely.  This scheme is
1626# not robust to junk in `.', hence go to wildcards (a.*) only as a last
1627# resort.
1628
1629# Be careful to initialize this variable, since it used to be cached.
1630# Otherwise an old cache value of `no' led to `EXEEXT = no' in a Makefile.
1631ac_cv_exeext=
1632# b.out is created by i960 compilers.
1633for ac_file in a_out.exe a.exe conftest.exe a.out conftest a.* conftest.* b.out
1634do
1635  test -f "$ac_file" || continue
1636  case $ac_file in
1637    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.o | *.obj )
1638	;;
1639    conftest.$ac_ext )
1640	# This is the source file.
1641	;;
1642    [ab].out )
1643	# We found the default executable, but exeext='' is most
1644	# certainly right.
1645	break;;
1646    *.* )
1647	ac_cv_exeext=`expr "$ac_file" : '[^.]*\(\..*\)'`
1648	# FIXME: I believe we export ac_cv_exeext for Libtool,
1649	# but it would be cool to find out if it's true.  Does anybody
1650	# maintain Libtool? --akim.
1651	export ac_cv_exeext
1652	break;;
1653    * )
1654	break;;
1655  esac
1656done
1657else
1658  echo "$as_me: failed program was:" >&5
1659sed 's/^/| /' conftest.$ac_ext >&5
1660
1661{ { echo "$as_me:$LINENO: error: C compiler cannot create executables
1662See \`config.log' for more details." >&5
1663echo "$as_me: error: C compiler cannot create executables
1664See \`config.log' for more details." >&2;}
1665   { (exit 77); exit 77; }; }
1666fi
1667
1668ac_exeext=$ac_cv_exeext
1669echo "$as_me:$LINENO: result: $ac_file" >&5
1670echo "${ECHO_T}$ac_file" >&6
1671
1672# Check the compiler produces executables we can run.  If not, either
1673# the compiler is broken, or we cross compile.
1674echo "$as_me:$LINENO: checking whether the C compiler works" >&5
1675echo $ECHO_N "checking whether the C compiler works... $ECHO_C" >&6
1676# FIXME: These cross compiler hacks should be removed for Autoconf 3.0
1677# If not cross compiling, check that we can run a simple program.
1678if test "$cross_compiling" != yes; then
1679  if { ac_try='./$ac_file'
1680  { (eval echo "$as_me:$LINENO: \"$ac_try\"") >&5
1681  (eval $ac_try) 2>&5
1682  ac_status=$?
1683  echo "$as_me:$LINENO: \$? = $ac_status" >&5
1684  (exit $ac_status); }; }; then
1685    cross_compiling=no
1686  else
1687    if test "$cross_compiling" = maybe; then
1688	cross_compiling=yes
1689    else
1690	{ { echo "$as_me:$LINENO: error: cannot run C compiled programs.
1691If you meant to cross compile, use \`--host'.
1692See \`config.log' for more details." >&5
1693echo "$as_me: error: cannot run C compiled programs.
1694If you meant to cross compile, use \`--host'.
1695See \`config.log' for more details." >&2;}
1696   { (exit 1); exit 1; }; }
1697    fi
1698  fi
1699fi
1700echo "$as_me:$LINENO: result: yes" >&5
1701echo "${ECHO_T}yes" >&6
1702
1703rm -f a.out a.exe conftest$ac_cv_exeext b.out
1704ac_clean_files=$ac_clean_files_save
1705# Check the compiler produces executables we can run.  If not, either
1706# the compiler is broken, or we cross compile.
1707echo "$as_me:$LINENO: checking whether we are cross compiling" >&5
1708echo $ECHO_N "checking whether we are cross compiling... $ECHO_C" >&6
1709echo "$as_me:$LINENO: result: $cross_compiling" >&5
1710echo "${ECHO_T}$cross_compiling" >&6
1711
1712echo "$as_me:$LINENO: checking for suffix of executables" >&5
1713echo $ECHO_N "checking for suffix of executables... $ECHO_C" >&6
1714if { (eval echo "$as_me:$LINENO: \"$ac_link\"") >&5
1715  (eval $ac_link) 2>&5
1716  ac_status=$?
1717  echo "$as_me:$LINENO: \$? = $ac_status" >&5
1718  (exit $ac_status); }; then
1719  # If both `conftest.exe' and `conftest' are `present' (well, observable)
1720# catch `conftest.exe'.  For instance with Cygwin, `ls conftest' will
1721# work properly (i.e., refer to `conftest.exe'), while it won't with
1722# `rm'.
1723for ac_file in conftest.exe conftest conftest.*; do
1724  test -f "$ac_file" || continue
1725  case $ac_file in
1726    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg | *.o | *.obj ) ;;
1727    *.* ) ac_cv_exeext=`expr "$ac_file" : '[^.]*\(\..*\)'`
1728	  export ac_cv_exeext
1729	  break;;
1730    * ) break;;
1731  esac
1732done
1733else
1734  { { echo "$as_me:$LINENO: error: cannot compute suffix of executables: cannot compile and link
1735See \`config.log' for more details." >&5
1736echo "$as_me: error: cannot compute suffix of executables: cannot compile and link
1737See \`config.log' for more details." >&2;}
1738   { (exit 1); exit 1; }; }
1739fi
1740
1741rm -f conftest$ac_cv_exeext
1742echo "$as_me:$LINENO: result: $ac_cv_exeext" >&5
1743echo "${ECHO_T}$ac_cv_exeext" >&6
1744
1745rm -f conftest.$ac_ext
1746EXEEXT=$ac_cv_exeext
1747ac_exeext=$EXEEXT
1748echo "$as_me:$LINENO: checking for suffix of object files" >&5
1749echo $ECHO_N "checking for suffix of object files... $ECHO_C" >&6
1750if test "${ac_cv_objext+set}" = set; then
1751  echo $ECHO_N "(cached) $ECHO_C" >&6
1752else
1753  cat >conftest.$ac_ext <<_ACEOF
1754/* confdefs.h.  */
1755_ACEOF
1756cat confdefs.h >>conftest.$ac_ext
1757cat >>conftest.$ac_ext <<_ACEOF
1758/* end confdefs.h.  */
1759
1760int
1761main ()
1762{
1763
1764  ;
1765  return 0;
1766}
1767_ACEOF
1768rm -f conftest.o conftest.obj
1769if { (eval echo "$as_me:$LINENO: \"$ac_compile\"") >&5
1770  (eval $ac_compile) 2>&5
1771  ac_status=$?
1772  echo "$as_me:$LINENO: \$? = $ac_status" >&5
1773  (exit $ac_status); }; then
1774  for ac_file in `(ls conftest.o conftest.obj; ls conftest.*) 2>/dev/null`; do
1775  case $ac_file in
1776    *.$ac_ext | *.xcoff | *.tds | *.d | *.pdb | *.xSYM | *.bb | *.bbg ) ;;
1777    *) ac_cv_objext=`expr "$ac_file" : '.*\.\(.*\)'`
1778       break;;
1779  esac
1780done
1781else
1782  echo "$as_me: failed program was:" >&5
1783sed 's/^/| /' conftest.$ac_ext >&5
1784
1785{ { echo "$as_me:$LINENO: error: cannot compute suffix of object files: cannot compile
1786See \`config.log' for more details." >&5
1787echo "$as_me: error: cannot compute suffix of object files: cannot compile
1788See \`config.log' for more details." >&2;}
1789   { (exit 1); exit 1; }; }
1790fi
1791
1792rm -f conftest.$ac_cv_objext conftest.$ac_ext
1793fi
1794echo "$as_me:$LINENO: result: $ac_cv_objext" >&5
1795echo "${ECHO_T}$ac_cv_objext" >&6
1796OBJEXT=$ac_cv_objext
1797ac_objext=$OBJEXT
1798echo "$as_me:$LINENO: checking whether we are using the GNU C compiler" >&5
1799echo $ECHO_N "checking whether we are using the GNU C compiler... $ECHO_C" >&6
1800if test "${ac_cv_c_compiler_gnu+set}" = set; then
1801  echo $ECHO_N "(cached) $ECHO_C" >&6
1802else
1803  cat >conftest.$ac_ext <<_ACEOF
1804/* confdefs.h.  */
1805_ACEOF
1806cat confdefs.h >>conftest.$ac_ext
1807cat >>conftest.$ac_ext <<_ACEOF
1808/* end confdefs.h.  */
1809
1810int
1811main ()
1812{
1813#ifndef __GNUC__
1814       choke me
1815#endif
1816
1817  ;
1818  return 0;
1819}
1820_ACEOF
1821rm -f conftest.$ac_objext
1822if { (eval echo "$as_me:$LINENO: \"$ac_compile\"") >&5
1823  (eval $ac_compile) 2>conftest.er1
1824  ac_status=$?
1825  grep -v '^ *+' conftest.er1 >conftest.err
1826  rm -f conftest.er1
1827  cat conftest.err >&5
1828  echo "$as_me:$LINENO: \$? = $ac_status" >&5
1829  (exit $ac_status); } &&
1830	 { ac_try='test -z "$ac_c_werror_flag"
1831			 || test ! -s conftest.err'
1832  { (eval echo "$as_me:$LINENO: \"$ac_try\"") >&5
1833  (eval $ac_try) 2>&5
1834  ac_status=$?
1835  echo "$as_me:$LINENO: \$? = $ac_status" >&5
1836  (exit $ac_status); }; } &&
1837	 { ac_try='test -s conftest.$ac_objext'
1838  { (eval echo "$as_me:$LINENO: \"$ac_try\"") >&5
1839  (eval $ac_try) 2>&5
1840  ac_status=$?
1841  echo "$as_me:$LINENO: \$? = $ac_status" >&5
1842  (exit $ac_status); }; }; then
1843  ac_compiler_gnu=yes
1844else
1845  echo "$as_me: failed program was:" >&5
1846sed 's/^/| /' conftest.$ac_ext >&5
1847
1848ac_compiler_gnu=no
1849fi
1850rm -f conftest.err conftest.$ac_objext conftest.$ac_ext
1851ac_cv_c_compiler_gnu=$ac_compiler_gnu
1852
1853fi
1854echo "$as_me:$LINENO: result: $ac_cv_c_compiler_gnu" >&5
1855echo "${ECHO_T}$ac_cv_c_compiler_gnu" >&6
1856GCC=`test $ac_compiler_gnu = yes && echo yes`
1857ac_test_CFLAGS=${CFLAGS+set}
1858ac_save_CFLAGS=$CFLAGS
1859CFLAGS="-g"
1860echo "$as_me:$LINENO: checking whether $CC accepts -g" >&5
1861echo $ECHO_N "checking whether $CC accepts -g... $ECHO_C" >&6
1862if test "${ac_cv_prog_cc_g+set}" = set; then
1863  echo $ECHO_N "(cached) $ECHO_C" >&6
1864else
1865  cat >conftest.$ac_ext <<_ACEOF
1866/* confdefs.h.  */
1867_ACEOF
1868cat confdefs.h >>conftest.$ac_ext
1869cat >>conftest.$ac_ext <<_ACEOF
1870/* end confdefs.h.  */
1871
1872int
1873main ()
1874{
1875
1876  ;
1877  return 0;
1878}
1879_ACEOF
1880rm -f conftest.$ac_objext
1881if { (eval echo "$as_me:$LINENO: \"$ac_compile\"") >&5
1882  (eval $ac_compile) 2>conftest.er1
1883  ac_status=$?
1884  grep -v '^ *+' conftest.er1 >conftest.err
1885  rm -f conftest.er1
1886  cat conftest.err >&5
1887  echo "$as_me:$LINENO: \$? = $ac_status" >&5
1888  (exit $ac_status); } &&
1889	 { ac_try='test -z "$ac_c_werror_flag"
1890			 || test ! -s conftest.err'
1891  { (eval echo "$as_me:$LINENO: \"$ac_try\"") >&5
1892  (eval $ac_try) 2>&5
1893  ac_status=$?
1894  echo "$as_me:$LINENO: \$? = $ac_status" >&5
1895  (exit $ac_status); }; } &&
1896	 { ac_try='test -s conftest.$ac_objext'
1897  { (eval echo "$as_me:$LINENO: \"$ac_try\"") >&5
1898  (eval $ac_try) 2>&5
1899  ac_status=$?
1900  echo "$as_me:$LINENO: \$? = $ac_status" >&5
1901  (exit $ac_status); }; }; then
1902  ac_cv_prog_cc_g=yes
1903else
1904  echo "$as_me: failed program was:" >&5
1905sed 's/^/| /' conftest.$ac_ext >&5
1906
1907ac_cv_prog_cc_g=no
1908fi
1909rm -f conftest.err conftest.$ac_objext conftest.$ac_ext
1910fi
1911echo "$as_me:$LINENO: result: $ac_cv_prog_cc_g" >&5
1912echo "${ECHO_T}$ac_cv_prog_cc_g" >&6
1913if test "$ac_test_CFLAGS" = set; then
1914  CFLAGS=$ac_save_CFLAGS
1915elif test $ac_cv_prog_cc_g = yes; then
1916  if test "$GCC" = yes; then
1917    CFLAGS="-g -O2"
1918  else
1919    CFLAGS="-g"
1920  fi
1921else
1922  if test "$GCC" = yes; then
1923    CFLAGS="-O2"
1924  else
1925    CFLAGS=
1926  fi
1927fi
1928echo "$as_me:$LINENO: checking for $CC option to accept ANSI C" >&5
1929echo $ECHO_N "checking for $CC option to accept ANSI C... $ECHO_C" >&6
1930if test "${ac_cv_prog_cc_stdc+set}" = set; then
1931  echo $ECHO_N "(cached) $ECHO_C" >&6
1932else
1933  ac_cv_prog_cc_stdc=no
1934ac_save_CC=$CC
1935cat >conftest.$ac_ext <<_ACEOF
1936/* confdefs.h.  */
1937_ACEOF
1938cat confdefs.h >>conftest.$ac_ext
1939cat >>conftest.$ac_ext <<_ACEOF
1940/* end confdefs.h.  */
1941#include <stdarg.h>
1942#include <stdio.h>
1943#include <sys/types.h>
1944#include <sys/stat.h>
1945/* Most of the following tests are stolen from RCS 5.7's src/conf.sh.  */
1946struct buf { int x; };
1947FILE * (*rcsopen) (struct buf *, struct stat *, int);
1948static char *e (p, i)
1949     char **p;
1950     int i;
1951{
1952  return p[i];
1953}
1954static char *f (char * (*g) (char **, int), char **p, ...)
1955{
1956  char *s;
1957  va_list v;
1958  va_start (v,p);
1959  s = g (p, va_arg (v,int));
1960  va_end (v);
1961  return s;
1962}
1963
1964/* OSF 4.0 Compaq cc is some sort of almost-ANSI by default.  It has
1965   function prototypes and stuff, but not '\xHH' hex character constants.
1966   These don't provoke an error unfortunately, instead are silently treated
1967   as 'x'.  The following induces an error, until -std1 is added to get
1968   proper ANSI mode.  Curiously '\x00'!='x' always comes out true, for an
1969   array size at least.  It's necessary to write '\x00'==0 to get something
1970   that's true only with -std1.  */
1971int osf4_cc_array ['\x00' == 0 ? 1 : -1];
1972
1973int test (int i, double x);
1974struct s1 {int (*f) (int a);};
1975struct s2 {int (*f) (double a);};
1976int pairnames (int, char **, FILE *(*)(struct buf *, struct stat *, int), int, int);
1977int argc;
1978char **argv;
1979int
1980main ()
1981{
1982return f (e, argv, 0) != argv[0]  ||  f (e, argv, 1) != argv[1];
1983  ;
1984  return 0;
1985}
1986_ACEOF
1987# Don't try gcc -ansi; that turns off useful extensions and
1988# breaks some systems' header files.
1989# AIX			-qlanglvl=ansi
1990# Ultrix and OSF/1	-std1
1991# HP-UX 10.20 and later	-Ae
1992# HP-UX older versions	-Aa -D_HPUX_SOURCE
1993# SVR4			-Xc -D__EXTENSIONS__
1994for ac_arg in "" -qlanglvl=ansi -std1 -Ae "-Aa -D_HPUX_SOURCE" "-Xc -D__EXTENSIONS__"
1995do
1996  CC="$ac_save_CC $ac_arg"
1997  rm -f conftest.$ac_objext
1998if { (eval echo "$as_me:$LINENO: \"$ac_compile\"") >&5
1999  (eval $ac_compile) 2>conftest.er1
2000  ac_status=$?
2001  grep -v '^ *+' conftest.er1 >conftest.err
2002  rm -f conftest.er1
2003  cat conftest.err >&5
2004  echo "$as_me:$LINENO: \$? = $ac_status" >&5
2005  (exit $ac_status); } &&
2006	 { ac_try='test -z "$ac_c_werror_flag"
2007			 || test ! -s conftest.err'
2008  { (eval echo "$as_me:$LINENO: \"$ac_try\"") >&5
2009  (eval $ac_try) 2>&5
2010  ac_status=$?
2011  echo "$as_me:$LINENO: \$? = $ac_status" >&5
2012  (exit $ac_status); }; } &&
2013	 { ac_try='test -s conftest.$ac_objext'
2014  { (eval echo "$as_me:$LINENO: \"$ac_try\"") >&5
2015  (eval $ac_try) 2>&5
2016  ac_status=$?
2017  echo "$as_me:$LINENO: \$? = $ac_status" >&5
2018  (exit $ac_status); }; }; then
2019  ac_cv_prog_cc_stdc=$ac_arg
2020break
2021else
2022  echo "$as_me: failed program was:" >&5
2023sed 's/^/| /' conftest.$ac_ext >&5
2024
2025fi
2026rm -f conftest.err conftest.$ac_objext
2027done
2028rm -f conftest.$ac_ext conftest.$ac_objext
2029CC=$ac_save_CC
2030
2031fi
2032
2033case "x$ac_cv_prog_cc_stdc" in
2034  x|xno)
2035    echo "$as_me:$LINENO: result: none needed" >&5
2036echo "${ECHO_T}none needed" >&6 ;;
2037  *)
2038    echo "$as_me:$LINENO: result: $ac_cv_prog_cc_stdc" >&5
2039echo "${ECHO_T}$ac_cv_prog_cc_stdc" >&6
2040    CC="$CC $ac_cv_prog_cc_stdc" ;;
2041esac
2042
2043# Some people use a C++ compiler to compile C.  Since we use `exit',
2044# in C++ we need to declare it.  In case someone uses the same compiler
2045# for both compiling C and C++ we need to have the C++ compiler decide
2046# the declaration of exit, since it's the most demanding environment.
2047cat >conftest.$ac_ext <<_ACEOF
2048#ifndef __cplusplus
2049  choke me
2050#endif
2051_ACEOF
2052rm -f conftest.$ac_objext
2053if { (eval echo "$as_me:$LINENO: \"$ac_compile\"") >&5
2054  (eval $ac_compile) 2>conftest.er1
2055  ac_status=$?
2056  grep -v '^ *+' conftest.er1 >conftest.err
2057  rm -f conftest.er1
2058  cat conftest.err >&5
2059  echo "$as_me:$LINENO: \$? = $ac_status" >&5
2060  (exit $ac_status); } &&
2061	 { ac_try='test -z "$ac_c_werror_flag"
2062			 || test ! -s conftest.err'
2063  { (eval echo "$as_me:$LINENO: \"$ac_try\"") >&5
2064  (eval $ac_try) 2>&5
2065  ac_status=$?
2066  echo "$as_me:$LINENO: \$? = $ac_status" >&5
2067  (exit $ac_status); }; } &&
2068	 { ac_try='test -s conftest.$ac_objext'
2069  { (eval echo "$as_me:$LINENO: \"$ac_try\"") >&5
2070  (eval $ac_try) 2>&5
2071  ac_status=$?
2072  echo "$as_me:$LINENO: \$? = $ac_status" >&5
2073  (exit $ac_status); }; }; then
2074  for ac_declaration in \
2075   '' \
2076   'extern "C" void std::exit (int) throw (); using std::exit;' \
2077   'extern "C" void std::exit (int); using std::exit;' \
2078   'extern "C" void exit (int) throw ();' \
2079   'extern "C" void exit (int);' \
2080   'void exit (int);'
2081do
2082  cat >conftest.$ac_ext <<_ACEOF
2083/* confdefs.h.  */
2084_ACEOF
2085cat confdefs.h >>conftest.$ac_ext
2086cat >>conftest.$ac_ext <<_ACEOF
2087/* end confdefs.h.  */
2088$ac_declaration
2089#include <stdlib.h>
2090int
2091main ()
2092{
2093exit (42);
2094  ;
2095  return 0;
2096}
2097_ACEOF
2098rm -f conftest.$ac_objext
2099if { (eval echo "$as_me:$LINENO: \"$ac_compile\"") >&5
2100  (eval $ac_compile) 2>conftest.er1
2101  ac_status=$?
2102  grep -v '^ *+' conftest.er1 >conftest.err
2103  rm -f conftest.er1
2104  cat conftest.err >&5
2105  echo "$as_me:$LINENO: \$? = $ac_status" >&5
2106  (exit $ac_status); } &&
2107	 { ac_try='test -z "$ac_c_werror_flag"
2108			 || test ! -s conftest.err'
2109  { (eval echo "$as_me:$LINENO: \"$ac_try\"") >&5
2110  (eval $ac_try) 2>&5
2111  ac_status=$?
2112  echo "$as_me:$LINENO: \$? = $ac_status" >&5
2113  (exit $ac_status); }; } &&
2114	 { ac_try='test -s conftest.$ac_objext'
2115  { (eval echo "$as_me:$LINENO: \"$ac_try\"") >&5
2116  (eval $ac_try) 2>&5
2117  ac_status=$?
2118  echo "$as_me:$LINENO: \$? = $ac_status" >&5
2119  (exit $ac_status); }; }; then
2120  :
2121else
2122  echo "$as_me: failed program was:" >&5
2123sed 's/^/| /' conftest.$ac_ext >&5
2124
2125continue
2126fi
2127rm -f conftest.err conftest.$ac_objext conftest.$ac_ext
2128  cat >conftest.$ac_ext <<_ACEOF
2129/* confdefs.h.  */
2130_ACEOF
2131cat confdefs.h >>conftest.$ac_ext
2132cat >>conftest.$ac_ext <<_ACEOF
2133/* end confdefs.h.  */
2134$ac_declaration
2135int
2136main ()
2137{
2138exit (42);
2139  ;
2140  return 0;
2141}
2142_ACEOF
2143rm -f conftest.$ac_objext
2144if { (eval echo "$as_me:$LINENO: \"$ac_compile\"") >&5
2145  (eval $ac_compile) 2>conftest.er1
2146  ac_status=$?
2147  grep -v '^ *+' conftest.er1 >conftest.err
2148  rm -f conftest.er1
2149  cat conftest.err >&5
2150  echo "$as_me:$LINENO: \$? = $ac_status" >&5
2151  (exit $ac_status); } &&
2152	 { ac_try='test -z "$ac_c_werror_flag"
2153			 || test ! -s conftest.err'
2154  { (eval echo "$as_me:$LINENO: \"$ac_try\"") >&5
2155  (eval $ac_try) 2>&5
2156  ac_status=$?
2157  echo "$as_me:$LINENO: \$? = $ac_status" >&5
2158  (exit $ac_status); }; } &&
2159	 { ac_try='test -s conftest.$ac_objext'
2160  { (eval echo "$as_me:$LINENO: \"$ac_try\"") >&5
2161  (eval $ac_try) 2>&5
2162  ac_status=$?
2163  echo "$as_me:$LINENO: \$? = $ac_status" >&5
2164  (exit $ac_status); }; }; then
2165  break
2166else
2167  echo "$as_me: failed program was:" >&5
2168sed 's/^/| /' conftest.$ac_ext >&5
2169
2170fi
2171rm -f conftest.err conftest.$ac_objext conftest.$ac_ext
2172done
2173rm -f conftest*
2174if test -n "$ac_declaration"; then
2175  echo '#ifdef __cplusplus' >>confdefs.h
2176  echo $ac_declaration      >>confdefs.h
2177  echo '#endif'             >>confdefs.h
2178fi
2179
2180else
2181  echo "$as_me: failed program was:" >&5
2182sed 's/^/| /' conftest.$ac_ext >&5
2183
2184fi
2185rm -f conftest.err conftest.$ac_objext conftest.$ac_ext
2186ac_ext=c
2187ac_cpp='$CPP $CPPFLAGS'
2188ac_compile='$CC -c $CFLAGS $CPPFLAGS conftest.$ac_ext >&5'
2189ac_link='$CC -o conftest$ac_exeext $CFLAGS $CPPFLAGS $LDFLAGS conftest.$ac_ext $LIBS >&5'
2190ac_compiler_gnu=$ac_cv_c_compiler_gnu
2191
2192
2193for ac_prog in ar
2194do
2195  # Extract the first word of "$ac_prog", so it can be a program name with args.
2196set dummy $ac_prog; ac_word=$2
2197echo "$as_me:$LINENO: checking for $ac_word" >&5
2198echo $ECHO_N "checking for $ac_word... $ECHO_C" >&6
2199if test "${ac_cv_prog_AR+set}" = set; then
2200  echo $ECHO_N "(cached) $ECHO_C" >&6
2201else
2202  if test -n "$AR"; then
2203  ac_cv_prog_AR="$AR" # Let the user override the test.
2204else
2205as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2206for as_dir in $PATH
2207do
2208  IFS=$as_save_IFS
2209  test -z "$as_dir" && as_dir=.
2210  for ac_exec_ext in '' $ac_executable_extensions; do
2211  if $as_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
2212    ac_cv_prog_AR="$ac_prog"
2213    echo "$as_me:$LINENO: found $as_dir/$ac_word$ac_exec_ext" >&5
2214    break 2
2215  fi
2216done
2217done
2218
2219fi
2220fi
2221AR=$ac_cv_prog_AR
2222if test -n "$AR"; then
2223  echo "$as_me:$LINENO: result: $AR" >&5
2224echo "${ECHO_T}$AR" >&6
2225else
2226  echo "$as_me:$LINENO: result: no" >&5
2227echo "${ECHO_T}no" >&6
2228fi
2229
2230  test -n "$AR" && break
2231done
2232
2233for ac_prog in chmod
2234do
2235  # Extract the first word of "$ac_prog", so it can be a program name with args.
2236set dummy $ac_prog; ac_word=$2
2237echo "$as_me:$LINENO: checking for $ac_word" >&5
2238echo $ECHO_N "checking for $ac_word... $ECHO_C" >&6
2239if test "${ac_cv_prog_CHMOD+set}" = set; then
2240  echo $ECHO_N "(cached) $ECHO_C" >&6
2241else
2242  if test -n "$CHMOD"; then
2243  ac_cv_prog_CHMOD="$CHMOD" # Let the user override the test.
2244else
2245as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2246for as_dir in $PATH
2247do
2248  IFS=$as_save_IFS
2249  test -z "$as_dir" && as_dir=.
2250  for ac_exec_ext in '' $ac_executable_extensions; do
2251  if $as_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
2252    ac_cv_prog_CHMOD="$ac_prog"
2253    echo "$as_me:$LINENO: found $as_dir/$ac_word$ac_exec_ext" >&5
2254    break 2
2255  fi
2256done
2257done
2258
2259fi
2260fi
2261CHMOD=$ac_cv_prog_CHMOD
2262if test -n "$CHMOD"; then
2263  echo "$as_me:$LINENO: result: $CHMOD" >&5
2264echo "${ECHO_T}$CHMOD" >&6
2265else
2266  echo "$as_me:$LINENO: result: no" >&5
2267echo "${ECHO_T}no" >&6
2268fi
2269
2270  test -n "$CHMOD" && break
2271done
2272
2273for ac_prog in cp
2274do
2275  # Extract the first word of "$ac_prog", so it can be a program name with args.
2276set dummy $ac_prog; ac_word=$2
2277echo "$as_me:$LINENO: checking for $ac_word" >&5
2278echo $ECHO_N "checking for $ac_word... $ECHO_C" >&6
2279if test "${ac_cv_prog_CP+set}" = set; then
2280  echo $ECHO_N "(cached) $ECHO_C" >&6
2281else
2282  if test -n "$CP"; then
2283  ac_cv_prog_CP="$CP" # Let the user override the test.
2284else
2285as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2286for as_dir in $PATH
2287do
2288  IFS=$as_save_IFS
2289  test -z "$as_dir" && as_dir=.
2290  for ac_exec_ext in '' $ac_executable_extensions; do
2291  if $as_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
2292    ac_cv_prog_CP="$ac_prog"
2293    echo "$as_me:$LINENO: found $as_dir/$ac_word$ac_exec_ext" >&5
2294    break 2
2295  fi
2296done
2297done
2298
2299fi
2300fi
2301CP=$ac_cv_prog_CP
2302if test -n "$CP"; then
2303  echo "$as_me:$LINENO: result: $CP" >&5
2304echo "${ECHO_T}$CP" >&6
2305else
2306  echo "$as_me:$LINENO: result: no" >&5
2307echo "${ECHO_T}no" >&6
2308fi
2309
2310  test -n "$CP" && break
2311done
2312
2313for ac_prog in ranlib echo
2314do
2315  # Extract the first word of "$ac_prog", so it can be a program name with args.
2316set dummy $ac_prog; ac_word=$2
2317echo "$as_me:$LINENO: checking for $ac_word" >&5
2318echo $ECHO_N "checking for $ac_word... $ECHO_C" >&6
2319if test "${ac_cv_prog_RANLIB+set}" = set; then
2320  echo $ECHO_N "(cached) $ECHO_C" >&6
2321else
2322  if test -n "$RANLIB"; then
2323  ac_cv_prog_RANLIB="$RANLIB" # Let the user override the test.
2324else
2325as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2326for as_dir in $PATH
2327do
2328  IFS=$as_save_IFS
2329  test -z "$as_dir" && as_dir=.
2330  for ac_exec_ext in '' $ac_executable_extensions; do
2331  if $as_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
2332    ac_cv_prog_RANLIB="$ac_prog"
2333    echo "$as_me:$LINENO: found $as_dir/$ac_word$ac_exec_ext" >&5
2334    break 2
2335  fi
2336done
2337done
2338
2339fi
2340fi
2341RANLIB=$ac_cv_prog_RANLIB
2342if test -n "$RANLIB"; then
2343  echo "$as_me:$LINENO: result: $RANLIB" >&5
2344echo "${ECHO_T}$RANLIB" >&6
2345else
2346  echo "$as_me:$LINENO: result: no" >&5
2347echo "${ECHO_T}no" >&6
2348fi
2349
2350  test -n "$RANLIB" && break
2351done
2352
2353for ac_prog in /bin/rm rm
2354do
2355  # Extract the first word of "$ac_prog", so it can be a program name with args.
2356set dummy $ac_prog; ac_word=$2
2357echo "$as_me:$LINENO: checking for $ac_word" >&5
2358echo $ECHO_N "checking for $ac_word... $ECHO_C" >&6
2359if test "${ac_cv_path_RM+set}" = set; then
2360  echo $ECHO_N "(cached) $ECHO_C" >&6
2361else
2362  case $RM in
2363  [\\/]* | ?:[\\/]*)
2364  ac_cv_path_RM="$RM" # Let the user override the test with a path.
2365  ;;
2366  *)
2367  as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2368for as_dir in $PATH
2369do
2370  IFS=$as_save_IFS
2371  test -z "$as_dir" && as_dir=.
2372  for ac_exec_ext in '' $ac_executable_extensions; do
2373  if $as_executable_p "$as_dir/$ac_word$ac_exec_ext"; then
2374    ac_cv_path_RM="$as_dir/$ac_word$ac_exec_ext"
2375    echo "$as_me:$LINENO: found $as_dir/$ac_word$ac_exec_ext" >&5
2376    break 2
2377  fi
2378done
2379done
2380
2381  ;;
2382esac
2383fi
2384RM=$ac_cv_path_RM
2385
2386if test -n "$RM"; then
2387  echo "$as_me:$LINENO: result: $RM" >&5
2388echo "${ECHO_T}$RM" >&6
2389else
2390  echo "$as_me:$LINENO: result: no" >&5
2391echo "${ECHO_T}no" >&6
2392fi
2393
2394  test -n "$RM" && break
2395done
2396
2397
2398          ac_config_files="$ac_config_files Makefile"
2399cat >confcache <<\_ACEOF
2400# This file is a shell script that caches the results of configure
2401# tests run on this system so they can be shared between configure
2402# scripts and configure runs, see configure's option --config-cache.
2403# It is not useful on other systems.  If it contains results you don't
2404# want to keep, you may remove or edit it.
2405#
2406# config.status only pays attention to the cache file if you give it
2407# the --recheck option to rerun configure.
2408#
2409# `ac_cv_env_foo' variables (set or unset) will be overridden when
2410# loading this file, other *unset* `ac_cv_foo' will be assigned the
2411# following values.
2412
2413_ACEOF
2414
2415# The following way of writing the cache mishandles newlines in values,
2416# but we know of no workaround that is simple, portable, and efficient.
2417# So, don't put newlines in cache variables' values.
2418# Ultrix sh set writes to stderr and can't be redirected directly,
2419# and sets the high bit in the cache file unless we assign to the vars.
2420{
2421  (set) 2>&1 |
2422    case `(ac_space=' '; set | grep ac_space) 2>&1` in
2423    *ac_space=\ *)
2424      # `set' does not quote correctly, so add quotes (double-quote
2425      # substitution turns \\\\ into \\, and sed turns \\ into \).
2426      sed -n \
2427	"s/'/'\\\\''/g;
2428	  s/^\\([_$as_cr_alnum]*_cv_[_$as_cr_alnum]*\\)=\\(.*\\)/\\1='\\2'/p"
2429      ;;
2430    *)
2431      # `set' quotes correctly as required by POSIX, so do not add quotes.
2432      sed -n \
2433	"s/^\\([_$as_cr_alnum]*_cv_[_$as_cr_alnum]*\\)=\\(.*\\)/\\1=\\2/p"
2434      ;;
2435    esac;
2436} |
2437  sed '
2438     t clear
2439     : clear
2440     s/^\([^=]*\)=\(.*[{}].*\)$/test "${\1+set}" = set || &/
2441     t end
2442     /^ac_cv_env/!s/^\([^=]*\)=\(.*\)$/\1=${\1=\2}/
2443     : end' >>confcache
2444if diff $cache_file confcache >/dev/null 2>&1; then :; else
2445  if test -w $cache_file; then
2446    test "x$cache_file" != "x/dev/null" && echo "updating cache $cache_file"
2447    cat confcache >$cache_file
2448  else
2449    echo "not updating unwritable cache $cache_file"
2450  fi
2451fi
2452rm -f confcache
2453
2454test "x$prefix" = xNONE && prefix=$ac_default_prefix
2455# Let make expand exec_prefix.
2456test "x$exec_prefix" = xNONE && exec_prefix='${prefix}'
2457
2458# VPATH may cause trouble with some makes, so we remove $(srcdir),
2459# ${srcdir} and @srcdir@ from VPATH if srcdir is ".", strip leading and
2460# trailing colons and then remove the whole line if VPATH becomes empty
2461# (actually we leave an empty line to preserve line numbers).
2462if test "x$srcdir" = x.; then
2463  ac_vpsub='/^[	 ]*VPATH[	 ]*=/{
2464s/:*\$(srcdir):*/:/;
2465s/:*\${srcdir}:*/:/;
2466s/:*@srcdir@:*/:/;
2467s/^\([^=]*=[	 ]*\):*/\1/;
2468s/:*$//;
2469s/^[^=]*=[	 ]*$//;
2470}'
2471fi
2472
2473# Transform confdefs.h into DEFS.
2474# Protect against shell expansion while executing Makefile rules.
2475# Protect against Makefile macro expansion.
2476#
2477# If the first sed substitution is executed (which looks for macros that
2478# take arguments), then we branch to the quote section.  Otherwise,
2479# look for a macro that doesn't take arguments.
2480cat >confdef2opt.sed <<\_ACEOF
2481t clear
2482: clear
2483s,^[	 ]*#[	 ]*define[	 ][	 ]*\([^	 (][^	 (]*([^)]*)\)[	 ]*\(.*\),-D\1=\2,g
2484t quote
2485s,^[	 ]*#[	 ]*define[	 ][	 ]*\([^	 ][^	 ]*\)[	 ]*\(.*\),-D\1=\2,g
2486t quote
2487d
2488: quote
2489s,[	 `~#$^&*(){}\\|;'"<>?],\\&,g
2490s,\[,\\&,g
2491s,\],\\&,g
2492s,\$,$$,g
2493p
2494_ACEOF
2495# We use echo to avoid assuming a particular line-breaking character.
2496# The extra dot is to prevent the shell from consuming trailing
2497# line-breaks from the sub-command output.  A line-break within
2498# single-quotes doesn't work because, if this script is created in a
2499# platform that uses two characters for line-breaks (e.g., DOS), tr
2500# would break.
2501ac_LF_and_DOT=`echo; echo .`
2502DEFS=`sed -n -f confdef2opt.sed confdefs.h | tr "$ac_LF_and_DOT" ' .'`
2503rm -f confdef2opt.sed
2504
2505
2506ac_libobjs=
2507ac_ltlibobjs=
2508for ac_i in : $LIBOBJS; do test "x$ac_i" = x: && continue
2509  # 1. Remove the extension, and $U if already installed.
2510  ac_i=`echo "$ac_i" |
2511	 sed 's/\$U\././;s/\.o$//;s/\.obj$//'`
2512  # 2. Add them.
2513  ac_libobjs="$ac_libobjs $ac_i\$U.$ac_objext"
2514  ac_ltlibobjs="$ac_ltlibobjs $ac_i"'$U.lo'
2515done
2516LIBOBJS=$ac_libobjs
2517
2518LTLIBOBJS=$ac_ltlibobjs
2519
2520
2521
2522: ${CONFIG_STATUS=./config.status}
2523ac_clean_files_save=$ac_clean_files
2524ac_clean_files="$ac_clean_files $CONFIG_STATUS"
2525{ echo "$as_me:$LINENO: creating $CONFIG_STATUS" >&5
2526echo "$as_me: creating $CONFIG_STATUS" >&6;}
2527cat >$CONFIG_STATUS <<_ACEOF
2528#! $SHELL
2529# Generated by $as_me.
2530# Run this file to recreate the current configuration.
2531# Compiler output produced by configure, useful for debugging
2532# configure, is in config.log if it exists.
2533
2534debug=false
2535ac_cs_recheck=false
2536ac_cs_silent=false
2537SHELL=\${CONFIG_SHELL-$SHELL}
2538_ACEOF
2539
2540cat >>$CONFIG_STATUS <<\_ACEOF
2541## --------------------- ##
2542## M4sh Initialization.  ##
2543## --------------------- ##
2544
2545# Be Bourne compatible
2546if test -n "${ZSH_VERSION+set}" && (emulate sh) >/dev/null 2>&1; then
2547  emulate sh
2548  NULLCMD=:
2549  # Zsh 3.x and 4.x performs word splitting on ${1+"$@"}, which
2550  # is contrary to our usage.  Disable this feature.
2551  alias -g '${1+"$@"}'='"$@"'
2552elif test -n "${BASH_VERSION+set}" && (set -o posix) >/dev/null 2>&1; then
2553  set -o posix
2554fi
2555DUALCASE=1; export DUALCASE # for MKS sh
2556
2557# Support unset when possible.
2558if ( (MAIL=60; unset MAIL) || exit) >/dev/null 2>&1; then
2559  as_unset=unset
2560else
2561  as_unset=false
2562fi
2563
2564
2565# Work around bugs in pre-3.0 UWIN ksh.
2566$as_unset ENV MAIL MAILPATH
2567PS1='$ '
2568PS2='> '
2569PS4='+ '
2570
2571# NLS nuisances.
2572for as_var in \
2573  LANG LANGUAGE LC_ADDRESS LC_ALL LC_COLLATE LC_CTYPE LC_IDENTIFICATION \
2574  LC_MEASUREMENT LC_MESSAGES LC_MONETARY LC_NAME LC_NUMERIC LC_PAPER \
2575  LC_TELEPHONE LC_TIME
2576do
2577  if (set +x; test -z "`(eval $as_var=C; export $as_var) 2>&1`"); then
2578    eval $as_var=C; export $as_var
2579  else
2580    $as_unset $as_var
2581  fi
2582done
2583
2584# Required to use basename.
2585if expr a : '\(a\)' >/dev/null 2>&1; then
2586  as_expr=expr
2587else
2588  as_expr=false
2589fi
2590
2591if (basename /) >/dev/null 2>&1 && test "X`basename / 2>&1`" = "X/"; then
2592  as_basename=basename
2593else
2594  as_basename=false
2595fi
2596
2597
2598# Name of the executable.
2599as_me=`$as_basename "$0" ||
2600$as_expr X/"$0" : '.*/\([^/][^/]*\)/*$' \| \
2601	 X"$0" : 'X\(//\)$' \| \
2602	 X"$0" : 'X\(/\)$' \| \
2603	 .     : '\(.\)' 2>/dev/null ||
2604echo X/"$0" |
2605    sed '/^.*\/\([^/][^/]*\)\/*$/{ s//\1/; q; }
2606  	  /^X\/\(\/\/\)$/{ s//\1/; q; }
2607  	  /^X\/\(\/\).*/{ s//\1/; q; }
2608  	  s/.*/./; q'`
2609
2610
2611# PATH needs CR, and LINENO needs CR and PATH.
2612# Avoid depending upon Character Ranges.
2613as_cr_letters='abcdefghijklmnopqrstuvwxyz'
2614as_cr_LETTERS='ABCDEFGHIJKLMNOPQRSTUVWXYZ'
2615as_cr_Letters=$as_cr_letters$as_cr_LETTERS
2616as_cr_digits='0123456789'
2617as_cr_alnum=$as_cr_Letters$as_cr_digits
2618
2619# The user is always right.
2620if test "${PATH_SEPARATOR+set}" != set; then
2621  echo "#! /bin/sh" >conf$$.sh
2622  echo  "exit 0"   >>conf$$.sh
2623  chmod +x conf$$.sh
2624  if (PATH="/nonexistent;."; conf$$.sh) >/dev/null 2>&1; then
2625    PATH_SEPARATOR=';'
2626  else
2627    PATH_SEPARATOR=:
2628  fi
2629  rm -f conf$$.sh
2630fi
2631
2632
2633  as_lineno_1=$LINENO
2634  as_lineno_2=$LINENO
2635  as_lineno_3=`(expr $as_lineno_1 + 1) 2>/dev/null`
2636  test "x$as_lineno_1" != "x$as_lineno_2" &&
2637  test "x$as_lineno_3"  = "x$as_lineno_2"  || {
2638  # Find who we are.  Look in the path if we contain no path at all
2639  # relative or not.
2640  case $0 in
2641    *[\\/]* ) as_myself=$0 ;;
2642    *) as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2643for as_dir in $PATH
2644do
2645  IFS=$as_save_IFS
2646  test -z "$as_dir" && as_dir=.
2647  test -r "$as_dir/$0" && as_myself=$as_dir/$0 && break
2648done
2649
2650       ;;
2651  esac
2652  # We did not find ourselves, most probably we were run as `sh COMMAND'
2653  # in which case we are not to be found in the path.
2654  if test "x$as_myself" = x; then
2655    as_myself=$0
2656  fi
2657  if test ! -f "$as_myself"; then
2658    { { echo "$as_me:$LINENO: error: cannot find myself; rerun with an absolute path" >&5
2659echo "$as_me: error: cannot find myself; rerun with an absolute path" >&2;}
2660   { (exit 1); exit 1; }; }
2661  fi
2662  case $CONFIG_SHELL in
2663  '')
2664    as_save_IFS=$IFS; IFS=$PATH_SEPARATOR
2665for as_dir in /bin$PATH_SEPARATOR/usr/bin$PATH_SEPARATOR$PATH
2666do
2667  IFS=$as_save_IFS
2668  test -z "$as_dir" && as_dir=.
2669  for as_base in sh bash ksh sh5; do
2670	 case $as_dir in
2671	 /*)
2672	   if ("$as_dir/$as_base" -c '
2673  as_lineno_1=$LINENO
2674  as_lineno_2=$LINENO
2675  as_lineno_3=`(expr $as_lineno_1 + 1) 2>/dev/null`
2676  test "x$as_lineno_1" != "x$as_lineno_2" &&
2677  test "x$as_lineno_3"  = "x$as_lineno_2" ') 2>/dev/null; then
2678	     $as_unset BASH_ENV || test "${BASH_ENV+set}" != set || { BASH_ENV=; export BASH_ENV; }
2679	     $as_unset ENV || test "${ENV+set}" != set || { ENV=; export ENV; }
2680	     CONFIG_SHELL=$as_dir/$as_base
2681	     export CONFIG_SHELL
2682	     exec "$CONFIG_SHELL" "$0" ${1+"$@"}
2683	   fi;;
2684	 esac
2685       done
2686done
2687;;
2688  esac
2689
2690  # Create $as_me.lineno as a copy of $as_myself, but with $LINENO
2691  # uniformly replaced by the line number.  The first 'sed' inserts a
2692  # line-number line before each line; the second 'sed' does the real
2693  # work.  The second script uses 'N' to pair each line-number line
2694  # with the numbered line, and appends trailing '-' during
2695  # substitution so that $LINENO is not a special case at line end.
2696  # (Raja R Harinath suggested sed '=', and Paul Eggert wrote the
2697  # second 'sed' script.  Blame Lee E. McMahon for sed's syntax.  :-)
2698  sed '=' <$as_myself |
2699    sed '
2700      N
2701      s,$,-,
2702      : loop
2703      s,^\(['$as_cr_digits']*\)\(.*\)[$]LINENO\([^'$as_cr_alnum'_]\),\1\2\1\3,
2704      t loop
2705      s,-$,,
2706      s,^['$as_cr_digits']*\n,,
2707    ' >$as_me.lineno &&
2708  chmod +x $as_me.lineno ||
2709    { { echo "$as_me:$LINENO: error: cannot create $as_me.lineno; rerun with a POSIX shell" >&5
2710echo "$as_me: error: cannot create $as_me.lineno; rerun with a POSIX shell" >&2;}
2711   { (exit 1); exit 1; }; }
2712
2713  # Don't try to exec as it changes $[0], causing all sort of problems
2714  # (the dirname of $[0] is not the place where we might find the
2715  # original and so on.  Autoconf is especially sensible to this).
2716  . ./$as_me.lineno
2717  # Exit status is that of the last command.
2718  exit
2719}
2720
2721
2722case `echo "testing\c"; echo 1,2,3`,`echo -n testing; echo 1,2,3` in
2723  *c*,-n*) ECHO_N= ECHO_C='
2724' ECHO_T='	' ;;
2725  *c*,*  ) ECHO_N=-n ECHO_C= ECHO_T= ;;
2726  *)       ECHO_N= ECHO_C='\c' ECHO_T= ;;
2727esac
2728
2729if expr a : '\(a\)' >/dev/null 2>&1; then
2730  as_expr=expr
2731else
2732  as_expr=false
2733fi
2734
2735rm -f conf$$ conf$$.exe conf$$.file
2736echo >conf$$.file
2737if ln -s conf$$.file conf$$ 2>/dev/null; then
2738  # We could just check for DJGPP; but this test a) works b) is more generic
2739  # and c) will remain valid once DJGPP supports symlinks (DJGPP 2.04).
2740  if test -f conf$$.exe; then
2741    # Don't use ln at all; we don't have any links
2742    as_ln_s='cp -p'
2743  else
2744    as_ln_s='ln -s'
2745  fi
2746elif ln conf$$.file conf$$ 2>/dev/null; then
2747  as_ln_s=ln
2748else
2749  as_ln_s='cp -p'
2750fi
2751rm -f conf$$ conf$$.exe conf$$.file
2752
2753if mkdir -p . 2>/dev/null; then
2754  as_mkdir_p=:
2755else
2756  test -d ./-p && rmdir ./-p
2757  as_mkdir_p=false
2758fi
2759
2760as_executable_p="test -f"
2761
2762# Sed expression to map a string onto a valid CPP name.
2763as_tr_cpp="eval sed 'y%*$as_cr_letters%P$as_cr_LETTERS%;s%[^_$as_cr_alnum]%_%g'"
2764
2765# Sed expression to map a string onto a valid variable name.
2766as_tr_sh="eval sed 'y%*+%pp%;s%[^_$as_cr_alnum]%_%g'"
2767
2768
2769# IFS
2770# We need space, tab and new line, in precisely that order.
2771as_nl='
2772'
2773IFS=" 	$as_nl"
2774
2775# CDPATH.
2776$as_unset CDPATH
2777
2778exec 6>&1
2779
2780# Open the log real soon, to keep \$[0] and so on meaningful, and to
2781# report actual input values of CONFIG_FILES etc. instead of their
2782# values after options handling.  Logging --version etc. is OK.
2783exec 5>>config.log
2784{
2785  echo
2786  sed 'h;s/./-/g;s/^.../## /;s/...$/ ##/;p;x;p;x' <<_ASBOX
2787## Running $as_me. ##
2788_ASBOX
2789} >&5
2790cat >&5 <<_CSEOF
2791
2792This file was extended by fdlibm $as_me 5.3, which was
2793generated by GNU Autoconf 2.59.  Invocation command line was
2794
2795  CONFIG_FILES    = $CONFIG_FILES
2796  CONFIG_HEADERS  = $CONFIG_HEADERS
2797  CONFIG_LINKS    = $CONFIG_LINKS
2798  CONFIG_COMMANDS = $CONFIG_COMMANDS
2799  $ $0 $@
2800
2801_CSEOF
2802echo "on `(hostname || uname -n) 2>/dev/null | sed 1q`" >&5
2803echo >&5
2804_ACEOF
2805
2806# Files that config.status was made for.
2807if test -n "$ac_config_files"; then
2808  echo "config_files=\"$ac_config_files\"" >>$CONFIG_STATUS
2809fi
2810
2811if test -n "$ac_config_headers"; then
2812  echo "config_headers=\"$ac_config_headers\"" >>$CONFIG_STATUS
2813fi
2814
2815if test -n "$ac_config_links"; then
2816  echo "config_links=\"$ac_config_links\"" >>$CONFIG_STATUS
2817fi
2818
2819if test -n "$ac_config_commands"; then
2820  echo "config_commands=\"$ac_config_commands\"" >>$CONFIG_STATUS
2821fi
2822
2823cat >>$CONFIG_STATUS <<\_ACEOF
2824
2825ac_cs_usage="\
2826\`$as_me' instantiates files from templates according to the
2827current configuration.
2828
2829Usage: $0 [OPTIONS] [FILE]...
2830
2831  -h, --help       print this help, then exit
2832  -V, --version    print version number, then exit
2833  -q, --quiet      do not print progress messages
2834  -d, --debug      don't remove temporary files
2835      --recheck    update $as_me by reconfiguring in the same conditions
2836  --file=FILE[:TEMPLATE]
2837		   instantiate the configuration file FILE
2838
2839Configuration files:
2840$config_files
2841
2842Report bugs to <bug-autoconf@gnu.org>."
2843_ACEOF
2844
2845cat >>$CONFIG_STATUS <<_ACEOF
2846ac_cs_version="\\
2847fdlibm config.status 5.3
2848configured by $0, generated by GNU Autoconf 2.59,
2849  with options \\"`echo "$ac_configure_args" | sed 's/[\\""\`\$]/\\\\&/g'`\\"
2850
2851Copyright (C) 2003 Free Software Foundation, Inc.
2852This config.status script is free software; the Free Software Foundation
2853gives unlimited permission to copy, distribute and modify it."
2854srcdir=$srcdir
2855_ACEOF
2856
2857cat >>$CONFIG_STATUS <<\_ACEOF
2858# If no file are specified by the user, then we need to provide default
2859# value.  By we need to know if files were specified by the user.
2860ac_need_defaults=:
2861while test $# != 0
2862do
2863  case $1 in
2864  --*=*)
2865    ac_option=`expr "x$1" : 'x\([^=]*\)='`
2866    ac_optarg=`expr "x$1" : 'x[^=]*=\(.*\)'`
2867    ac_shift=:
2868    ;;
2869  -*)
2870    ac_option=$1
2871    ac_optarg=$2
2872    ac_shift=shift
2873    ;;
2874  *) # This is not an option, so the user has probably given explicit
2875     # arguments.
2876     ac_option=$1
2877     ac_need_defaults=false;;
2878  esac
2879
2880  case $ac_option in
2881  # Handling of the options.
2882_ACEOF
2883cat >>$CONFIG_STATUS <<\_ACEOF
2884  -recheck | --recheck | --rechec | --reche | --rech | --rec | --re | --r)
2885    ac_cs_recheck=: ;;
2886  --version | --vers* | -V )
2887    echo "$ac_cs_version"; exit 0 ;;
2888  --he | --h)
2889    # Conflict between --help and --header
2890    { { echo "$as_me:$LINENO: error: ambiguous option: $1
2891Try \`$0 --help' for more information." >&5
2892echo "$as_me: error: ambiguous option: $1
2893Try \`$0 --help' for more information." >&2;}
2894   { (exit 1); exit 1; }; };;
2895  --help | --hel | -h )
2896    echo "$ac_cs_usage"; exit 0 ;;
2897  --debug | --d* | -d )
2898    debug=: ;;
2899  --file | --fil | --fi | --f )
2900    $ac_shift
2901    CONFIG_FILES="$CONFIG_FILES $ac_optarg"
2902    ac_need_defaults=false;;
2903  --header | --heade | --head | --hea )
2904    $ac_shift
2905    CONFIG_HEADERS="$CONFIG_HEADERS $ac_optarg"
2906    ac_need_defaults=false;;
2907  -q | -quiet | --quiet | --quie | --qui | --qu | --q \
2908  | -silent | --silent | --silen | --sile | --sil | --si | --s)
2909    ac_cs_silent=: ;;
2910
2911  # This is an error.
2912  -*) { { echo "$as_me:$LINENO: error: unrecognized option: $1
2913Try \`$0 --help' for more information." >&5
2914echo "$as_me: error: unrecognized option: $1
2915Try \`$0 --help' for more information." >&2;}
2916   { (exit 1); exit 1; }; } ;;
2917
2918  *) ac_config_targets="$ac_config_targets $1" ;;
2919
2920  esac
2921  shift
2922done
2923
2924ac_configure_extra_args=
2925
2926if $ac_cs_silent; then
2927  exec 6>/dev/null
2928  ac_configure_extra_args="$ac_configure_extra_args --silent"
2929fi
2930
2931_ACEOF
2932cat >>$CONFIG_STATUS <<_ACEOF
2933if \$ac_cs_recheck; then
2934  echo "running $SHELL $0 " $ac_configure_args \$ac_configure_extra_args " --no-create --no-recursion" >&6
2935  exec $SHELL $0 $ac_configure_args \$ac_configure_extra_args --no-create --no-recursion
2936fi
2937
2938_ACEOF
2939
2940
2941
2942
2943
2944cat >>$CONFIG_STATUS <<\_ACEOF
2945for ac_config_target in $ac_config_targets
2946do
2947  case "$ac_config_target" in
2948  # Handling of arguments.
2949  "Makefile" ) CONFIG_FILES="$CONFIG_FILES Makefile" ;;
2950  *) { { echo "$as_me:$LINENO: error: invalid argument: $ac_config_target" >&5
2951echo "$as_me: error: invalid argument: $ac_config_target" >&2;}
2952   { (exit 1); exit 1; }; };;
2953  esac
2954done
2955
2956# If the user did not use the arguments to specify the items to instantiate,
2957# then the envvar interface is used.  Set only those that are not.
2958# We use the long form for the default assignment because of an extremely
2959# bizarre bug on SunOS 4.1.3.
2960if $ac_need_defaults; then
2961  test "${CONFIG_FILES+set}" = set || CONFIG_FILES=$config_files
2962fi
2963
2964# Have a temporary directory for convenience.  Make it in the build tree
2965# simply because there is no reason to put it here, and in addition,
2966# creating and moving files from /tmp can sometimes cause problems.
2967# Create a temporary directory, and hook for its removal unless debugging.
2968$debug ||
2969{
2970  trap 'exit_status=$?; rm -rf $tmp && exit $exit_status' 0
2971  trap '{ (exit 1); exit 1; }' 1 2 13 15
2972}
2973
2974# Create a (secure) tmp directory for tmp files.
2975
2976{
2977  tmp=`(umask 077 && mktemp -d -q "./confstatXXXXXX") 2>/dev/null` &&
2978  test -n "$tmp" && test -d "$tmp"
2979}  ||
2980{
2981  tmp=./confstat$$-$RANDOM
2982  (umask 077 && mkdir $tmp)
2983} ||
2984{
2985   echo "$me: cannot create a temporary directory in ." >&2
2986   { (exit 1); exit 1; }
2987}
2988
2989_ACEOF
2990
2991cat >>$CONFIG_STATUS <<_ACEOF
2992
2993#
2994# CONFIG_FILES section.
2995#
2996
2997# No need to generate the scripts if there are no CONFIG_FILES.
2998# This happens for instance when ./config.status config.h
2999if test -n "\$CONFIG_FILES"; then
3000  # Protect against being on the right side of a sed subst in config.status.
3001  sed 's/,@/@@/; s/@,/@@/; s/,;t t\$/@;t t/; /@;t t\$/s/[\\\\&,]/\\\\&/g;
3002   s/@@/,@/; s/@@/@,/; s/@;t t\$/,;t t/' >\$tmp/subs.sed <<\\CEOF
3003s,@SHELL@,$SHELL,;t t
3004s,@PATH_SEPARATOR@,$PATH_SEPARATOR,;t t
3005s,@PACKAGE_NAME@,$PACKAGE_NAME,;t t
3006s,@PACKAGE_TARNAME@,$PACKAGE_TARNAME,;t t
3007s,@PACKAGE_VERSION@,$PACKAGE_VERSION,;t t
3008s,@PACKAGE_STRING@,$PACKAGE_STRING,;t t
3009s,@PACKAGE_BUGREPORT@,$PACKAGE_BUGREPORT,;t t
3010s,@exec_prefix@,$exec_prefix,;t t
3011s,@prefix@,$prefix,;t t
3012s,@program_transform_name@,$program_transform_name,;t t
3013s,@bindir@,$bindir,;t t
3014s,@sbindir@,$sbindir,;t t
3015s,@libexecdir@,$libexecdir,;t t
3016s,@datadir@,$datadir,;t t
3017s,@sysconfdir@,$sysconfdir,;t t
3018s,@sharedstatedir@,$sharedstatedir,;t t
3019s,@localstatedir@,$localstatedir,;t t
3020s,@libdir@,$libdir,;t t
3021s,@includedir@,$includedir,;t t
3022s,@oldincludedir@,$oldincludedir,;t t
3023s,@infodir@,$infodir,;t t
3024s,@mandir@,$mandir,;t t
3025s,@build_alias@,$build_alias,;t t
3026s,@host_alias@,$host_alias,;t t
3027s,@target_alias@,$target_alias,;t t
3028s,@DEFS@,$DEFS,;t t
3029s,@ECHO_C@,$ECHO_C,;t t
3030s,@ECHO_N@,$ECHO_N,;t t
3031s,@ECHO_T@,$ECHO_T,;t t
3032s,@LIBS@,$LIBS,;t t
3033s,@CC@,$CC,;t t
3034s,@CFLAGS@,$CFLAGS,;t t
3035s,@LDFLAGS@,$LDFLAGS,;t t
3036s,@CPPFLAGS@,$CPPFLAGS,;t t
3037s,@ac_ct_CC@,$ac_ct_CC,;t t
3038s,@EXEEXT@,$EXEEXT,;t t
3039s,@OBJEXT@,$OBJEXT,;t t
3040s,@AR@,$AR,;t t
3041s,@CHMOD@,$CHMOD,;t t
3042s,@CP@,$CP,;t t
3043s,@RANLIB@,$RANLIB,;t t
3044s,@RM@,$RM,;t t
3045s,@LIBOBJS@,$LIBOBJS,;t t
3046s,@LTLIBOBJS@,$LTLIBOBJS,;t t
3047CEOF
3048
3049_ACEOF
3050
3051  cat >>$CONFIG_STATUS <<\_ACEOF
3052  # Split the substitutions into bite-sized pieces for seds with
3053  # small command number limits, like on Digital OSF/1 and HP-UX.
3054  ac_max_sed_lines=48
3055  ac_sed_frag=1 # Number of current file.
3056  ac_beg=1 # First line for current file.
3057  ac_end=$ac_max_sed_lines # Line after last line for current file.
3058  ac_more_lines=:
3059  ac_sed_cmds=
3060  while $ac_more_lines; do
3061    if test $ac_beg -gt 1; then
3062      sed "1,${ac_beg}d; ${ac_end}q" $tmp/subs.sed >$tmp/subs.frag
3063    else
3064      sed "${ac_end}q" $tmp/subs.sed >$tmp/subs.frag
3065    fi
3066    if test ! -s $tmp/subs.frag; then
3067      ac_more_lines=false
3068    else
3069      # The purpose of the label and of the branching condition is to
3070      # speed up the sed processing (if there are no `@' at all, there
3071      # is no need to browse any of the substitutions).
3072      # These are the two extra sed commands mentioned above.
3073      (echo ':t
3074  /@[a-zA-Z_][a-zA-Z_0-9]*@/!b' && cat $tmp/subs.frag) >$tmp/subs-$ac_sed_frag.sed
3075      if test -z "$ac_sed_cmds"; then
3076	ac_sed_cmds="sed -f $tmp/subs-$ac_sed_frag.sed"
3077      else
3078	ac_sed_cmds="$ac_sed_cmds | sed -f $tmp/subs-$ac_sed_frag.sed"
3079      fi
3080      ac_sed_frag=`expr $ac_sed_frag + 1`
3081      ac_beg=$ac_end
3082      ac_end=`expr $ac_end + $ac_max_sed_lines`
3083    fi
3084  done
3085  if test -z "$ac_sed_cmds"; then
3086    ac_sed_cmds=cat
3087  fi
3088fi # test -n "$CONFIG_FILES"
3089
3090_ACEOF
3091cat >>$CONFIG_STATUS <<\_ACEOF
3092for ac_file in : $CONFIG_FILES; do test "x$ac_file" = x: && continue
3093  # Support "outfile[:infile[:infile...]]", defaulting infile="outfile.in".
3094  case $ac_file in
3095  - | *:- | *:-:* ) # input from stdin
3096	cat >$tmp/stdin
3097	ac_file_in=`echo "$ac_file" | sed 's,[^:]*:,,'`
3098	ac_file=`echo "$ac_file" | sed 's,:.*,,'` ;;
3099  *:* ) ac_file_in=`echo "$ac_file" | sed 's,[^:]*:,,'`
3100	ac_file=`echo "$ac_file" | sed 's,:.*,,'` ;;
3101  * )   ac_file_in=$ac_file.in ;;
3102  esac
3103
3104  # Compute @srcdir@, @top_srcdir@, and @INSTALL@ for subdirectories.
3105  ac_dir=`(dirname "$ac_file") 2>/dev/null ||
3106$as_expr X"$ac_file" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
3107	 X"$ac_file" : 'X\(//\)[^/]' \| \
3108	 X"$ac_file" : 'X\(//\)$' \| \
3109	 X"$ac_file" : 'X\(/\)' \| \
3110	 .     : '\(.\)' 2>/dev/null ||
3111echo X"$ac_file" |
3112    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{ s//\1/; q; }
3113  	  /^X\(\/\/\)[^/].*/{ s//\1/; q; }
3114  	  /^X\(\/\/\)$/{ s//\1/; q; }
3115  	  /^X\(\/\).*/{ s//\1/; q; }
3116  	  s/.*/./; q'`
3117  { if $as_mkdir_p; then
3118    mkdir -p "$ac_dir"
3119  else
3120    as_dir="$ac_dir"
3121    as_dirs=
3122    while test ! -d "$as_dir"; do
3123      as_dirs="$as_dir $as_dirs"
3124      as_dir=`(dirname "$as_dir") 2>/dev/null ||
3125$as_expr X"$as_dir" : 'X\(.*[^/]\)//*[^/][^/]*/*$' \| \
3126	 X"$as_dir" : 'X\(//\)[^/]' \| \
3127	 X"$as_dir" : 'X\(//\)$' \| \
3128	 X"$as_dir" : 'X\(/\)' \| \
3129	 .     : '\(.\)' 2>/dev/null ||
3130echo X"$as_dir" |
3131    sed '/^X\(.*[^/]\)\/\/*[^/][^/]*\/*$/{ s//\1/; q; }
3132  	  /^X\(\/\/\)[^/].*/{ s//\1/; q; }
3133  	  /^X\(\/\/\)$/{ s//\1/; q; }
3134  	  /^X\(\/\).*/{ s//\1/; q; }
3135  	  s/.*/./; q'`
3136    done
3137    test ! -n "$as_dirs" || mkdir $as_dirs
3138  fi || { { echo "$as_me:$LINENO: error: cannot create directory \"$ac_dir\"" >&5
3139echo "$as_me: error: cannot create directory \"$ac_dir\"" >&2;}
3140   { (exit 1); exit 1; }; }; }
3141
3142  ac_builddir=.
3143
3144if test "$ac_dir" != .; then
3145  ac_dir_suffix=/`echo "$ac_dir" | sed 's,^\.[\\/],,'`
3146  # A "../" for each directory in $ac_dir_suffix.
3147  ac_top_builddir=`echo "$ac_dir_suffix" | sed 's,/[^\\/]*,../,g'`
3148else
3149  ac_dir_suffix= ac_top_builddir=
3150fi
3151
3152case $srcdir in
3153  .)  # No --srcdir option.  We are building in place.
3154    ac_srcdir=.
3155    if test -z "$ac_top_builddir"; then
3156       ac_top_srcdir=.
3157    else
3158       ac_top_srcdir=`echo $ac_top_builddir | sed 's,/$,,'`
3159    fi ;;
3160  [\\/]* | ?:[\\/]* )  # Absolute path.
3161    ac_srcdir=$srcdir$ac_dir_suffix;
3162    ac_top_srcdir=$srcdir ;;
3163  *) # Relative path.
3164    ac_srcdir=$ac_top_builddir$srcdir$ac_dir_suffix
3165    ac_top_srcdir=$ac_top_builddir$srcdir ;;
3166esac
3167
3168# Do not use `cd foo && pwd` to compute absolute paths, because
3169# the directories may not exist.
3170case `pwd` in
3171.) ac_abs_builddir="$ac_dir";;
3172*)
3173  case "$ac_dir" in
3174  .) ac_abs_builddir=`pwd`;;
3175  [\\/]* | ?:[\\/]* ) ac_abs_builddir="$ac_dir";;
3176  *) ac_abs_builddir=`pwd`/"$ac_dir";;
3177  esac;;
3178esac
3179case $ac_abs_builddir in
3180.) ac_abs_top_builddir=${ac_top_builddir}.;;
3181*)
3182  case ${ac_top_builddir}. in
3183  .) ac_abs_top_builddir=$ac_abs_builddir;;
3184  [\\/]* | ?:[\\/]* ) ac_abs_top_builddir=${ac_top_builddir}.;;
3185  *) ac_abs_top_builddir=$ac_abs_builddir/${ac_top_builddir}.;;
3186  esac;;
3187esac
3188case $ac_abs_builddir in
3189.) ac_abs_srcdir=$ac_srcdir;;
3190*)
3191  case $ac_srcdir in
3192  .) ac_abs_srcdir=$ac_abs_builddir;;
3193  [\\/]* | ?:[\\/]* ) ac_abs_srcdir=$ac_srcdir;;
3194  *) ac_abs_srcdir=$ac_abs_builddir/$ac_srcdir;;
3195  esac;;
3196esac
3197case $ac_abs_builddir in
3198.) ac_abs_top_srcdir=$ac_top_srcdir;;
3199*)
3200  case $ac_top_srcdir in
3201  .) ac_abs_top_srcdir=$ac_abs_builddir;;
3202  [\\/]* | ?:[\\/]* ) ac_abs_top_srcdir=$ac_top_srcdir;;
3203  *) ac_abs_top_srcdir=$ac_abs_builddir/$ac_top_srcdir;;
3204  esac;;
3205esac
3206
3207
3208
3209  if test x"$ac_file" != x-; then
3210    { echo "$as_me:$LINENO: creating $ac_file" >&5
3211echo "$as_me: creating $ac_file" >&6;}
3212    rm -f "$ac_file"
3213  fi
3214  # Let's still pretend it is `configure' which instantiates (i.e., don't
3215  # use $as_me), people would be surprised to read:
3216  #    /* config.h.  Generated by config.status.  */
3217  if test x"$ac_file" = x-; then
3218    configure_input=
3219  else
3220    configure_input="$ac_file.  "
3221  fi
3222  configure_input=$configure_input"Generated from `echo $ac_file_in |
3223				     sed 's,.*/,,'` by configure."
3224
3225  # First look for the input files in the build tree, otherwise in the
3226  # src tree.
3227  ac_file_inputs=`IFS=:
3228    for f in $ac_file_in; do
3229      case $f in
3230      -) echo $tmp/stdin ;;
3231      [\\/$]*)
3232	 # Absolute (can't be DOS-style, as IFS=:)
3233	 test -f "$f" || { { echo "$as_me:$LINENO: error: cannot find input file: $f" >&5
3234echo "$as_me: error: cannot find input file: $f" >&2;}
3235   { (exit 1); exit 1; }; }
3236	 echo "$f";;
3237      *) # Relative
3238	 if test -f "$f"; then
3239	   # Build tree
3240	   echo "$f"
3241	 elif test -f "$srcdir/$f"; then
3242	   # Source tree
3243	   echo "$srcdir/$f"
3244	 else
3245	   # /dev/null tree
3246	   { { echo "$as_me:$LINENO: error: cannot find input file: $f" >&5
3247echo "$as_me: error: cannot find input file: $f" >&2;}
3248   { (exit 1); exit 1; }; }
3249	 fi;;
3250      esac
3251    done` || { (exit 1); exit 1; }
3252_ACEOF
3253cat >>$CONFIG_STATUS <<_ACEOF
3254  sed "$ac_vpsub
3255$extrasub
3256_ACEOF
3257cat >>$CONFIG_STATUS <<\_ACEOF
3258:t
3259/@[a-zA-Z_][a-zA-Z_0-9]*@/!b
3260s,@configure_input@,$configure_input,;t t
3261s,@srcdir@,$ac_srcdir,;t t
3262s,@abs_srcdir@,$ac_abs_srcdir,;t t
3263s,@top_srcdir@,$ac_top_srcdir,;t t
3264s,@abs_top_srcdir@,$ac_abs_top_srcdir,;t t
3265s,@builddir@,$ac_builddir,;t t
3266s,@abs_builddir@,$ac_abs_builddir,;t t
3267s,@top_builddir@,$ac_top_builddir,;t t
3268s,@abs_top_builddir@,$ac_abs_top_builddir,;t t
3269" $ac_file_inputs | (eval "$ac_sed_cmds") >$tmp/out
3270  rm -f $tmp/stdin
3271  if test x"$ac_file" != x-; then
3272    mv $tmp/out $ac_file
3273  else
3274    cat $tmp/out
3275    rm -f $tmp/out
3276  fi
3277
3278done
3279_ACEOF
3280
3281cat >>$CONFIG_STATUS <<\_ACEOF
3282
3283{ (exit 0); exit 0; }
3284_ACEOF
3285chmod +x $CONFIG_STATUS
3286ac_clean_files=$ac_clean_files_save
3287
3288
3289# configure is writing to config.log, and then calls config.status.
3290# config.status does its own redirection, appending to config.log.
3291# Unfortunately, on DOS this fails, as config.log is still kept open
3292# by configure, so config.status won't be able to write to it; its
3293# output is simply discarded.  So we exec the FD to /dev/null,
3294# effectively closing config.log, so it can be properly (re)opened and
3295# appended to by config.status.  When coming back to configure, we
3296# need to make the FD available again.
3297if test "$no_create" != yes; then
3298  ac_cs_success=:
3299  ac_config_status_args=
3300  test "$silent" = yes &&
3301    ac_config_status_args="$ac_config_status_args --quiet"
3302  exec 5>/dev/null
3303  $SHELL $CONFIG_STATUS $ac_config_status_args || ac_cs_success=false
3304  exec 5>>config.log
3305  # Use ||, not &&, to avoid exiting from the if with $? = 1, which
3306  # would make configure fail if this is the last instruction.
3307  $ac_cs_success || { (exit 1); exit 1; }
3308fi
3309
3310