~ubuntu-branches/ubuntu/precise/ghc/precise

« back to all changes in this revision

Viewing changes to libraries/unix/configure

  • Committer: Bazaar Package Importer
  • Author(s): Joachim Breitner
  • Date: 2011-01-17 12:49:24 UTC
  • Revision ID: james.westby@ubuntu.com-20110117124924-do1pym1jlf5o636m
Tags: upstream-7.0.1
ImportĀ upstreamĀ versionĀ 7.0.1

Show diffs side-by-side

added added

removed removed

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